Changelog for morpheus-graphql-0.2.1
[0.2.1] - 23.08.2019
- assets are added to cabal source files
[0.2.0] - 23.08.2019
Added
-
Parser Supports GraphQL comments
-
Enhanced Subscription: mutation can trigger subscription with arguments
-
Experimental Support of Input Unions
-
GraphQL schema generating with:
Data.Morpheus.Document.toGraphQLDocument
-
Generating dummy Morpheus Api from
schema.gql
:morpheus build schema/mythology.gql src/MythologyApi.hs
-
convertToJSONName
&convertToHaskellName
has been extended to support all Haskell 2010 reserved identities. details -
GraphQL Client
with Template haskell QuasiQuotes (Experimental, Not fully Implemented)defineQuery [gql| query GetHero ($byRealm: Realm) { deity (realm:$byRealm) { power fullName } } |]
will Generate:
- response type
GetHero
,Deity
withLens
Instances - input types:
GetHeroArgs
,Realm
- instance for
Fetch
typeClass
so that
fetchHero :: Args GetHero -> m (Either String GetHero) fetchHero = fetch jsonRes args where args = GetHeroArgs {byRealm = Just Realm {owner = "Zeus", surface = Just 10}} jsonRes :: ByteString -> m ByteString jsonRes = <fetch query from server>
resolves well typed response
GetHero
. - response type
-
Ability to define
GQLSchema
with GraphQL syntax , so that with this schema[gqlDocument| type Query { deity (uid: Text! ) : Deity! } type Deity { name : Text! power : Text } |] rootResolver :: GQLRootResolver IO () () Query () () rootResolver = GQLRootResolver {queryResolver = return Query {deity}, mutationResolver = pure (), subscriptionResolver = pure ()} where deity DeityArgs {uid} = pure Deity {name, power} where name _ = pure "Morpheus" power _ = pure (Just "Shapeshifting")
Template Haskell Generates types:
Query
,Deity
,DeityArgs
, that can be used byrootResolver
generated types are not compatible with
Mutation
,Subscription
, they can be used only inQuery
, but this issue will be fixed in next release
Fixed:
- Parser supports enums inside input Object
- fulfilled fragment Validation (added: unusedFragment,nameConflict)
- correct decoding of Enums with more than 3 constructor #201
Changed
-
WebSocket subProtocol changed from
graphql-subscriptions
tographql-ws
-
type familiy
KIND
is moved into typeClassesGQLType
, so you should replacetype instance KIND Deity = OBJECT instance GQLType Deity where description = const "Custom Description for Client Defined User Type" data Deity = Deity { fullName :: Text } deriving (Generic)
with
instance GQLType Deity where type KIND Deity = OBJECT description = const "Custom Description for Client Defined User Type" data Deity = Deity { fullName :: Text } deriving (Generic)
-
Duplicated variable names in Http requests are validated using
Aeson
'sjsonNoDup
function. So the following request will result in a parsing error{"query":"...", "variables":{"email":"foo@mail.net", "email":"bar@mail.net",...}}
[0.1.1] - 1.07.2019
Fixed:
- () as Subscription or Mutation does not defines Operator without fields
[0.1.0] - 30.06.2019
thanks for contributing to: @krisajenkins, @hovind, @vmchale, @msvbg
Added
-
support for Union Types:
type instance KIND <type> = UNION
-
support of haskell Types:
Map
,Set
, and Pair(a,b)
-
GraphQL Resolver supports custom Monad
-
add
Interpreter
class with instances:ByteString -> m ByteString
and LazyByteString
, wherem
is resolver monadText -> m Text
and LazyText
, wherem
is resolver monadGQLRequest -> m GQLResponse
, When you using it inside another Component that have ManualToJSON
deriving, you have to ensure thatGQLResponse
will be encoded withtoEncoding
, and not withtoJSON
.
-
Schema Validation:
- Name Collision
-
support of Parsing input values:
Objects
,Arrays
-
support scalar type:
ID
-
scalar Types are validated by
GQLScalar
instance functionparseValue
-
TypeFamily
KIND
with:SCALAR
OBJECT
,ENUM
INPUT_OBJECT
UNION
-
inline Fragments
-
GraphQL Aliases
-
Subscriptions:
GQLSubscription
a -> EffectM b
operation: is resolver that contains side effect inEffectM
. is used for Mutation and Subscribe communicationgqlEffectResolver ["CHANNEL_ID"]
: packs as effect Resolver. if mutation and subscription resolver have same channel then every call of mutation will trigger subscription resolverGQLState
: shared state betweenhttp
andwebsocket
servergqlSocketApp
:convertsinterpreter
towebsocket
applicationgraphql-subscriptions
:Apollo GraphQL
subProtocol
-
language:
- Query supports :
__type(name:"type")
- On every Object can be selected :
__typename
- Query supports :
Changed
GQLRootResolver
,GQLType(..)
,GQLScalar(..)
are moved inData.Morpheus.Types
GQLRoot { query, mutation, subscription }
toGQLRootResolver {queryResolver, mutationResolver, subscriptionResolver}
interpreter
: can be used inhttp
andwebsocket
serverGQLKind
renamed asGQLType
- types can be derived just with
(Generic,GQLType)
- haskell record field
type'
will generate GQL Object fieldtype
- public API (all other modules are hidden):
- Data.Morpheus
- Data.Morpheus.Kind
- Data.Morpheus.Types
- Data.Morpheus.Execution.Subscription
Fixed:
- parser can read fields with digits like: a1 , _1
- you can use Wrapped type and Wrapped Primitive Types issue #136:
- wrapped TypesNames will be separated with "_" : typeName(Either A B) -> "Either_A_B"
- introspection:
- argument supports
Non-Null
andList
- every field has correct kind
- argument supports
Removed
GQLArgs
: you can derive arguments just withGeneric
withoutGQLArgs
GQLObject
: replaced with instancetype instance KIND <Type> = OBJECT
GQLEnum
: replaced with instancetype instance KIND <Type> = ENUM
GQLInput
: replaced with instancetype instance KIND <Type> = INPUT_OBJECT
Typeable
: with new deriving it is not required anymoreWrapper
: with TypeFamilies there is no need forWrapper
a ::-> b
is Replaced bya -> ResM b
whereResM
is alias forResolver IO a
GQLMutation
,GQLQuery
: with new deriving it is not required anymoreResolver
constructor replaced by functions:gqlResolver
: packsm Either String a
toResolver m a
gqlEffectResolver
: resolver constructor for effectedResolverliftEffectResolver
: lifts normal resolver to Effect Resolver.