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