| Safe Haskell | Safe-Inferred |
|---|---|
| Language | Haskell2010 |
Data.Morpheus.CodeGen.Internal.AST
Documentation
data ModuleDefinition Source #
Constructors
| ModuleDefinition | |
Fields
| |
newtype CodeGenConfig Source #
Constructors
| CodeGenConfig | |
data ServerTypeDefinition Source #
Constructors
Instances
| Show ServerTypeDefinition Source # | |
Defined in Data.Morpheus.CodeGen.Internal.AST Methods showsPrec :: Int -> ServerTypeDefinition -> ShowS # show :: ServerTypeDefinition -> String # showList :: [ServerTypeDefinition] -> ShowS # | |
data GQLTypeDefinition Source #
Constructors
| GQLTypeDefinition | |
Fields | |
Instances
| Show GQLTypeDefinition Source # | |
Defined in Data.Morpheus.CodeGen.Internal.AST Methods showsPrec :: Int -> GQLTypeDefinition -> ShowS # show :: GQLTypeDefinition -> String # showList :: [GQLTypeDefinition] -> ShowS # | |
Constructors
| KindScalar | |
| KindObject (Maybe OperationType) | |
| KindUnion | |
| KindEnum | |
| KindInputObject | |
| KindList | |
| KindNonNull | |
| KindInputUnion | |
| KindInterface |
Instances
| Show TypeKind | |
| Eq TypeKind | |
| RenderGQL TypeKind | |
Defined in Data.Morpheus.Types.Internal.AST.Type | |
| Strictness TypeKind | |
Defined in Data.Morpheus.Types.Internal.AST.Type Methods isResolverType :: TypeKind -> Bool # | |
| Lift TypeKind | |
Constructors
| TypeRef | |
Fields | |
Instances
| Show TypeRef | |
| Eq TypeRef | |
| RenderGQL TypeRef | |
Defined in Data.Morpheus.Types.Internal.AST.Type | |
| Msg TypeRef | |
Defined in Data.Morpheus.Types.Internal.AST.Type | |
| Nullable TypeRef | |
Defined in Data.Morpheus.Types.Internal.AST.Type | |
| Subtyping TypeRef | |
| StructuralCompatibility TypeRef | |
Defined in Data.Morpheus.Validation.Document.Interface Methods isCompatibleTo :: TypeRef -> TypeRef -> SchemaValidator (Context TypeRef ON_INTERFACE) () isCompatibleBy :: (t -> TypeRef) -> t -> t -> SchemaValidator (Context TypeRef ON_INTERFACE) () | |
| Lift TypeRef | |
| type Context TypeRef | |
Defined in Data.Morpheus.Validation.Document.Interface type Context TypeRef = Field | |
data TypeWrapper #
Constructors
| TypeList !TypeWrapper !Bool | |
| BaseType !Bool |
Instances
| Show TypeWrapper | |
Defined in Data.Morpheus.Types.Internal.AST.Type Methods showsPrec :: Int -> TypeWrapper -> ShowS # show :: TypeWrapper -> String # showList :: [TypeWrapper] -> ShowS # | |
| Eq TypeWrapper | |
Defined in Data.Morpheus.Types.Internal.AST.Type | |
| Nullable TypeWrapper | |
Defined in Data.Morpheus.Types.Internal.AST.Type | |
| Subtyping TypeWrapper | |
Defined in Data.Morpheus.Types.Internal.AST.Type Methods isSubtype :: TypeWrapper -> TypeWrapper -> Bool # | |
| Lift TypeWrapper | |
Defined in Data.Morpheus.Types.Internal.AST.Type Methods lift :: Quote m => TypeWrapper -> m Exp # liftTyped :: forall (m :: Type -> Type). Quote m => TypeWrapper -> Code m TypeWrapper # | |
unpackName :: forall (t :: NAME). NamePacking a => Name t -> a #
data DerivingClass Source #
Instances
| Show DerivingClass Source # | |
Defined in Data.Morpheus.CodeGen.Internal.AST Methods showsPrec :: Int -> DerivingClass -> ShowS # show :: DerivingClass -> String # showList :: [DerivingClass] -> ShowS # | |
data FIELD_TYPE_WRAPPER Source #
Constructors
| MONAD | |
| SUBSCRIPTION | |
| PARAMETRIZED | |
| ARG TypeName | |
| TAGGED_ARG FieldName TypeRef | |
| GQL_WRAPPER TypeWrapper |
Instances
| Show FIELD_TYPE_WRAPPER Source # | |
Defined in Data.Morpheus.CodeGen.Internal.AST Methods showsPrec :: Int -> FIELD_TYPE_WRAPPER -> ShowS # show :: FIELD_TYPE_WRAPPER -> String # showList :: [FIELD_TYPE_WRAPPER] -> ShowS # | |
data ServerConstructorDefinition Source #
Constructors
| ServerConstructorDefinition | |
Fields | |
Instances
| Show ServerConstructorDefinition Source # | |
Defined in Data.Morpheus.CodeGen.Internal.AST Methods showsPrec :: Int -> ServerConstructorDefinition -> ShowS # show :: ServerConstructorDefinition -> String # showList :: [ServerConstructorDefinition] -> ShowS # | |
data ServerFieldDefinition Source #
Constructors
| ServerFieldDefinition | |
Instances
| Show ServerFieldDefinition Source # | |
Defined in Data.Morpheus.CodeGen.Internal.AST Methods showsPrec :: Int -> ServerFieldDefinition -> ShowS # show :: ServerFieldDefinition -> String # showList :: [ServerFieldDefinition] -> ShowS # | |
data ServerDirectiveUsage Source #
Constructors
| TypeDirectiveUsage TypeValue | |
| FieldDirectiveUsage FieldName TypeValue | |
| EnumDirectiveUsage TypeName TypeValue |
Instances
| Show ServerDirectiveUsage Source # | |
Defined in Data.Morpheus.CodeGen.Internal.AST Methods showsPrec :: Int -> ServerDirectiveUsage -> ShowS # show :: ServerDirectiveUsage -> String # showList :: [ServerDirectiveUsage] -> ShowS # | |
Constructors
| TypeValueObject TypeName [(FieldName, TypeValue)] | |
| TypeValueNumber Double | |
| TypeValueString Text | |
| TypeValueBool Bool | |
| TypeValueList [TypeValue] | |
| TypedValueMaybe (Maybe TypeValue) |