{-# LANGUAGE CPP, TypeFamilies, DeriveDataTypeable #-} module PGIP.GraphQL.Result.PremiseSelection where import PGIP.GraphQL.Result.LocIdReference import Data.Data data PremiseSelection = PremiseSelection { PremiseSelection -> [LocIdReference] selectedPremises :: [LocIdReference] } deriving (Int -> PremiseSelection -> ShowS [PremiseSelection] -> ShowS PremiseSelection -> String (Int -> PremiseSelection -> ShowS) -> (PremiseSelection -> String) -> ([PremiseSelection] -> ShowS) -> Show PremiseSelection forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [PremiseSelection] -> ShowS $cshowList :: [PremiseSelection] -> ShowS show :: PremiseSelection -> String $cshow :: PremiseSelection -> String showsPrec :: Int -> PremiseSelection -> ShowS $cshowsPrec :: Int -> PremiseSelection -> ShowS Show, Typeable, Typeable PremiseSelection Constr DataType Typeable PremiseSelection => (forall (c :: * -> *). (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PremiseSelection -> c PremiseSelection) -> (forall (c :: * -> *). (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PremiseSelection) -> (PremiseSelection -> Constr) -> (PremiseSelection -> DataType) -> (forall (t :: * -> *) (c :: * -> *). Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PremiseSelection)) -> (forall (t :: * -> * -> *) (c :: * -> *). Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PremiseSelection)) -> ((forall b. Data b => b -> b) -> PremiseSelection -> PremiseSelection) -> (forall r r'. (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PremiseSelection -> r) -> (forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PremiseSelection -> r) -> (forall u. (forall d. Data d => d -> u) -> PremiseSelection -> [u]) -> (forall u. Int -> (forall d. Data d => d -> u) -> PremiseSelection -> u) -> (forall (m :: * -> *). Monad m => (forall d. Data d => d -> m d) -> PremiseSelection -> m PremiseSelection) -> (forall (m :: * -> *). MonadPlus m => (forall d. Data d => d -> m d) -> PremiseSelection -> m PremiseSelection) -> (forall (m :: * -> *). MonadPlus m => (forall d. Data d => d -> m d) -> PremiseSelection -> m PremiseSelection) -> Data PremiseSelection PremiseSelection -> Constr PremiseSelection -> DataType (forall b. Data b => b -> b) -> PremiseSelection -> PremiseSelection (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PremiseSelection -> c PremiseSelection (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PremiseSelection forall a. Typeable a => (forall (c :: * -> *). (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> a -> c a) -> (forall (c :: * -> *). (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c a) -> (a -> Constr) -> (a -> DataType) -> (forall (t :: * -> *) (c :: * -> *). Typeable t => (forall d. Data d => c (t d)) -> Maybe (c a)) -> (forall (t :: * -> * -> *) (c :: * -> *). Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c a)) -> ((forall b. Data b => b -> b) -> a -> a) -> (forall r r'. (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> a -> r) -> (forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> a -> r) -> (forall u. (forall d. Data d => d -> u) -> a -> [u]) -> (forall u. Int -> (forall d. Data d => d -> u) -> a -> u) -> (forall (m :: * -> *). Monad m => (forall d. Data d => d -> m d) -> a -> m a) -> (forall (m :: * -> *). MonadPlus m => (forall d. Data d => d -> m d) -> a -> m a) -> (forall (m :: * -> *). MonadPlus m => (forall d. Data d => d -> m d) -> a -> m a) -> Data a forall u. Int -> (forall d. Data d => d -> u) -> PremiseSelection -> u forall u. (forall d. Data d => d -> u) -> PremiseSelection -> [u] forall r r'. (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PremiseSelection -> r forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PremiseSelection -> r forall (m :: * -> *). Monad m => (forall d. Data d => d -> m d) -> PremiseSelection -> m PremiseSelection forall (m :: * -> *). MonadPlus m => (forall d. Data d => d -> m d) -> PremiseSelection -> m PremiseSelection forall (c :: * -> *). (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PremiseSelection forall (c :: * -> *). (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PremiseSelection -> c PremiseSelection forall (t :: * -> *) (c :: * -> *). Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PremiseSelection) forall (t :: * -> * -> *) (c :: * -> *). Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PremiseSelection) $cPremiseSelection :: Constr $tPremiseSelection :: DataType gmapMo :: (forall d. Data d => d -> m d) -> PremiseSelection -> m PremiseSelection $cgmapMo :: forall (m :: * -> *). MonadPlus m => (forall d. Data d => d -> m d) -> PremiseSelection -> m PremiseSelection gmapMp :: (forall d. Data d => d -> m d) -> PremiseSelection -> m PremiseSelection $cgmapMp :: forall (m :: * -> *). MonadPlus m => (forall d. Data d => d -> m d) -> PremiseSelection -> m PremiseSelection gmapM :: (forall d. Data d => d -> m d) -> PremiseSelection -> m PremiseSelection $cgmapM :: forall (m :: * -> *). Monad m => (forall d. Data d => d -> m d) -> PremiseSelection -> m PremiseSelection gmapQi :: Int -> (forall d. Data d => d -> u) -> PremiseSelection -> u $cgmapQi :: forall u. Int -> (forall d. Data d => d -> u) -> PremiseSelection -> u gmapQ :: (forall d. Data d => d -> u) -> PremiseSelection -> [u] $cgmapQ :: forall u. (forall d. Data d => d -> u) -> PremiseSelection -> [u] gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PremiseSelection -> r $cgmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PremiseSelection -> r gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PremiseSelection -> r $cgmapQl :: forall r r'. (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PremiseSelection -> r gmapT :: (forall b. Data b => b -> b) -> PremiseSelection -> PremiseSelection $cgmapT :: (forall b. Data b => b -> b) -> PremiseSelection -> PremiseSelection dataCast2 :: (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PremiseSelection) $cdataCast2 :: forall (t :: * -> * -> *) (c :: * -> *). Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PremiseSelection) dataCast1 :: (forall d. Data d => c (t d)) -> Maybe (c PremiseSelection) $cdataCast1 :: forall (t :: * -> *) (c :: * -> *). Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PremiseSelection) dataTypeOf :: PremiseSelection -> DataType $cdataTypeOf :: PremiseSelection -> DataType toConstr :: PremiseSelection -> Constr $ctoConstr :: PremiseSelection -> Constr gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PremiseSelection $cgunfold :: forall (c :: * -> *). (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PremiseSelection gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PremiseSelection -> c PremiseSelection $cgfoldl :: forall (c :: * -> *). (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PremiseSelection -> c PremiseSelection $cp1Data :: Typeable PremiseSelection Data)