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