Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
A GraphQL model. Based on the (extended) BNF at: | https://spec.graphql.org/draft/#sec-Appendix-Grammar-Summary
Documentation
newtype FloatValue Source #
Instances
Read FloatValue Source # | |
Defined in Hydra.Ext.Graphql.Syntax readsPrec :: Int -> ReadS FloatValue # readList :: ReadS [FloatValue] # readPrec :: ReadPrec FloatValue # readListPrec :: ReadPrec [FloatValue] # | |
Show FloatValue Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> FloatValue -> ShowS # show :: FloatValue -> String # showList :: [FloatValue] -> ShowS # | |
Eq FloatValue Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: FloatValue -> FloatValue -> Bool # (/=) :: FloatValue -> FloatValue -> Bool # | |
Ord FloatValue Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: FloatValue -> FloatValue -> Ordering # (<) :: FloatValue -> FloatValue -> Bool # (<=) :: FloatValue -> FloatValue -> Bool # (>) :: FloatValue -> FloatValue -> Bool # (>=) :: FloatValue -> FloatValue -> Bool # max :: FloatValue -> FloatValue -> FloatValue # min :: FloatValue -> FloatValue -> FloatValue # |
_FloatValue :: Name Source #
newtype StringValue Source #
Instances
Read StringValue Source # | |
Defined in Hydra.Ext.Graphql.Syntax readsPrec :: Int -> ReadS StringValue # readList :: ReadS [StringValue] # readPrec :: ReadPrec StringValue # readListPrec :: ReadPrec [StringValue] # | |
Show StringValue Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> StringValue -> ShowS # show :: StringValue -> String # showList :: [StringValue] -> ShowS # | |
Eq StringValue Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: StringValue -> StringValue -> Bool # (/=) :: StringValue -> StringValue -> Bool # | |
Ord StringValue Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: StringValue -> StringValue -> Ordering # (<) :: StringValue -> StringValue -> Bool # (<=) :: StringValue -> StringValue -> Bool # (>) :: StringValue -> StringValue -> Bool # (>=) :: StringValue -> StringValue -> Bool # max :: StringValue -> StringValue -> StringValue # min :: StringValue -> StringValue -> StringValue # |
_StringValue :: Name Source #
Document | |
|
data Definition Source #
Instances
Read Definition Source # | |
Defined in Hydra.Ext.Graphql.Syntax readsPrec :: Int -> ReadS Definition # readList :: ReadS [Definition] # readPrec :: ReadPrec Definition # readListPrec :: ReadPrec [Definition] # | |
Show Definition Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> Definition -> ShowS # show :: Definition -> String # showList :: [Definition] -> ShowS # | |
Eq Definition Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: Definition -> Definition -> Bool # (/=) :: Definition -> Definition -> Bool # | |
Ord Definition Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: Definition -> Definition -> Ordering # (<) :: Definition -> Definition -> Bool # (<=) :: Definition -> Definition -> Bool # (>) :: Definition -> Definition -> Bool # (>=) :: Definition -> Definition -> Bool # max :: Definition -> Definition -> Definition # min :: Definition -> Definition -> Definition # |
_Definition :: Name Source #
newtype ExecutableDocument Source #
Instances
Read ExecutableDocument Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show ExecutableDocument Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> ExecutableDocument -> ShowS # show :: ExecutableDocument -> String # showList :: [ExecutableDocument] -> ShowS # | |
Eq ExecutableDocument Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: ExecutableDocument -> ExecutableDocument -> Bool # (/=) :: ExecutableDocument -> ExecutableDocument -> Bool # | |
Ord ExecutableDocument Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: ExecutableDocument -> ExecutableDocument -> Ordering # (<) :: ExecutableDocument -> ExecutableDocument -> Bool # (<=) :: ExecutableDocument -> ExecutableDocument -> Bool # (>) :: ExecutableDocument -> ExecutableDocument -> Bool # (>=) :: ExecutableDocument -> ExecutableDocument -> Bool # max :: ExecutableDocument -> ExecutableDocument -> ExecutableDocument # min :: ExecutableDocument -> ExecutableDocument -> ExecutableDocument # |
data ExecutableDefinition Source #
Instances
data OperationDefinition Source #
OperationDefinitionSequence OperationDefinition_Sequence | |
OperationDefinitionSelectionSet SelectionSet |
Instances
Read OperationDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show OperationDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> OperationDefinition -> ShowS # show :: OperationDefinition -> String # showList :: [OperationDefinition] -> ShowS # | |
Eq OperationDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: OperationDefinition -> OperationDefinition -> Bool # (/=) :: OperationDefinition -> OperationDefinition -> Bool # | |
Ord OperationDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: OperationDefinition -> OperationDefinition -> Ordering # (<) :: OperationDefinition -> OperationDefinition -> Bool # (<=) :: OperationDefinition -> OperationDefinition -> Bool # (>) :: OperationDefinition -> OperationDefinition -> Bool # (>=) :: OperationDefinition -> OperationDefinition -> Bool # max :: OperationDefinition -> OperationDefinition -> OperationDefinition # min :: OperationDefinition -> OperationDefinition -> OperationDefinition # |
data OperationDefinition_Sequence Source #
Instances
data OperationType Source #
Instances
Read OperationType Source # | |
Defined in Hydra.Ext.Graphql.Syntax readsPrec :: Int -> ReadS OperationType # readList :: ReadS [OperationType] # | |
Show OperationType Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> OperationType -> ShowS # show :: OperationType -> String # showList :: [OperationType] -> ShowS # | |
Eq OperationType Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: OperationType -> OperationType -> Bool # (/=) :: OperationType -> OperationType -> Bool # | |
Ord OperationType Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: OperationType -> OperationType -> Ordering # (<) :: OperationType -> OperationType -> Bool # (<=) :: OperationType -> OperationType -> Bool # (>) :: OperationType -> OperationType -> Bool # (>=) :: OperationType -> OperationType -> Bool # max :: OperationType -> OperationType -> OperationType # min :: OperationType -> OperationType -> OperationType # |
data SelectionSet Source #
Instances
Read SelectionSet Source # | |
Defined in Hydra.Ext.Graphql.Syntax readsPrec :: Int -> ReadS SelectionSet # readList :: ReadS [SelectionSet] # | |
Show SelectionSet Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> SelectionSet -> ShowS # show :: SelectionSet -> String # showList :: [SelectionSet] -> ShowS # | |
Eq SelectionSet Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: SelectionSet -> SelectionSet -> Bool # (/=) :: SelectionSet -> SelectionSet -> Bool # | |
Ord SelectionSet Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: SelectionSet -> SelectionSet -> Ordering # (<) :: SelectionSet -> SelectionSet -> Bool # (<=) :: SelectionSet -> SelectionSet -> Bool # (>) :: SelectionSet -> SelectionSet -> Bool # (>=) :: SelectionSet -> SelectionSet -> Bool # max :: SelectionSet -> SelectionSet -> SelectionSet # min :: SelectionSet -> SelectionSet -> SelectionSet # |
_SelectionSet :: Name Source #
_Selection :: Name Source #
_Arguments :: Name Source #
data FragmentSpread Source #
Instances
Read FragmentSpread Source # | |
Defined in Hydra.Ext.Graphql.Syntax readsPrec :: Int -> ReadS FragmentSpread # readList :: ReadS [FragmentSpread] # | |
Show FragmentSpread Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> FragmentSpread -> ShowS # show :: FragmentSpread -> String # showList :: [FragmentSpread] -> ShowS # | |
Eq FragmentSpread Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: FragmentSpread -> FragmentSpread -> Bool # (/=) :: FragmentSpread -> FragmentSpread -> Bool # | |
Ord FragmentSpread Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: FragmentSpread -> FragmentSpread -> Ordering # (<) :: FragmentSpread -> FragmentSpread -> Bool # (<=) :: FragmentSpread -> FragmentSpread -> Bool # (>) :: FragmentSpread -> FragmentSpread -> Bool # (>=) :: FragmentSpread -> FragmentSpread -> Bool # max :: FragmentSpread -> FragmentSpread -> FragmentSpread # min :: FragmentSpread -> FragmentSpread -> FragmentSpread # |
data InlineFragment Source #
Instances
Read InlineFragment Source # | |
Defined in Hydra.Ext.Graphql.Syntax readsPrec :: Int -> ReadS InlineFragment # readList :: ReadS [InlineFragment] # | |
Show InlineFragment Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> InlineFragment -> ShowS # show :: InlineFragment -> String # showList :: [InlineFragment] -> ShowS # | |
Eq InlineFragment Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: InlineFragment -> InlineFragment -> Bool # (/=) :: InlineFragment -> InlineFragment -> Bool # | |
Ord InlineFragment Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: InlineFragment -> InlineFragment -> Ordering # (<) :: InlineFragment -> InlineFragment -> Bool # (<=) :: InlineFragment -> InlineFragment -> Bool # (>) :: InlineFragment -> InlineFragment -> Bool # (>=) :: InlineFragment -> InlineFragment -> Bool # max :: InlineFragment -> InlineFragment -> InlineFragment # min :: InlineFragment -> InlineFragment -> InlineFragment # |
data FragmentDefinition Source #
Instances
Read FragmentDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show FragmentDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> FragmentDefinition -> ShowS # show :: FragmentDefinition -> String # showList :: [FragmentDefinition] -> ShowS # | |
Eq FragmentDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: FragmentDefinition -> FragmentDefinition -> Bool # (/=) :: FragmentDefinition -> FragmentDefinition -> Bool # | |
Ord FragmentDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: FragmentDefinition -> FragmentDefinition -> Ordering # (<) :: FragmentDefinition -> FragmentDefinition -> Bool # (<=) :: FragmentDefinition -> FragmentDefinition -> Bool # (>) :: FragmentDefinition -> FragmentDefinition -> Bool # (>=) :: FragmentDefinition -> FragmentDefinition -> Bool # max :: FragmentDefinition -> FragmentDefinition -> FragmentDefinition # min :: FragmentDefinition -> FragmentDefinition -> FragmentDefinition # |
newtype FragmentName Source #
Instances
Read FragmentName Source # | |
Defined in Hydra.Ext.Graphql.Syntax readsPrec :: Int -> ReadS FragmentName # readList :: ReadS [FragmentName] # | |
Show FragmentName Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> FragmentName -> ShowS # show :: FragmentName -> String # showList :: [FragmentName] -> ShowS # | |
Eq FragmentName Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: FragmentName -> FragmentName -> Bool # (/=) :: FragmentName -> FragmentName -> Bool # | |
Ord FragmentName Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: FragmentName -> FragmentName -> Ordering # (<) :: FragmentName -> FragmentName -> Bool # (<=) :: FragmentName -> FragmentName -> Bool # (>) :: FragmentName -> FragmentName -> Bool # (>=) :: FragmentName -> FragmentName -> Bool # max :: FragmentName -> FragmentName -> FragmentName # min :: FragmentName -> FragmentName -> FragmentName # |
_FragmentName :: Name Source #
data TypeCondition Source #
Instances
Read TypeCondition Source # | |
Defined in Hydra.Ext.Graphql.Syntax readsPrec :: Int -> ReadS TypeCondition # readList :: ReadS [TypeCondition] # | |
Show TypeCondition Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> TypeCondition -> ShowS # show :: TypeCondition -> String # showList :: [TypeCondition] -> ShowS # | |
Eq TypeCondition Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: TypeCondition -> TypeCondition -> Bool # (/=) :: TypeCondition -> TypeCondition -> Bool # | |
Ord TypeCondition Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: TypeCondition -> TypeCondition -> Ordering # (<) :: TypeCondition -> TypeCondition -> Bool # (<=) :: TypeCondition -> TypeCondition -> Bool # (>) :: TypeCondition -> TypeCondition -> Bool # (>=) :: TypeCondition -> TypeCondition -> Bool # max :: TypeCondition -> TypeCondition -> TypeCondition # min :: TypeCondition -> TypeCondition -> TypeCondition # |
ValueVariable Variable | |
ValueInt IntValue | |
ValueFloat FloatValue | |
ValueString StringValue | |
ValueBoolean BooleanValue | |
ValueNull NullValue | |
ValueEnum EnumValue | |
ValueList ListValue | |
ValueObject ObjectValue |
data BooleanValue Source #
Instances
Read BooleanValue Source # | |
Defined in Hydra.Ext.Graphql.Syntax readsPrec :: Int -> ReadS BooleanValue # readList :: ReadS [BooleanValue] # | |
Show BooleanValue Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> BooleanValue -> ShowS # show :: BooleanValue -> String # showList :: [BooleanValue] -> ShowS # | |
Eq BooleanValue Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: BooleanValue -> BooleanValue -> Bool # (/=) :: BooleanValue -> BooleanValue -> Bool # | |
Ord BooleanValue Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: BooleanValue -> BooleanValue -> Ordering # (<) :: BooleanValue -> BooleanValue -> Bool # (<=) :: BooleanValue -> BooleanValue -> Bool # (>) :: BooleanValue -> BooleanValue -> Bool # (>=) :: BooleanValue -> BooleanValue -> Bool # max :: BooleanValue -> BooleanValue -> BooleanValue # min :: BooleanValue -> BooleanValue -> BooleanValue # |
_BooleanValue :: Name Source #
_NullValue :: Name Source #
_EnumValue :: Name Source #
_ListValue :: Name Source #
data ListValue_Sequence Source #
Instances
Read ListValue_Sequence Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show ListValue_Sequence Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> ListValue_Sequence -> ShowS # show :: ListValue_Sequence -> String # showList :: [ListValue_Sequence] -> ShowS # | |
Eq ListValue_Sequence Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: ListValue_Sequence -> ListValue_Sequence -> Bool # (/=) :: ListValue_Sequence -> ListValue_Sequence -> Bool # | |
Ord ListValue_Sequence Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: ListValue_Sequence -> ListValue_Sequence -> Ordering # (<) :: ListValue_Sequence -> ListValue_Sequence -> Bool # (<=) :: ListValue_Sequence -> ListValue_Sequence -> Bool # (>) :: ListValue_Sequence -> ListValue_Sequence -> Bool # (>=) :: ListValue_Sequence -> ListValue_Sequence -> Bool # max :: ListValue_Sequence -> ListValue_Sequence -> ListValue_Sequence # min :: ListValue_Sequence -> ListValue_Sequence -> ListValue_Sequence # |
data ListValue_Sequence2 Source #
Instances
Read ListValue_Sequence2 Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show ListValue_Sequence2 Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> ListValue_Sequence2 -> ShowS # show :: ListValue_Sequence2 -> String # showList :: [ListValue_Sequence2] -> ShowS # | |
Eq ListValue_Sequence2 Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: ListValue_Sequence2 -> ListValue_Sequence2 -> Bool # (/=) :: ListValue_Sequence2 -> ListValue_Sequence2 -> Bool # | |
Ord ListValue_Sequence2 Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: ListValue_Sequence2 -> ListValue_Sequence2 -> Ordering # (<) :: ListValue_Sequence2 -> ListValue_Sequence2 -> Bool # (<=) :: ListValue_Sequence2 -> ListValue_Sequence2 -> Bool # (>) :: ListValue_Sequence2 -> ListValue_Sequence2 -> Bool # (>=) :: ListValue_Sequence2 -> ListValue_Sequence2 -> Bool # max :: ListValue_Sequence2 -> ListValue_Sequence2 -> ListValue_Sequence2 # min :: ListValue_Sequence2 -> ListValue_Sequence2 -> ListValue_Sequence2 # |
data ObjectValue Source #
Instances
Read ObjectValue Source # | |
Defined in Hydra.Ext.Graphql.Syntax readsPrec :: Int -> ReadS ObjectValue # readList :: ReadS [ObjectValue] # readPrec :: ReadPrec ObjectValue # readListPrec :: ReadPrec [ObjectValue] # | |
Show ObjectValue Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> ObjectValue -> ShowS # show :: ObjectValue -> String # showList :: [ObjectValue] -> ShowS # | |
Eq ObjectValue Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: ObjectValue -> ObjectValue -> Bool # (/=) :: ObjectValue -> ObjectValue -> Bool # | |
Ord ObjectValue Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: ObjectValue -> ObjectValue -> Ordering # (<) :: ObjectValue -> ObjectValue -> Bool # (<=) :: ObjectValue -> ObjectValue -> Bool # (>) :: ObjectValue -> ObjectValue -> Bool # (>=) :: ObjectValue -> ObjectValue -> Bool # max :: ObjectValue -> ObjectValue -> ObjectValue # min :: ObjectValue -> ObjectValue -> ObjectValue # |
_ObjectValue :: Name Source #
data ObjectValue_Sequence Source #
Instances
data ObjectValue_Sequence2 Source #
Instances
data ObjectField Source #
Instances
Read ObjectField Source # | |
Defined in Hydra.Ext.Graphql.Syntax readsPrec :: Int -> ReadS ObjectField # readList :: ReadS [ObjectField] # readPrec :: ReadPrec ObjectField # readListPrec :: ReadPrec [ObjectField] # | |
Show ObjectField Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> ObjectField -> ShowS # show :: ObjectField -> String # showList :: [ObjectField] -> ShowS # | |
Eq ObjectField Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: ObjectField -> ObjectField -> Bool # (/=) :: ObjectField -> ObjectField -> Bool # | |
Ord ObjectField Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: ObjectField -> ObjectField -> Ordering # (<) :: ObjectField -> ObjectField -> Bool # (<=) :: ObjectField -> ObjectField -> Bool # (>) :: ObjectField -> ObjectField -> Bool # (>=) :: ObjectField -> ObjectField -> Bool # max :: ObjectField -> ObjectField -> ObjectField # min :: ObjectField -> ObjectField -> ObjectField # |
_ObjectField :: Name Source #
data VariablesDefinition Source #
Instances
Read VariablesDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show VariablesDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> VariablesDefinition -> ShowS # show :: VariablesDefinition -> String # showList :: [VariablesDefinition] -> ShowS # | |
Eq VariablesDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: VariablesDefinition -> VariablesDefinition -> Bool # (/=) :: VariablesDefinition -> VariablesDefinition -> Bool # | |
Ord VariablesDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: VariablesDefinition -> VariablesDefinition -> Ordering # (<) :: VariablesDefinition -> VariablesDefinition -> Bool # (<=) :: VariablesDefinition -> VariablesDefinition -> Bool # (>) :: VariablesDefinition -> VariablesDefinition -> Bool # (>=) :: VariablesDefinition -> VariablesDefinition -> Bool # max :: VariablesDefinition -> VariablesDefinition -> VariablesDefinition # min :: VariablesDefinition -> VariablesDefinition -> VariablesDefinition # |
data DefaultValue Source #
Instances
Read DefaultValue Source # | |
Defined in Hydra.Ext.Graphql.Syntax readsPrec :: Int -> ReadS DefaultValue # readList :: ReadS [DefaultValue] # | |
Show DefaultValue Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> DefaultValue -> ShowS # show :: DefaultValue -> String # showList :: [DefaultValue] -> ShowS # | |
Eq DefaultValue Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: DefaultValue -> DefaultValue -> Bool # (/=) :: DefaultValue -> DefaultValue -> Bool # | |
Ord DefaultValue Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: DefaultValue -> DefaultValue -> Ordering # (<) :: DefaultValue -> DefaultValue -> Bool # (<=) :: DefaultValue -> DefaultValue -> Bool # (>) :: DefaultValue -> DefaultValue -> Bool # (>=) :: DefaultValue -> DefaultValue -> Bool # max :: DefaultValue -> DefaultValue -> DefaultValue # min :: DefaultValue -> DefaultValue -> DefaultValue # |
_DefaultValue :: Name Source #
_NamedType :: Name Source #
data NonNullType Source #
Instances
Read NonNullType Source # | |
Defined in Hydra.Ext.Graphql.Syntax readsPrec :: Int -> ReadS NonNullType # readList :: ReadS [NonNullType] # readPrec :: ReadPrec NonNullType # readListPrec :: ReadPrec [NonNullType] # | |
Show NonNullType Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> NonNullType -> ShowS # show :: NonNullType -> String # showList :: [NonNullType] -> ShowS # | |
Eq NonNullType Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: NonNullType -> NonNullType -> Bool # (/=) :: NonNullType -> NonNullType -> Bool # | |
Ord NonNullType Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: NonNullType -> NonNullType -> Ordering # (<) :: NonNullType -> NonNullType -> Bool # (<=) :: NonNullType -> NonNullType -> Bool # (>) :: NonNullType -> NonNullType -> Bool # (>=) :: NonNullType -> NonNullType -> Bool # max :: NonNullType -> NonNullType -> NonNullType # min :: NonNullType -> NonNullType -> NonNullType # |
_NonNullType :: Name Source #
data NonNullType_Named Source #
Instances
Read NonNullType_Named Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show NonNullType_Named Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> NonNullType_Named -> ShowS # show :: NonNullType_Named -> String # showList :: [NonNullType_Named] -> ShowS # | |
Eq NonNullType_Named Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: NonNullType_Named -> NonNullType_Named -> Bool # (/=) :: NonNullType_Named -> NonNullType_Named -> Bool # | |
Ord NonNullType_Named Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: NonNullType_Named -> NonNullType_Named -> Ordering # (<) :: NonNullType_Named -> NonNullType_Named -> Bool # (<=) :: NonNullType_Named -> NonNullType_Named -> Bool # (>) :: NonNullType_Named -> NonNullType_Named -> Bool # (>=) :: NonNullType_Named -> NonNullType_Named -> Bool # max :: NonNullType_Named -> NonNullType_Named -> NonNullType_Named # min :: NonNullType_Named -> NonNullType_Named -> NonNullType_Named # |
data NonNullType_List Source #
Instances
Read NonNullType_List Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show NonNullType_List Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> NonNullType_List -> ShowS # show :: NonNullType_List -> String # showList :: [NonNullType_List] -> ShowS # | |
Eq NonNullType_List Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: NonNullType_List -> NonNullType_List -> Bool # (/=) :: NonNullType_List -> NonNullType_List -> Bool # | |
Ord NonNullType_List Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: NonNullType_List -> NonNullType_List -> Ordering # (<) :: NonNullType_List -> NonNullType_List -> Bool # (<=) :: NonNullType_List -> NonNullType_List -> Bool # (>) :: NonNullType_List -> NonNullType_List -> Bool # (>=) :: NonNullType_List -> NonNullType_List -> Bool # max :: NonNullType_List -> NonNullType_List -> NonNullType_List # min :: NonNullType_List -> NonNullType_List -> NonNullType_List # |
newtype Directives Source #
Instances
Read Directives Source # | |
Defined in Hydra.Ext.Graphql.Syntax readsPrec :: Int -> ReadS Directives # readList :: ReadS [Directives] # readPrec :: ReadPrec Directives # readListPrec :: ReadPrec [Directives] # | |
Show Directives Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> Directives -> ShowS # show :: Directives -> String # showList :: [Directives] -> ShowS # | |
Eq Directives Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: Directives -> Directives -> Bool # (/=) :: Directives -> Directives -> Bool # | |
Ord Directives Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: Directives -> Directives -> Ordering # (<) :: Directives -> Directives -> Bool # (<=) :: Directives -> Directives -> Bool # (>) :: Directives -> Directives -> Bool # (>=) :: Directives -> Directives -> Bool # max :: Directives -> Directives -> Directives # min :: Directives -> Directives -> Directives # |
_Directives :: Name Source #
_Directive :: Name Source #
newtype TypeSystemDocment Source #
Instances
Read TypeSystemDocment Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show TypeSystemDocment Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> TypeSystemDocment -> ShowS # show :: TypeSystemDocment -> String # showList :: [TypeSystemDocment] -> ShowS # | |
Eq TypeSystemDocment Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: TypeSystemDocment -> TypeSystemDocment -> Bool # (/=) :: TypeSystemDocment -> TypeSystemDocment -> Bool # | |
Ord TypeSystemDocment Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: TypeSystemDocment -> TypeSystemDocment -> Ordering # (<) :: TypeSystemDocment -> TypeSystemDocment -> Bool # (<=) :: TypeSystemDocment -> TypeSystemDocment -> Bool # (>) :: TypeSystemDocment -> TypeSystemDocment -> Bool # (>=) :: TypeSystemDocment -> TypeSystemDocment -> Bool # max :: TypeSystemDocment -> TypeSystemDocment -> TypeSystemDocment # min :: TypeSystemDocment -> TypeSystemDocment -> TypeSystemDocment # |
data TypeSystemDefinition Source #
TypeSystemDefinitionSchema SchemaDefinition | |
TypeSystemDefinitionType TypeDefinition | |
TypeSystemDefinitionDirective DirectiveDefinition |
Instances
newtype TypeSystemExtensionDocument Source #
Instances
data TypeSystemDefinitionOrExtension Source #
TypeSystemDefinitionOrExtensionDefinition TypeSystemDefinition | |
TypeSystemDefinitionOrExtensionExtension TypeSystemExtension |
Instances
data TypeSystemExtension Source #
Instances
Read TypeSystemExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show TypeSystemExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> TypeSystemExtension -> ShowS # show :: TypeSystemExtension -> String # showList :: [TypeSystemExtension] -> ShowS # | |
Eq TypeSystemExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: TypeSystemExtension -> TypeSystemExtension -> Bool # (/=) :: TypeSystemExtension -> TypeSystemExtension -> Bool # | |
Ord TypeSystemExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: TypeSystemExtension -> TypeSystemExtension -> Ordering # (<) :: TypeSystemExtension -> TypeSystemExtension -> Bool # (<=) :: TypeSystemExtension -> TypeSystemExtension -> Bool # (>) :: TypeSystemExtension -> TypeSystemExtension -> Bool # (>=) :: TypeSystemExtension -> TypeSystemExtension -> Bool # max :: TypeSystemExtension -> TypeSystemExtension -> TypeSystemExtension # min :: TypeSystemExtension -> TypeSystemExtension -> TypeSystemExtension # |
data SchemaDefinition Source #
Instances
Read SchemaDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show SchemaDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> SchemaDefinition -> ShowS # show :: SchemaDefinition -> String # showList :: [SchemaDefinition] -> ShowS # | |
Eq SchemaDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: SchemaDefinition -> SchemaDefinition -> Bool # (/=) :: SchemaDefinition -> SchemaDefinition -> Bool # | |
Ord SchemaDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: SchemaDefinition -> SchemaDefinition -> Ordering # (<) :: SchemaDefinition -> SchemaDefinition -> Bool # (<=) :: SchemaDefinition -> SchemaDefinition -> Bool # (>) :: SchemaDefinition -> SchemaDefinition -> Bool # (>=) :: SchemaDefinition -> SchemaDefinition -> Bool # max :: SchemaDefinition -> SchemaDefinition -> SchemaDefinition # min :: SchemaDefinition -> SchemaDefinition -> SchemaDefinition # |
data SchemaExtension Source #
Instances
Read SchemaExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show SchemaExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> SchemaExtension -> ShowS # show :: SchemaExtension -> String # showList :: [SchemaExtension] -> ShowS # | |
Eq SchemaExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: SchemaExtension -> SchemaExtension -> Bool # (/=) :: SchemaExtension -> SchemaExtension -> Bool # | |
Ord SchemaExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: SchemaExtension -> SchemaExtension -> Ordering # (<) :: SchemaExtension -> SchemaExtension -> Bool # (<=) :: SchemaExtension -> SchemaExtension -> Bool # (>) :: SchemaExtension -> SchemaExtension -> Bool # (>=) :: SchemaExtension -> SchemaExtension -> Bool # max :: SchemaExtension -> SchemaExtension -> SchemaExtension # min :: SchemaExtension -> SchemaExtension -> SchemaExtension # |
data SchemaExtension_Sequence Source #
Instances
data SchemaExtension_Sequence2 Source #
Instances
data RootOperationTypeDefinition Source #
Instances
newtype Description Source #
Instances
Read Description Source # | |
Defined in Hydra.Ext.Graphql.Syntax readsPrec :: Int -> ReadS Description # readList :: ReadS [Description] # readPrec :: ReadPrec Description # readListPrec :: ReadPrec [Description] # | |
Show Description Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> Description -> ShowS # show :: Description -> String # showList :: [Description] -> ShowS # | |
Eq Description Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: Description -> Description -> Bool # (/=) :: Description -> Description -> Bool # | |
Ord Description Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: Description -> Description -> Ordering # (<) :: Description -> Description -> Bool # (<=) :: Description -> Description -> Bool # (>) :: Description -> Description -> Bool # (>=) :: Description -> Description -> Bool # max :: Description -> Description -> Description # min :: Description -> Description -> Description # |
_Description :: Name Source #
data TypeDefinition Source #
Instances
Read TypeDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax readsPrec :: Int -> ReadS TypeDefinition # readList :: ReadS [TypeDefinition] # | |
Show TypeDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> TypeDefinition -> ShowS # show :: TypeDefinition -> String # showList :: [TypeDefinition] -> ShowS # | |
Eq TypeDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: TypeDefinition -> TypeDefinition -> Bool # (/=) :: TypeDefinition -> TypeDefinition -> Bool # | |
Ord TypeDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: TypeDefinition -> TypeDefinition -> Ordering # (<) :: TypeDefinition -> TypeDefinition -> Bool # (<=) :: TypeDefinition -> TypeDefinition -> Bool # (>) :: TypeDefinition -> TypeDefinition -> Bool # (>=) :: TypeDefinition -> TypeDefinition -> Bool # max :: TypeDefinition -> TypeDefinition -> TypeDefinition # min :: TypeDefinition -> TypeDefinition -> TypeDefinition # |
data TypeExtension Source #
Instances
Read TypeExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax readsPrec :: Int -> ReadS TypeExtension # readList :: ReadS [TypeExtension] # | |
Show TypeExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> TypeExtension -> ShowS # show :: TypeExtension -> String # showList :: [TypeExtension] -> ShowS # | |
Eq TypeExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: TypeExtension -> TypeExtension -> Bool # (/=) :: TypeExtension -> TypeExtension -> Bool # | |
Ord TypeExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: TypeExtension -> TypeExtension -> Ordering # (<) :: TypeExtension -> TypeExtension -> Bool # (<=) :: TypeExtension -> TypeExtension -> Bool # (>) :: TypeExtension -> TypeExtension -> Bool # (>=) :: TypeExtension -> TypeExtension -> Bool # max :: TypeExtension -> TypeExtension -> TypeExtension # min :: TypeExtension -> TypeExtension -> TypeExtension # |
data ScalarTypeDefinition Source #
Instances
data ScalarTypeExtension Source #
Instances
Read ScalarTypeExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show ScalarTypeExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> ScalarTypeExtension -> ShowS # show :: ScalarTypeExtension -> String # showList :: [ScalarTypeExtension] -> ShowS # | |
Eq ScalarTypeExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: ScalarTypeExtension -> ScalarTypeExtension -> Bool # (/=) :: ScalarTypeExtension -> ScalarTypeExtension -> Bool # | |
Ord ScalarTypeExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: ScalarTypeExtension -> ScalarTypeExtension -> Ordering # (<) :: ScalarTypeExtension -> ScalarTypeExtension -> Bool # (<=) :: ScalarTypeExtension -> ScalarTypeExtension -> Bool # (>) :: ScalarTypeExtension -> ScalarTypeExtension -> Bool # (>=) :: ScalarTypeExtension -> ScalarTypeExtension -> Bool # max :: ScalarTypeExtension -> ScalarTypeExtension -> ScalarTypeExtension # min :: ScalarTypeExtension -> ScalarTypeExtension -> ScalarTypeExtension # |
data ObjectTypeDefinition Source #
ObjectTypeDefinitionSequence ObjectTypeDefinition_Sequence | |
ObjectTypeDefinitionSequence2 ObjectTypeDefinition_Sequence2 |
Instances
data ObjectTypeDefinition_Sequence Source #
Instances
data ObjectTypeDefinition_Sequence2 Source #
Instances
data ObjectTypeExtension Source #
ObjectTypeExtensionSequence ObjectTypeExtension_Sequence | |
ObjectTypeExtensionSequence2 ObjectTypeExtension_Sequence2 | |
ObjectTypeExtensionSequence3 ObjectTypeExtension_Sequence3 |
Instances
Read ObjectTypeExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show ObjectTypeExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> ObjectTypeExtension -> ShowS # show :: ObjectTypeExtension -> String # showList :: [ObjectTypeExtension] -> ShowS # | |
Eq ObjectTypeExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: ObjectTypeExtension -> ObjectTypeExtension -> Bool # (/=) :: ObjectTypeExtension -> ObjectTypeExtension -> Bool # | |
Ord ObjectTypeExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: ObjectTypeExtension -> ObjectTypeExtension -> Ordering # (<) :: ObjectTypeExtension -> ObjectTypeExtension -> Bool # (<=) :: ObjectTypeExtension -> ObjectTypeExtension -> Bool # (>) :: ObjectTypeExtension -> ObjectTypeExtension -> Bool # (>=) :: ObjectTypeExtension -> ObjectTypeExtension -> Bool # max :: ObjectTypeExtension -> ObjectTypeExtension -> ObjectTypeExtension # min :: ObjectTypeExtension -> ObjectTypeExtension -> ObjectTypeExtension # |
data ObjectTypeExtension_Sequence Source #
Instances
data ObjectTypeExtension_Sequence2 Source #
Instances
data ObjectTypeExtension_Sequence3 Source #
Instances
data ImplementsInterfaces Source #
ImplementsInterfacesSequence ImplementsInterfaces_Sequence | |
ImplementsInterfacesSequence2 ImplementsInterfaces_Sequence2 |
Instances
data ImplementsInterfaces_Sequence Source #
Instances
data ImplementsInterfaces_Sequence2 Source #
Instances
data FieldsDefinition Source #
Instances
Read FieldsDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show FieldsDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> FieldsDefinition -> ShowS # show :: FieldsDefinition -> String # showList :: [FieldsDefinition] -> ShowS # | |
Eq FieldsDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: FieldsDefinition -> FieldsDefinition -> Bool # (/=) :: FieldsDefinition -> FieldsDefinition -> Bool # | |
Ord FieldsDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: FieldsDefinition -> FieldsDefinition -> Ordering # (<) :: FieldsDefinition -> FieldsDefinition -> Bool # (<=) :: FieldsDefinition -> FieldsDefinition -> Bool # (>) :: FieldsDefinition -> FieldsDefinition -> Bool # (>=) :: FieldsDefinition -> FieldsDefinition -> Bool # max :: FieldsDefinition -> FieldsDefinition -> FieldsDefinition # min :: FieldsDefinition -> FieldsDefinition -> FieldsDefinition # |
data FieldDefinition Source #
Instances
Read FieldDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show FieldDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> FieldDefinition -> ShowS # show :: FieldDefinition -> String # showList :: [FieldDefinition] -> ShowS # | |
Eq FieldDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: FieldDefinition -> FieldDefinition -> Bool # (/=) :: FieldDefinition -> FieldDefinition -> Bool # | |
Ord FieldDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: FieldDefinition -> FieldDefinition -> Ordering # (<) :: FieldDefinition -> FieldDefinition -> Bool # (<=) :: FieldDefinition -> FieldDefinition -> Bool # (>) :: FieldDefinition -> FieldDefinition -> Bool # (>=) :: FieldDefinition -> FieldDefinition -> Bool # max :: FieldDefinition -> FieldDefinition -> FieldDefinition # min :: FieldDefinition -> FieldDefinition -> FieldDefinition # |
data ArgumentsDefinition Source #
Instances
Read ArgumentsDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show ArgumentsDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> ArgumentsDefinition -> ShowS # show :: ArgumentsDefinition -> String # showList :: [ArgumentsDefinition] -> ShowS # | |
Eq ArgumentsDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: ArgumentsDefinition -> ArgumentsDefinition -> Bool # (/=) :: ArgumentsDefinition -> ArgumentsDefinition -> Bool # | |
Ord ArgumentsDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: ArgumentsDefinition -> ArgumentsDefinition -> Ordering # (<) :: ArgumentsDefinition -> ArgumentsDefinition -> Bool # (<=) :: ArgumentsDefinition -> ArgumentsDefinition -> Bool # (>) :: ArgumentsDefinition -> ArgumentsDefinition -> Bool # (>=) :: ArgumentsDefinition -> ArgumentsDefinition -> Bool # max :: ArgumentsDefinition -> ArgumentsDefinition -> ArgumentsDefinition # min :: ArgumentsDefinition -> ArgumentsDefinition -> ArgumentsDefinition # |
data InputValueDefinition Source #
Instances
data InterfaceTypeDefinition Source #
InterfaceTypeDefinitionSequence InterfaceTypeDefinition_Sequence | |
InterfaceTypeDefinitionSequence2 InterfaceTypeDefinition_Sequence2 |
Instances
data InterfaceTypeDefinition_Sequence Source #
Instances
data InterfaceTypeDefinition_Sequence2 Source #
Instances
data InterfaceTypeExtension Source #
InterfaceTypeExtensionSequence InterfaceTypeExtension_Sequence | |
InterfaceTypeExtensionSequence2 InterfaceTypeExtension_Sequence2 | |
InterfaceTypeExtensionSequence3 InterfaceTypeExtension_Sequence3 |
Instances
data InterfaceTypeExtension_Sequence Source #
Instances
data InterfaceTypeExtension_Sequence2 Source #
Instances
data InterfaceTypeExtension_Sequence3 Source #
Instances
data UnionTypeDefinition Source #
Instances
Read UnionTypeDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show UnionTypeDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> UnionTypeDefinition -> ShowS # show :: UnionTypeDefinition -> String # showList :: [UnionTypeDefinition] -> ShowS # | |
Eq UnionTypeDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: UnionTypeDefinition -> UnionTypeDefinition -> Bool # (/=) :: UnionTypeDefinition -> UnionTypeDefinition -> Bool # | |
Ord UnionTypeDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: UnionTypeDefinition -> UnionTypeDefinition -> Ordering # (<) :: UnionTypeDefinition -> UnionTypeDefinition -> Bool # (<=) :: UnionTypeDefinition -> UnionTypeDefinition -> Bool # (>) :: UnionTypeDefinition -> UnionTypeDefinition -> Bool # (>=) :: UnionTypeDefinition -> UnionTypeDefinition -> Bool # max :: UnionTypeDefinition -> UnionTypeDefinition -> UnionTypeDefinition # min :: UnionTypeDefinition -> UnionTypeDefinition -> UnionTypeDefinition # |
data UnionMemberTypes Source #
UnionMemberTypesSequence UnionMemberTypes_Sequence | |
UnionMemberTypesSequence2 UnionMemberTypes_Sequence2 |
Instances
Read UnionMemberTypes Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show UnionMemberTypes Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> UnionMemberTypes -> ShowS # show :: UnionMemberTypes -> String # showList :: [UnionMemberTypes] -> ShowS # | |
Eq UnionMemberTypes Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: UnionMemberTypes -> UnionMemberTypes -> Bool # (/=) :: UnionMemberTypes -> UnionMemberTypes -> Bool # | |
Ord UnionMemberTypes Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: UnionMemberTypes -> UnionMemberTypes -> Ordering # (<) :: UnionMemberTypes -> UnionMemberTypes -> Bool # (<=) :: UnionMemberTypes -> UnionMemberTypes -> Bool # (>) :: UnionMemberTypes -> UnionMemberTypes -> Bool # (>=) :: UnionMemberTypes -> UnionMemberTypes -> Bool # max :: UnionMemberTypes -> UnionMemberTypes -> UnionMemberTypes # min :: UnionMemberTypes -> UnionMemberTypes -> UnionMemberTypes # |
data UnionMemberTypes_Sequence Source #
Instances
data UnionMemberTypes_Sequence2 Source #
Instances
data UnionTypeExtension Source #
UnionTypeExtensionSequence UnionTypeExtension_Sequence | |
UnionTypeExtensionSequence2 UnionTypeExtension_Sequence2 |
Instances
Read UnionTypeExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show UnionTypeExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> UnionTypeExtension -> ShowS # show :: UnionTypeExtension -> String # showList :: [UnionTypeExtension] -> ShowS # | |
Eq UnionTypeExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: UnionTypeExtension -> UnionTypeExtension -> Bool # (/=) :: UnionTypeExtension -> UnionTypeExtension -> Bool # | |
Ord UnionTypeExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: UnionTypeExtension -> UnionTypeExtension -> Ordering # (<) :: UnionTypeExtension -> UnionTypeExtension -> Bool # (<=) :: UnionTypeExtension -> UnionTypeExtension -> Bool # (>) :: UnionTypeExtension -> UnionTypeExtension -> Bool # (>=) :: UnionTypeExtension -> UnionTypeExtension -> Bool # max :: UnionTypeExtension -> UnionTypeExtension -> UnionTypeExtension # min :: UnionTypeExtension -> UnionTypeExtension -> UnionTypeExtension # |
data UnionTypeExtension_Sequence Source #
Instances
data UnionTypeExtension_Sequence2 Source #
Instances
data EnumTypeDefinition Source #
EnumTypeDefinitionSequence EnumTypeDefinition_Sequence | |
EnumTypeDefinitionSequence2 EnumTypeDefinition_Sequence2 |
Instances
Read EnumTypeDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show EnumTypeDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> EnumTypeDefinition -> ShowS # show :: EnumTypeDefinition -> String # showList :: [EnumTypeDefinition] -> ShowS # | |
Eq EnumTypeDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: EnumTypeDefinition -> EnumTypeDefinition -> Bool # (/=) :: EnumTypeDefinition -> EnumTypeDefinition -> Bool # | |
Ord EnumTypeDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: EnumTypeDefinition -> EnumTypeDefinition -> Ordering # (<) :: EnumTypeDefinition -> EnumTypeDefinition -> Bool # (<=) :: EnumTypeDefinition -> EnumTypeDefinition -> Bool # (>) :: EnumTypeDefinition -> EnumTypeDefinition -> Bool # (>=) :: EnumTypeDefinition -> EnumTypeDefinition -> Bool # max :: EnumTypeDefinition -> EnumTypeDefinition -> EnumTypeDefinition # min :: EnumTypeDefinition -> EnumTypeDefinition -> EnumTypeDefinition # |
data EnumTypeDefinition_Sequence Source #
Instances
data EnumTypeDefinition_Sequence2 Source #
Instances
data EnumValuesDefinition Source #
Instances
data EnumValueDefinition Source #
Instances
Read EnumValueDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show EnumValueDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> EnumValueDefinition -> ShowS # show :: EnumValueDefinition -> String # showList :: [EnumValueDefinition] -> ShowS # | |
Eq EnumValueDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: EnumValueDefinition -> EnumValueDefinition -> Bool # (/=) :: EnumValueDefinition -> EnumValueDefinition -> Bool # | |
Ord EnumValueDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: EnumValueDefinition -> EnumValueDefinition -> Ordering # (<) :: EnumValueDefinition -> EnumValueDefinition -> Bool # (<=) :: EnumValueDefinition -> EnumValueDefinition -> Bool # (>) :: EnumValueDefinition -> EnumValueDefinition -> Bool # (>=) :: EnumValueDefinition -> EnumValueDefinition -> Bool # max :: EnumValueDefinition -> EnumValueDefinition -> EnumValueDefinition # min :: EnumValueDefinition -> EnumValueDefinition -> EnumValueDefinition # |
data EnumTypeExtension Source #
EnumTypeExtensionSequence EnumTypeExtension_Sequence | |
EnumTypeExtensionSequence2 EnumTypeExtension_Sequence2 |
Instances
Read EnumTypeExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show EnumTypeExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> EnumTypeExtension -> ShowS # show :: EnumTypeExtension -> String # showList :: [EnumTypeExtension] -> ShowS # | |
Eq EnumTypeExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: EnumTypeExtension -> EnumTypeExtension -> Bool # (/=) :: EnumTypeExtension -> EnumTypeExtension -> Bool # | |
Ord EnumTypeExtension Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: EnumTypeExtension -> EnumTypeExtension -> Ordering # (<) :: EnumTypeExtension -> EnumTypeExtension -> Bool # (<=) :: EnumTypeExtension -> EnumTypeExtension -> Bool # (>) :: EnumTypeExtension -> EnumTypeExtension -> Bool # (>=) :: EnumTypeExtension -> EnumTypeExtension -> Bool # max :: EnumTypeExtension -> EnumTypeExtension -> EnumTypeExtension # min :: EnumTypeExtension -> EnumTypeExtension -> EnumTypeExtension # |
data EnumTypeExtension_Sequence Source #
Instances
data EnumTypeExtension_Sequence2 Source #
Instances
data InputObjectTypeDefinition Source #
InputObjectTypeDefinitionSequence InputObjectTypeDefinition_Sequence | |
InputObjectTypeDefinitionSequence2 InputObjectTypeDefinition_Sequence2 |
Instances
data InputObjectTypeDefinition_Sequence Source #
Instances
data InputObjectTypeDefinition_Sequence2 Source #
Instances
data InputFieldsDefinition Source #
Instances
data InputObjectTypeExtension Source #
InputObjectTypeExtensionSequence InputObjectTypeExtension_Sequence | |
InputObjectTypeExtensionSequence2 InputObjectTypeExtension_Sequence2 |
Instances
data InputObjectTypeExtension_Sequence Source #
Instances
data InputObjectTypeExtension_Sequence2 Source #
Instances
data DirectiveDefinition Source #
Instances
Read DirectiveDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show DirectiveDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> DirectiveDefinition -> ShowS # show :: DirectiveDefinition -> String # showList :: [DirectiveDefinition] -> ShowS # | |
Eq DirectiveDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: DirectiveDefinition -> DirectiveDefinition -> Bool # (/=) :: DirectiveDefinition -> DirectiveDefinition -> Bool # | |
Ord DirectiveDefinition Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: DirectiveDefinition -> DirectiveDefinition -> Ordering # (<) :: DirectiveDefinition -> DirectiveDefinition -> Bool # (<=) :: DirectiveDefinition -> DirectiveDefinition -> Bool # (>) :: DirectiveDefinition -> DirectiveDefinition -> Bool # (>=) :: DirectiveDefinition -> DirectiveDefinition -> Bool # max :: DirectiveDefinition -> DirectiveDefinition -> DirectiveDefinition # min :: DirectiveDefinition -> DirectiveDefinition -> DirectiveDefinition # |
data DirectiveLocations Source #
DirectiveLocationsSequence DirectiveLocations_Sequence | |
DirectiveLocationsSequence2 DirectiveLocations_Sequence2 |
Instances
Read DirectiveLocations Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show DirectiveLocations Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> DirectiveLocations -> ShowS # show :: DirectiveLocations -> String # showList :: [DirectiveLocations] -> ShowS # | |
Eq DirectiveLocations Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: DirectiveLocations -> DirectiveLocations -> Bool # (/=) :: DirectiveLocations -> DirectiveLocations -> Bool # | |
Ord DirectiveLocations Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: DirectiveLocations -> DirectiveLocations -> Ordering # (<) :: DirectiveLocations -> DirectiveLocations -> Bool # (<=) :: DirectiveLocations -> DirectiveLocations -> Bool # (>) :: DirectiveLocations -> DirectiveLocations -> Bool # (>=) :: DirectiveLocations -> DirectiveLocations -> Bool # max :: DirectiveLocations -> DirectiveLocations -> DirectiveLocations # min :: DirectiveLocations -> DirectiveLocations -> DirectiveLocations # |
data DirectiveLocations_Sequence Source #
Instances
data DirectiveLocations_Sequence2 Source #
Instances
data DirectiveLocation Source #
DirectiveLocationExecutable ExecutableDirectiveLocation | |
DirectiveLocationTypeSystem TypeSystemDirectiveLocation |
Instances
Read DirectiveLocation Source # | |
Defined in Hydra.Ext.Graphql.Syntax | |
Show DirectiveLocation Source # | |
Defined in Hydra.Ext.Graphql.Syntax showsPrec :: Int -> DirectiveLocation -> ShowS # show :: DirectiveLocation -> String # showList :: [DirectiveLocation] -> ShowS # | |
Eq DirectiveLocation Source # | |
Defined in Hydra.Ext.Graphql.Syntax (==) :: DirectiveLocation -> DirectiveLocation -> Bool # (/=) :: DirectiveLocation -> DirectiveLocation -> Bool # | |
Ord DirectiveLocation Source # | |
Defined in Hydra.Ext.Graphql.Syntax compare :: DirectiveLocation -> DirectiveLocation -> Ordering # (<) :: DirectiveLocation -> DirectiveLocation -> Bool # (<=) :: DirectiveLocation -> DirectiveLocation -> Bool # (>) :: DirectiveLocation -> DirectiveLocation -> Bool # (>=) :: DirectiveLocation -> DirectiveLocation -> Bool # max :: DirectiveLocation -> DirectiveLocation -> DirectiveLocation # min :: DirectiveLocation -> DirectiveLocation -> DirectiveLocation # |
data ExecutableDirectiveLocation Source #
Instances
data TypeSystemDirectiveLocation Source #