morpheus-graphql-0.0.1: Morpheus GraphQL

Safe HaskellSafe
LanguageHaskell2010

Data.Morpheus.Schema.InputValue

Documentation

data InputValue t Source #

Constructors

InputValue 
Instances
GQLKind InputValue Source # 
Instance details

Defined in Data.Morpheus.Kind.GQLKind

GQLObject InputValue Source # 
Instance details

Defined in Data.Morpheus.Kind.GQLObject

Data t => Data (InputValue t) Source # 
Instance details

Defined in Data.Morpheus.Schema.InputValue

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InputValue t -> c (InputValue t) #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (InputValue t) #

toConstr :: InputValue t -> Constr #

dataTypeOf :: InputValue t -> DataType #

dataCast1 :: Typeable t0 => (forall d. Data d => c (t0 d)) -> Maybe (c (InputValue t)) #

dataCast2 :: Typeable t0 => (forall d e. (Data d, Data e) => c (t0 d e)) -> Maybe (c (InputValue t)) #

gmapT :: (forall b. Data b => b -> b) -> InputValue t -> InputValue t #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InputValue t -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InputValue t -> r #

gmapQ :: (forall d. Data d => d -> u) -> InputValue t -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InputValue t -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InputValue t -> m (InputValue t) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InputValue t -> m (InputValue t) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InputValue t -> m (InputValue t) #

Show t => Show (InputValue t) Source # 
Instance details

Defined in Data.Morpheus.Schema.InputValue

Generic (InputValue t) Source # 
Instance details

Defined in Data.Morpheus.Schema.InputValue

Associated Types

type Rep (InputValue t) :: Type -> Type #

Methods

from :: InputValue t -> Rep (InputValue t) x #

to :: Rep (InputValue t) x -> InputValue t #

type Rep (InputValue t) Source # 
Instance details

Defined in Data.Morpheus.Schema.InputValue

type Rep (InputValue t) = D1 (MetaData "InputValue" "Data.Morpheus.Schema.InputValue" "morpheus-graphql-0.0.1-9yOQmuk6QYrGODa72tt3vl" False) (C1 (MetaCons "InputValue" PrefixI True) ((S1 (MetaSel (Just "name") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text) :*: S1 (MetaSel (Just "description") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_type") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 t) :*: S1 (MetaSel (Just "defaultValue") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text)))))