Safe Haskell | None |
---|---|
Language | Haskell2010 |
GQL Types
Synopsis
- resolver :: m (Either String a) -> Resolver m a
- mutResolver :: Monad m => [Event e c] -> StreamT m (Event e c) (Either String a) -> MutResolver m e c a
- toMutResolver :: Monad m => [Event e c] -> Resolver m a -> MutResolver m e c a
- type IORes = Resolver IO
- type IOMutRes e c = MutResolver IO e c
- type IOSubRes e c a = SubResolver IO e c a
- type Resolver = ExceptT String
- type SubRootRes m e sub = Resolver (SubscribeStream m e) sub
- data Event e c = Event {}
- class GQLType a where
- type KIND a :: GQL_KIND
- description :: Proxy a -> Text
- class GQLScalar a where
- parseValue :: ScalarValue -> Either Text a
- serialize :: a -> ScalarValue
- data GQLRequest = GQLRequest {}
- data GQLResponse
- newtype ID = ID {}
- data ScalarValue
- data GQLRootResolver m e c query mut sub = GQLRootResolver {
- queryResolver :: Resolver m query
- mutationResolver :: Resolver (PublishStream m e c) mut
- subscriptionResolver :: SubRootRes m e sub
Documentation
mutResolver :: Monad m => [Event e c] -> StreamT m (Event e c) (Either String a) -> MutResolver m e c a Source #
GraphQL Resolver for mutation or subscription resolver , adds effect to normal resolver
type SubRootRes m e sub = Resolver (SubscribeStream m e) sub Source #
class GQLType a where Source #
GraphQL type, every graphQL type should have an instance of Generic
and GQLType
.
... deriving (Generic, GQLType)
if you want to add description
... deriving (Generic) instance GQLType ... where description = const "your description ..."
Nothing
description :: Proxy a -> Text Source #
Instances
class GQLScalar a where Source #
GraphQL Scalar
parseValue
and serialize
should be provided for every instances manually
parseValue :: ScalarValue -> Either Text a Source #
value parsing and validating
for exhaustive pattern matching should be handled all scalar types : ScalarValue
, ScalarValue
, ScalarValue
, Boolean
invalid values can be reported with Left
constructor :
parseValue String _ = Left "" -- without error message -- or parseValue String _ = Left "Error Message"
serialize :: a -> ScalarValue Source #
serialization of haskell type into scalar value
Instances
data GQLRequest Source #
GraphQL HTTP Request Body
Instances
data GQLResponse Source #
GraphQL Response
Instances
Show GQLResponse Source # | |
Defined in Data.Morpheus.Types.IO showsPrec :: Int -> GQLResponse -> ShowS # show :: GQLResponse -> String # showList :: [GQLResponse] -> ShowS # | |
Generic GQLResponse Source # | |
Defined in Data.Morpheus.Types.IO type Rep GQLResponse :: Type -> Type # from :: GQLResponse -> Rep GQLResponse x # to :: Rep GQLResponse x -> GQLResponse # | |
ToJSON GQLResponse Source # | |
Defined in Data.Morpheus.Types.IO toJSON :: GQLResponse -> Value # toEncoding :: GQLResponse -> Encoding # toJSONList :: [GQLResponse] -> Value # toEncodingList :: [GQLResponse] -> Encoding # | |
Interpreter (GQLRequest -> m GQLResponse) m e c Source # | |
Defined in Data.Morpheus.Execution.Server.Interpreter interpreter :: (Monad m, RootResCon m e c que mut sub) => GQLRootResolver m e c que mut sub -> GQLRequest -> m GQLResponse Source # | |
type Rep GQLResponse Source # | |
Defined in Data.Morpheus.Types.IO |
default GraphQL type,
parses only ScalarValue
and ScalarValue
values,
serialized always as ScalarValue
Instances
Generic ID Source # | |
GQLScalar ID Source # | |
Defined in Data.Morpheus.Types.ID parseValue :: ScalarValue -> Either Text ID Source # serialize :: ID -> ScalarValue Source # scalarValidator :: Proxy ID -> DataValidator | |
GQLType ID Source # | |
Defined in Data.Morpheus.Types.ID description :: Proxy ID -> Text Source # __typeVisibility :: Proxy ID -> Bool __typeName :: Proxy ID -> Text __typeFingerprint :: Proxy ID -> DataFingerprint | |
type Rep ID Source # | |
Defined in Data.Morpheus.Types.ID | |
type KIND ID Source # | |
Defined in Data.Morpheus.Types.ID |
data ScalarValue Source #
Primitive Values for GQLScalar: ScalarValue
, ScalarValue
, ScalarValue
, Boolean
.
for performance reason type Text
represents GraphQl ScalarValue
value
Instances
data GQLRootResolver m e c query mut sub Source #
GraphQL Root resolver, also the interpreter generates a GQL schema from it.
queryResolver
is required, mutationResolver
and subscriptionResolver
are optional,
if your schema does not supports mutation or subscription , you acn use () for it.
GQLRootResolver | |
|