2016-02-12 13:27:46 +01:00
|
|
|
{-# LANGUAGE OverloadedStrings #-}
|
2020-05-27 23:18:35 +02:00
|
|
|
{-# LANGUAGE ScopedTypeVariables #-}
|
2019-07-14 05:58:05 +02:00
|
|
|
module Test.StarWars.Schema
|
2020-05-27 23:18:35 +02:00
|
|
|
( schema
|
2019-07-14 05:58:05 +02:00
|
|
|
) where
|
2016-02-12 13:27:46 +01:00
|
|
|
|
2020-05-27 23:18:35 +02:00
|
|
|
import Control.Monad.Trans.Reader (asks)
|
2019-07-02 20:07:26 +02:00
|
|
|
import Control.Monad.Trans.Except (throwE)
|
|
|
|
import Control.Monad.Trans.Class (lift)
|
2020-02-01 20:46:35 +01:00
|
|
|
import Data.Functor.Identity (Identity)
|
2020-05-23 06:46:21 +02:00
|
|
|
import qualified Data.HashMap.Strict as HashMap
|
2019-09-01 02:53:15 +02:00
|
|
|
import Data.Maybe (catMaybes)
|
2020-05-27 23:18:35 +02:00
|
|
|
import Data.Text (Text)
|
2019-07-02 20:07:26 +02:00
|
|
|
import Language.GraphQL.Trans
|
2020-06-19 10:53:41 +02:00
|
|
|
import Language.GraphQL.Type
|
2020-06-06 21:22:11 +02:00
|
|
|
import qualified Language.GraphQL.Type.In as In
|
2020-05-24 13:51:00 +02:00
|
|
|
import qualified Language.GraphQL.Type.Out as Out
|
2016-02-12 13:27:46 +01:00
|
|
|
import Test.StarWars.Data
|
2020-05-27 23:18:35 +02:00
|
|
|
import Prelude hiding (id)
|
2016-02-12 13:27:46 +01:00
|
|
|
|
|
|
|
-- See https://github.com/graphql/graphql-js/blob/master/src/__tests__/starWarsSchema.js
|
|
|
|
|
2020-05-14 09:17:14 +02:00
|
|
|
schema :: Schema Identity
|
|
|
|
schema = Schema { query = queryType, mutation = Nothing }
|
|
|
|
where
|
2020-05-26 11:13:55 +02:00
|
|
|
queryType = Out.ObjectType "Query" Nothing [] $ HashMap.fromList
|
2020-06-06 21:22:11 +02:00
|
|
|
[ ("hero", Out.Resolver heroField hero)
|
|
|
|
, ("human", Out.Resolver humanField human)
|
|
|
|
, ("droid", Out.Resolver droidField droid)
|
2020-05-23 06:46:21 +02:00
|
|
|
]
|
2020-06-06 21:22:11 +02:00
|
|
|
heroField = Out.Field Nothing (Out.NamedObjectType heroObject)
|
|
|
|
$ HashMap.singleton "episode"
|
|
|
|
$ In.Argument Nothing (In.NamedEnumType episodeEnum) Nothing
|
|
|
|
humanField = Out.Field Nothing (Out.NamedObjectType heroObject)
|
|
|
|
$ HashMap.singleton "id"
|
|
|
|
$ In.Argument Nothing (In.NonNullScalarType string) Nothing
|
|
|
|
droidField = Out.Field Nothing (Out.NamedObjectType droidObject) mempty
|
2016-02-19 19:21:32 +01:00
|
|
|
|
2020-05-27 23:18:35 +02:00
|
|
|
heroObject :: Out.ObjectType Identity
|
|
|
|
heroObject = Out.ObjectType "Human" Nothing [] $ HashMap.fromList
|
2020-06-03 07:20:38 +02:00
|
|
|
[ ("id", Out.Resolver idFieldType (idField "id"))
|
|
|
|
, ("name", Out.Resolver nameFieldType (idField "name"))
|
|
|
|
, ("friends", Out.Resolver friendsFieldType (idField "friends"))
|
2020-06-13 07:20:19 +02:00
|
|
|
, ("appearsIn", Out.Resolver appearsInField (idField "appearsIn"))
|
2020-06-03 07:20:38 +02:00
|
|
|
, ("homePlanet", Out.Resolver homePlanetFieldType (idField "homePlanet"))
|
|
|
|
, ("secretBackstory", Out.Resolver secretBackstoryFieldType (String <$> secretBackstory))
|
|
|
|
, ("__typename", Out.Resolver (Out.Field Nothing (Out.NamedScalarType string) mempty) (idField "__typename"))
|
2020-05-27 23:18:35 +02:00
|
|
|
]
|
2020-06-03 07:20:38 +02:00
|
|
|
where
|
|
|
|
homePlanetFieldType = Out.Field Nothing (Out.NamedScalarType string) mempty
|
2020-05-27 23:18:35 +02:00
|
|
|
|
|
|
|
droidObject :: Out.ObjectType Identity
|
|
|
|
droidObject = Out.ObjectType "Droid" Nothing [] $ HashMap.fromList
|
2020-06-03 07:20:38 +02:00
|
|
|
[ ("id", Out.Resolver idFieldType (idField "id"))
|
|
|
|
, ("name", Out.Resolver nameFieldType (idField "name"))
|
|
|
|
, ("friends", Out.Resolver friendsFieldType (idField "friends"))
|
2020-06-13 07:20:19 +02:00
|
|
|
, ("appearsIn", Out.Resolver appearsInField (idField "appearsIn"))
|
2020-06-03 07:20:38 +02:00
|
|
|
, ("primaryFunction", Out.Resolver primaryFunctionFieldType (idField "primaryFunction"))
|
|
|
|
, ("secretBackstory", Out.Resolver secretBackstoryFieldType (String <$> secretBackstory))
|
|
|
|
, ("__typename", Out.Resolver (Out.Field Nothing (Out.NamedScalarType string) mempty) (idField "__typename"))
|
2020-05-27 23:18:35 +02:00
|
|
|
]
|
2020-06-03 07:20:38 +02:00
|
|
|
where
|
|
|
|
primaryFunctionFieldType = Out.Field Nothing (Out.NamedScalarType string) mempty
|
|
|
|
|
|
|
|
idFieldType :: Out.Field Identity
|
|
|
|
idFieldType = Out.Field Nothing (Out.NamedScalarType id) mempty
|
|
|
|
|
|
|
|
nameFieldType :: Out.Field Identity
|
|
|
|
nameFieldType = Out.Field Nothing (Out.NamedScalarType string) mempty
|
|
|
|
|
|
|
|
friendsFieldType :: Out.Field Identity
|
|
|
|
friendsFieldType = Out.Field Nothing (Out.ListType $ Out.NamedObjectType droidObject) mempty
|
|
|
|
|
2020-06-13 07:20:19 +02:00
|
|
|
appearsInField :: Out.Field Identity
|
|
|
|
appearsInField = Out.Field (Just description) fieldType mempty
|
|
|
|
where
|
|
|
|
fieldType = Out.ListType $ Out.NamedEnumType episodeEnum
|
|
|
|
description = "Which movies they appear in."
|
2020-06-03 07:20:38 +02:00
|
|
|
|
|
|
|
secretBackstoryFieldType :: Out.Field Identity
|
|
|
|
secretBackstoryFieldType = Out.Field Nothing (Out.NamedScalarType string) mempty
|
2020-05-27 23:18:35 +02:00
|
|
|
|
|
|
|
idField :: Text -> ActionT Identity Value
|
|
|
|
idField f = do
|
|
|
|
v <- ActionT $ lift $ asks values
|
|
|
|
let (Object v') = v
|
|
|
|
pure $ v' HashMap.! f
|
|
|
|
|
2020-06-06 21:22:11 +02:00
|
|
|
episodeEnum :: EnumType
|
2020-06-07 06:16:45 +02:00
|
|
|
episodeEnum = EnumType "Episode" (Just description)
|
|
|
|
$ HashMap.fromList [newHope, empire, jedi]
|
|
|
|
where
|
|
|
|
description = "One of the films in the Star Wars Trilogy"
|
|
|
|
newHope = ("NEW_HOPE", EnumValue $ Just "Released in 1977.")
|
|
|
|
empire = ("EMPIRE", EnumValue $ Just "Released in 1980.")
|
|
|
|
jedi = ("JEDI", EnumValue $ Just "Released in 1983.")
|
2020-06-06 21:22:11 +02:00
|
|
|
|
2020-05-27 23:18:35 +02:00
|
|
|
hero :: ActionT Identity Value
|
2020-05-24 13:51:00 +02:00
|
|
|
hero = do
|
2019-12-31 08:29:03 +01:00
|
|
|
episode <- argument "episode"
|
2020-05-23 06:46:21 +02:00
|
|
|
pure $ character $ case episode of
|
2020-06-13 07:20:19 +02:00
|
|
|
Enum "NEW_HOPE" -> getHero 4
|
2020-05-27 23:18:35 +02:00
|
|
|
Enum "EMPIRE" -> getHero 5
|
|
|
|
Enum "JEDI" -> getHero 6
|
2019-12-31 08:29:03 +01:00
|
|
|
_ -> artoo
|
2016-02-19 19:21:32 +01:00
|
|
|
|
2020-05-27 23:18:35 +02:00
|
|
|
human :: ActionT Identity Value
|
2020-05-24 13:51:00 +02:00
|
|
|
human = do
|
2019-12-31 08:29:03 +01:00
|
|
|
id' <- argument "id"
|
|
|
|
case id' of
|
2020-05-27 23:18:35 +02:00
|
|
|
String i -> do
|
2019-12-31 08:29:03 +01:00
|
|
|
humanCharacter <- lift $ return $ getHuman i >>= Just
|
|
|
|
case humanCharacter of
|
2020-05-27 23:18:35 +02:00
|
|
|
Nothing -> pure Null
|
2020-05-23 06:46:21 +02:00
|
|
|
Just e -> pure $ character e
|
2019-12-31 08:29:03 +01:00
|
|
|
_ -> ActionT $ throwE "Invalid arguments."
|
2016-02-19 19:21:32 +01:00
|
|
|
|
2020-05-27 23:18:35 +02:00
|
|
|
droid :: ActionT Identity Value
|
2020-05-24 13:51:00 +02:00
|
|
|
droid = do
|
2019-12-31 08:29:03 +01:00
|
|
|
id' <- argument "id"
|
|
|
|
case id' of
|
2020-05-27 23:18:35 +02:00
|
|
|
String i -> character <$> getDroid i
|
2019-12-31 08:29:03 +01:00
|
|
|
_ -> ActionT $ throwE "Invalid arguments."
|
2019-07-02 20:07:26 +02:00
|
|
|
|
2020-05-27 23:18:35 +02:00
|
|
|
character :: Character -> Value
|
|
|
|
character char = Object $ HashMap.fromList
|
|
|
|
[ ("id", String $ id_ char)
|
|
|
|
, ("name", String $ name_ char)
|
|
|
|
, ("friends", List $ character <$> getFriends char)
|
|
|
|
, ("appearsIn", List $ Enum <$> catMaybes (getEpisode <$> appearsIn char))
|
|
|
|
, ("homePlanet", String $ either mempty homePlanet char)
|
|
|
|
, ("__typename", String $ typeName char)
|
2019-07-02 20:07:26 +02:00
|
|
|
]
|