2020-07-20 21:29:12 +02:00
|
|
|
{- This Source Code Form is subject to the terms of the Mozilla Public License,
|
|
|
|
v. 2.0. If a copy of the MPL was not distributed with this file, You can
|
|
|
|
obtain one at https://mozilla.org/MPL/2.0/. -}
|
|
|
|
|
|
|
|
{-# LANGUAGE OverloadedStrings #-}
|
|
|
|
{-# LANGUAGE QuasiQuotes #-}
|
|
|
|
|
|
|
|
module Language.GraphQL.ValidateSpec
|
|
|
|
( spec
|
|
|
|
) where
|
|
|
|
|
2020-09-25 21:57:25 +02:00
|
|
|
import Data.Foldable (toList)
|
2020-07-20 21:29:12 +02:00
|
|
|
import qualified Data.HashMap.Strict as HashMap
|
|
|
|
import Data.Text (Text)
|
|
|
|
import qualified Language.GraphQL.AST as AST
|
|
|
|
import Language.GraphQL.Type
|
|
|
|
import qualified Language.GraphQL.Type.In as In
|
|
|
|
import qualified Language.GraphQL.Type.Out as Out
|
|
|
|
import Language.GraphQL.Validate
|
2020-09-25 21:57:25 +02:00
|
|
|
import Test.Hspec (Spec, describe, it, shouldBe, shouldContain)
|
2020-11-19 08:48:37 +01:00
|
|
|
import Text.Megaparsec (parse, errorBundlePretty)
|
2020-07-20 21:29:12 +02:00
|
|
|
import Text.RawString.QQ (r)
|
|
|
|
|
2020-09-28 07:06:15 +02:00
|
|
|
petSchema :: Schema IO
|
2020-10-07 05:24:51 +02:00
|
|
|
petSchema = schema queryType Nothing (Just subscriptionType) mempty
|
2020-07-20 21:29:12 +02:00
|
|
|
|
|
|
|
queryType :: ObjectType IO
|
2020-09-25 21:57:25 +02:00
|
|
|
queryType = ObjectType "Query" Nothing [] $ HashMap.fromList
|
|
|
|
[ ("dog", dogResolver)
|
2020-11-19 08:48:37 +01:00
|
|
|
, ("cat", catResolver)
|
2020-09-25 21:57:25 +02:00
|
|
|
, ("findDog", findDogResolver)
|
|
|
|
]
|
2020-07-20 21:29:12 +02:00
|
|
|
where
|
|
|
|
dogField = Field Nothing (Out.NamedObjectType dogType) mempty
|
|
|
|
dogResolver = ValueResolver dogField $ pure Null
|
2020-09-25 21:57:25 +02:00
|
|
|
findDogArguments = HashMap.singleton "complex"
|
|
|
|
$ In.Argument Nothing (In.NonNullInputObjectType dogDataType) Nothing
|
|
|
|
findDogField = Field Nothing (Out.NamedObjectType dogType) findDogArguments
|
|
|
|
findDogResolver = ValueResolver findDogField $ pure Null
|
2020-11-19 08:48:37 +01:00
|
|
|
catField = Field Nothing (Out.NamedObjectType catType) mempty
|
|
|
|
catResolver = ValueResolver catField $ pure Null
|
|
|
|
|
|
|
|
catCommandType :: EnumType
|
|
|
|
catCommandType = EnumType "CatCommand" Nothing $ HashMap.fromList
|
|
|
|
[ ("JUMP", EnumValue Nothing)
|
|
|
|
]
|
|
|
|
|
|
|
|
catType :: ObjectType IO
|
|
|
|
catType = ObjectType "Cat" Nothing [petType] $ HashMap.fromList
|
|
|
|
[ ("name", nameResolver)
|
|
|
|
, ("nickname", nicknameResolver)
|
|
|
|
, ("doesKnowCommand", doesKnowCommandResolver)
|
|
|
|
, ("meowVolume", meowVolumeResolver)
|
|
|
|
]
|
|
|
|
where
|
|
|
|
meowVolumeField = Field Nothing (Out.NamedScalarType int) mempty
|
|
|
|
meowVolumeResolver = ValueResolver meowVolumeField $ pure $ Int 3
|
|
|
|
doesKnowCommandField = Field Nothing (Out.NonNullScalarType boolean)
|
|
|
|
$ HashMap.singleton "catCommand"
|
|
|
|
$ In.Argument Nothing (In.NonNullEnumType catCommandType) Nothing
|
|
|
|
doesKnowCommandResolver = ValueResolver doesKnowCommandField
|
|
|
|
$ pure $ Boolean True
|
|
|
|
|
|
|
|
nameResolver :: Resolver IO
|
|
|
|
nameResolver = ValueResolver nameField $ pure "Name"
|
|
|
|
where
|
|
|
|
nameField = Field Nothing (Out.NonNullScalarType string) mempty
|
|
|
|
|
|
|
|
nicknameResolver :: Resolver IO
|
|
|
|
nicknameResolver = ValueResolver nicknameField $ pure "Nickname"
|
|
|
|
where
|
|
|
|
nicknameField = Field Nothing (Out.NamedScalarType string) mempty
|
2020-07-20 21:29:12 +02:00
|
|
|
|
|
|
|
dogCommandType :: EnumType
|
|
|
|
dogCommandType = EnumType "DogCommand" Nothing $ HashMap.fromList
|
|
|
|
[ ("SIT", EnumValue Nothing)
|
|
|
|
, ("DOWN", EnumValue Nothing)
|
|
|
|
, ("HEEL", EnumValue Nothing)
|
|
|
|
]
|
|
|
|
|
|
|
|
dogType :: ObjectType IO
|
|
|
|
dogType = ObjectType "Dog" Nothing [petType] $ HashMap.fromList
|
|
|
|
[ ("name", nameResolver)
|
|
|
|
, ("nickname", nicknameResolver)
|
|
|
|
, ("barkVolume", barkVolumeResolver)
|
|
|
|
, ("doesKnowCommand", doesKnowCommandResolver)
|
|
|
|
, ("isHousetrained", isHousetrainedResolver)
|
|
|
|
, ("owner", ownerResolver)
|
|
|
|
]
|
|
|
|
where
|
|
|
|
barkVolumeField = Field Nothing (Out.NamedScalarType int) mempty
|
|
|
|
barkVolumeResolver = ValueResolver barkVolumeField $ pure $ Int 3
|
|
|
|
doesKnowCommandField = Field Nothing (Out.NonNullScalarType boolean)
|
|
|
|
$ HashMap.singleton "dogCommand"
|
|
|
|
$ In.Argument Nothing (In.NonNullEnumType dogCommandType) Nothing
|
|
|
|
doesKnowCommandResolver = ValueResolver doesKnowCommandField
|
|
|
|
$ pure $ Boolean True
|
|
|
|
isHousetrainedField = Field Nothing (Out.NonNullScalarType boolean)
|
|
|
|
$ HashMap.singleton "atOtherHomes"
|
|
|
|
$ In.Argument Nothing (In.NamedScalarType boolean) Nothing
|
|
|
|
isHousetrainedResolver = ValueResolver isHousetrainedField
|
|
|
|
$ pure $ Boolean True
|
|
|
|
ownerField = Field Nothing (Out.NamedObjectType humanType) mempty
|
|
|
|
ownerResolver = ValueResolver ownerField $ pure Null
|
|
|
|
|
2020-09-25 21:57:25 +02:00
|
|
|
dogDataType :: InputObjectType
|
|
|
|
dogDataType = InputObjectType "DogData" Nothing
|
|
|
|
$ HashMap.singleton "name" nameInputField
|
|
|
|
where
|
|
|
|
nameInputField = InputField Nothing (In.NonNullScalarType string) Nothing
|
|
|
|
|
2020-07-20 21:29:12 +02:00
|
|
|
sentientType :: InterfaceType IO
|
|
|
|
sentientType = InterfaceType "Sentient" Nothing []
|
|
|
|
$ HashMap.singleton "name"
|
|
|
|
$ Field Nothing (Out.NonNullScalarType string) mempty
|
|
|
|
|
|
|
|
petType :: InterfaceType IO
|
|
|
|
petType = InterfaceType "Pet" Nothing []
|
|
|
|
$ HashMap.singleton "name"
|
|
|
|
$ Field Nothing (Out.NonNullScalarType string) mempty
|
2020-09-04 19:12:19 +02:00
|
|
|
|
|
|
|
subscriptionType :: ObjectType IO
|
|
|
|
subscriptionType = ObjectType "Subscription" Nothing [] $ HashMap.fromList
|
|
|
|
[ ("newMessage", newMessageResolver)
|
2020-11-06 08:33:51 +01:00
|
|
|
, ("disallowedSecondRootField", newMessageResolver)
|
2020-07-20 21:29:12 +02:00
|
|
|
]
|
|
|
|
where
|
2020-09-04 19:12:19 +02:00
|
|
|
newMessageField = Field Nothing (Out.NonNullObjectType messageType) mempty
|
|
|
|
newMessageResolver = ValueResolver newMessageField
|
|
|
|
$ pure $ Object HashMap.empty
|
|
|
|
|
|
|
|
messageType :: ObjectType IO
|
|
|
|
messageType = ObjectType "Message" Nothing [] $ HashMap.fromList
|
|
|
|
[ ("sender", senderResolver)
|
|
|
|
, ("body", bodyResolver)
|
|
|
|
]
|
|
|
|
where
|
|
|
|
senderField = Field Nothing (Out.NonNullScalarType string) mempty
|
|
|
|
senderResolver = ValueResolver senderField $ pure "Sender"
|
|
|
|
bodyField = Field Nothing (Out.NonNullScalarType string) mempty
|
|
|
|
bodyResolver = ValueResolver bodyField $ pure "Message body."
|
|
|
|
|
2020-07-20 21:29:12 +02:00
|
|
|
humanType :: ObjectType IO
|
|
|
|
humanType = ObjectType "Human" Nothing [sentientType] $ HashMap.fromList
|
|
|
|
[ ("name", nameResolver)
|
|
|
|
, ("pets", petsResolver)
|
|
|
|
]
|
|
|
|
where
|
|
|
|
petsField =
|
|
|
|
Field Nothing (Out.ListType $ Out.NonNullInterfaceType petType) mempty
|
|
|
|
petsResolver = ValueResolver petsField $ pure $ List []
|
|
|
|
{-
|
|
|
|
catOrDogType :: UnionType IO
|
|
|
|
catOrDogType = UnionType "CatOrDog" Nothing [catType, dogType]
|
|
|
|
-}
|
2020-09-25 21:57:25 +02:00
|
|
|
validate :: Text -> [Error]
|
2020-07-20 21:29:12 +02:00
|
|
|
validate queryString =
|
|
|
|
case parse AST.document "" queryString of
|
2020-11-19 08:48:37 +01:00
|
|
|
Left parseErrors -> error $ errorBundlePretty parseErrors
|
2020-09-28 07:06:15 +02:00
|
|
|
Right ast -> toList $ document petSchema specifiedRules ast
|
2020-07-20 21:29:12 +02:00
|
|
|
|
|
|
|
spec :: Spec
|
|
|
|
spec =
|
2020-08-25 21:03:42 +02:00
|
|
|
describe "document" $ do
|
2020-07-20 21:29:12 +02:00
|
|
|
it "rejects type definitions" $
|
|
|
|
let queryString = [r|
|
|
|
|
query getDogName {
|
|
|
|
dog {
|
|
|
|
name
|
|
|
|
color
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|
|
|
|
extend type Dog {
|
|
|
|
color: String
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Definition must be OperationDefinition or FragmentDefinition."
|
|
|
|
, locations = [AST.Location 9 15]
|
|
|
|
}
|
2020-09-25 21:57:25 +02:00
|
|
|
in validate queryString `shouldContain` [expected]
|
2020-08-25 21:03:42 +02:00
|
|
|
|
|
|
|
it "rejects multiple subscription root fields" $
|
|
|
|
let queryString = [r|
|
|
|
|
subscription sub {
|
|
|
|
newMessage {
|
|
|
|
body
|
|
|
|
sender
|
|
|
|
}
|
|
|
|
disallowedSecondRootField
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
2020-11-06 08:33:51 +01:00
|
|
|
"Subscription \"sub\" must select only one top level \
|
|
|
|
\field."
|
2020-08-25 21:03:42 +02:00
|
|
|
, locations = [AST.Location 2 15]
|
|
|
|
}
|
2020-09-25 21:57:25 +02:00
|
|
|
in validate queryString `shouldContain` [expected]
|
2020-08-25 21:03:42 +02:00
|
|
|
|
|
|
|
it "rejects multiple subscription root fields coming from a fragment" $
|
|
|
|
let queryString = [r|
|
|
|
|
subscription sub {
|
|
|
|
...multipleSubscriptions
|
|
|
|
}
|
|
|
|
|
|
|
|
fragment multipleSubscriptions on Subscription {
|
|
|
|
newMessage {
|
|
|
|
body
|
|
|
|
sender
|
|
|
|
}
|
|
|
|
disallowedSecondRootField
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
2020-11-06 08:33:51 +01:00
|
|
|
"Subscription \"sub\" must select only one top level \
|
|
|
|
\field."
|
2020-08-25 21:03:42 +02:00
|
|
|
, locations = [AST.Location 2 15]
|
|
|
|
}
|
2020-09-25 21:57:25 +02:00
|
|
|
in validate queryString `shouldContain` [expected]
|
2020-08-26 18:58:48 +02:00
|
|
|
|
|
|
|
it "rejects multiple anonymous operations" $
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
|
|
|
dog {
|
|
|
|
name
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|
|
|
|
query getName {
|
|
|
|
dog {
|
|
|
|
owner {
|
|
|
|
name
|
|
|
|
}
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"This anonymous operation must be the only defined operation."
|
|
|
|
, locations = [AST.Location 2 15]
|
|
|
|
}
|
2020-09-25 21:57:25 +02:00
|
|
|
in validate queryString `shouldBe` [expected]
|
2020-08-27 09:04:31 +02:00
|
|
|
|
|
|
|
it "rejects operations with the same name" $
|
|
|
|
let queryString = [r|
|
|
|
|
query dogOperation {
|
|
|
|
dog {
|
|
|
|
name
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|
|
|
|
mutation dogOperation {
|
|
|
|
mutateDog {
|
|
|
|
id
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"There can be only one operation named \"dogOperation\"."
|
|
|
|
, locations = [AST.Location 2 15, AST.Location 8 15]
|
|
|
|
}
|
2020-09-25 21:57:25 +02:00
|
|
|
in validate queryString `shouldBe` [expected]
|
2020-08-28 08:32:21 +02:00
|
|
|
|
|
|
|
it "rejects fragments with the same name" $
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
|
|
|
dog {
|
|
|
|
...fragmentOne
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|
|
|
|
fragment fragmentOne on Dog {
|
|
|
|
name
|
|
|
|
}
|
|
|
|
|
|
|
|
fragment fragmentOne on Dog {
|
|
|
|
owner {
|
|
|
|
name
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"There can be only one fragment named \"fragmentOne\"."
|
|
|
|
, locations = [AST.Location 8 15, AST.Location 12 15]
|
|
|
|
}
|
2020-09-25 21:57:25 +02:00
|
|
|
in validate queryString `shouldBe` [expected]
|
2020-08-31 11:06:27 +02:00
|
|
|
|
|
|
|
it "rejects the fragment spread without a target" $
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
|
|
|
dog {
|
|
|
|
...undefinedFragment
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Fragment target \"undefinedFragment\" is undefined."
|
|
|
|
, locations = [AST.Location 4 19]
|
|
|
|
}
|
2020-09-25 21:57:25 +02:00
|
|
|
in validate queryString `shouldBe` [expected]
|
2020-09-04 19:12:19 +02:00
|
|
|
|
2020-09-05 10:00:58 +02:00
|
|
|
it "rejects fragment spreads without an unknown target type" $
|
2020-09-04 19:12:19 +02:00
|
|
|
let queryString = [r|
|
|
|
|
{
|
|
|
|
dog {
|
|
|
|
...notOnExistingType
|
|
|
|
}
|
|
|
|
}
|
|
|
|
fragment notOnExistingType on NotInSchema {
|
|
|
|
name
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Fragment \"notOnExistingType\" is specified on type \
|
|
|
|
\\"NotInSchema\" which doesn't exist in the schema."
|
|
|
|
, locations = [AST.Location 4 19]
|
|
|
|
}
|
2020-09-25 21:57:25 +02:00
|
|
|
in validate queryString `shouldBe` [expected]
|
2020-09-05 10:00:58 +02:00
|
|
|
|
|
|
|
it "rejects inline fragments without a target" $
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
|
|
|
... on NotInSchema {
|
|
|
|
name
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Inline fragment is specified on type \"NotInSchema\" \
|
|
|
|
\which doesn't exist in the schema."
|
|
|
|
, locations = [AST.Location 3 17]
|
|
|
|
}
|
2020-09-25 21:57:25 +02:00
|
|
|
in validate queryString `shouldBe` [expected]
|
2020-09-07 22:01:49 +02:00
|
|
|
|
|
|
|
it "rejects fragments on scalar types" $
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
|
|
|
dog {
|
|
|
|
...fragOnScalar
|
|
|
|
}
|
|
|
|
}
|
|
|
|
fragment fragOnScalar on Int {
|
|
|
|
name
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Fragment cannot condition on non composite type \
|
|
|
|
\\"Int\"."
|
|
|
|
, locations = [AST.Location 7 15]
|
|
|
|
}
|
2020-09-25 21:57:25 +02:00
|
|
|
in validate queryString `shouldContain` [expected]
|
2020-09-07 22:01:49 +02:00
|
|
|
|
|
|
|
it "rejects inline fragments on scalar types" $
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
|
|
|
... on Boolean {
|
|
|
|
name
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Fragment cannot condition on non composite type \
|
|
|
|
\\"Boolean\"."
|
|
|
|
, locations = [AST.Location 3 17]
|
|
|
|
}
|
2020-09-25 21:57:25 +02:00
|
|
|
in validate queryString `shouldContain` [expected]
|
2020-09-09 17:04:31 +02:00
|
|
|
|
|
|
|
it "rejects unused fragments" $
|
|
|
|
let queryString = [r|
|
|
|
|
fragment nameFragment on Dog { # unused
|
|
|
|
name
|
|
|
|
}
|
|
|
|
|
|
|
|
{
|
|
|
|
dog {
|
|
|
|
name
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Fragment \"nameFragment\" is never used."
|
|
|
|
, locations = [AST.Location 2 15]
|
|
|
|
}
|
2020-09-25 21:57:25 +02:00
|
|
|
in validate queryString `shouldBe` [expected]
|
2020-09-11 08:03:49 +02:00
|
|
|
|
|
|
|
it "rejects spreads that form cycles" $
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
|
|
|
dog {
|
|
|
|
...nameFragment
|
|
|
|
}
|
|
|
|
}
|
|
|
|
fragment nameFragment on Dog {
|
|
|
|
name
|
|
|
|
...barkVolumeFragment
|
|
|
|
}
|
|
|
|
fragment barkVolumeFragment on Dog {
|
|
|
|
barkVolume
|
|
|
|
...nameFragment
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
error1 = Error
|
|
|
|
{ message =
|
|
|
|
"Cannot spread fragment \"barkVolumeFragment\" within \
|
|
|
|
\itself (via barkVolumeFragment -> nameFragment -> \
|
|
|
|
\barkVolumeFragment)."
|
|
|
|
, locations = [AST.Location 11 15]
|
|
|
|
}
|
|
|
|
error2 = Error
|
|
|
|
{ message =
|
|
|
|
"Cannot spread fragment \"nameFragment\" within itself \
|
|
|
|
\(via nameFragment -> barkVolumeFragment -> \
|
|
|
|
\nameFragment)."
|
|
|
|
, locations = [AST.Location 7 15]
|
|
|
|
}
|
2020-09-25 21:57:25 +02:00
|
|
|
in validate queryString `shouldBe` [error1, error2]
|
2020-09-17 10:33:37 +02:00
|
|
|
|
|
|
|
it "rejects duplicate field arguments" $ do
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
|
|
|
dog {
|
|
|
|
isHousetrained(atOtherHomes: true, atOtherHomes: true)
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"There can be only one argument named \"atOtherHomes\"."
|
|
|
|
, locations = [AST.Location 4 34, AST.Location 4 54]
|
|
|
|
}
|
2020-09-25 21:57:25 +02:00
|
|
|
in validate queryString `shouldBe` [expected]
|
2020-09-18 07:32:58 +02:00
|
|
|
|
|
|
|
it "rejects more than one directive per location" $ do
|
|
|
|
let queryString = [r|
|
|
|
|
query ($foo: Boolean = true, $bar: Boolean = false) {
|
2020-09-25 21:57:25 +02:00
|
|
|
dog @skip(if: $foo) @skip(if: $bar) {
|
|
|
|
name
|
|
|
|
}
|
2020-09-18 07:32:58 +02:00
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"There can be only one directive named \"skip\"."
|
2020-09-25 21:57:25 +02:00
|
|
|
, locations = [AST.Location 3 21, AST.Location 3 37]
|
2020-09-18 07:32:58 +02:00
|
|
|
}
|
2020-09-25 21:57:25 +02:00
|
|
|
in validate queryString `shouldBe` [expected]
|
2020-09-19 18:18:26 +02:00
|
|
|
|
|
|
|
it "rejects duplicate variables" $
|
|
|
|
let queryString = [r|
|
|
|
|
query houseTrainedQuery($atOtherHomes: Boolean, $atOtherHomes: Boolean) {
|
|
|
|
dog {
|
|
|
|
isHousetrained(atOtherHomes: $atOtherHomes)
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"There can be only one variable named \"atOtherHomes\"."
|
|
|
|
, locations = [AST.Location 2 39, AST.Location 2 63]
|
|
|
|
}
|
2020-09-25 21:57:25 +02:00
|
|
|
in validate queryString `shouldBe` [expected]
|
2020-09-20 06:59:27 +02:00
|
|
|
|
|
|
|
it "rejects non-input types as variables" $
|
|
|
|
let queryString = [r|
|
|
|
|
query takesDogBang($dog: Dog!) {
|
|
|
|
dog {
|
|
|
|
isHousetrained(atOtherHomes: $dog)
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Variable \"$dog\" cannot be non-input type \"Dog\"."
|
|
|
|
, locations = [AST.Location 2 34]
|
|
|
|
}
|
2020-12-26 06:31:56 +01:00
|
|
|
in validate queryString `shouldContain` [expected]
|
2020-09-21 07:28:40 +02:00
|
|
|
|
|
|
|
it "rejects undefined variables" $
|
|
|
|
let queryString = [r|
|
|
|
|
query variableIsNotDefinedUsedInSingleFragment {
|
|
|
|
dog {
|
|
|
|
...isHousetrainedFragment
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|
|
|
|
fragment isHousetrainedFragment on Dog {
|
|
|
|
isHousetrained(atOtherHomes: $atOtherHomes)
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Variable \"$atOtherHomes\" is not defined by \
|
|
|
|
\operation \
|
|
|
|
\\"variableIsNotDefinedUsedInSingleFragment\"."
|
|
|
|
, locations = [AST.Location 9 46]
|
|
|
|
}
|
2020-09-25 21:57:25 +02:00
|
|
|
in validate queryString `shouldBe` [expected]
|
2020-09-22 04:42:25 +02:00
|
|
|
|
|
|
|
it "rejects unused variables" $
|
|
|
|
let queryString = [r|
|
|
|
|
query variableUnused($atOtherHomes: Boolean) {
|
|
|
|
dog {
|
|
|
|
isHousetrained
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Variable \"$atOtherHomes\" is never used in operation \
|
|
|
|
\\"variableUnused\"."
|
|
|
|
, locations = [AST.Location 2 36]
|
|
|
|
}
|
2020-09-25 21:57:25 +02:00
|
|
|
in validate queryString `shouldBe` [expected]
|
2020-09-24 05:47:31 +02:00
|
|
|
|
|
|
|
it "rejects duplicate fields in input objects" $
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
2020-09-26 09:06:30 +02:00
|
|
|
findDog(complex: { name: "Fido", name: "Jack" }) {
|
|
|
|
name
|
|
|
|
}
|
2020-09-24 05:47:31 +02:00
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"There can be only one input field named \"name\"."
|
|
|
|
, locations = [AST.Location 3 36, AST.Location 3 50]
|
|
|
|
}
|
2020-09-25 21:57:25 +02:00
|
|
|
in validate queryString `shouldBe` [expected]
|
2020-09-26 09:06:30 +02:00
|
|
|
|
|
|
|
it "rejects undefined fields" $
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
|
|
|
dog {
|
|
|
|
meowVolume
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Cannot query field \"meowVolume\" on type \"Dog\"."
|
|
|
|
, locations = [AST.Location 4 19]
|
|
|
|
}
|
|
|
|
in validate queryString `shouldBe` [expected]
|
|
|
|
|
|
|
|
it "rejects scalar fields with not empty selection set" $
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
|
|
|
dog {
|
|
|
|
barkVolume {
|
|
|
|
sinceWhen
|
|
|
|
}
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Field \"barkVolume\" must not have a selection since \
|
|
|
|
\type \"Int\" has no subfields."
|
|
|
|
, locations = [AST.Location 4 19]
|
|
|
|
}
|
|
|
|
in validate queryString `shouldBe` [expected]
|
2020-09-28 07:06:15 +02:00
|
|
|
|
|
|
|
it "rejects field arguments missing in the type" $
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
|
|
|
dog {
|
2020-10-03 07:34:34 +02:00
|
|
|
doesKnowCommand(command: CLEAN_UP_HOUSE, dogCommand: SIT)
|
2020-09-28 07:06:15 +02:00
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Unknown argument \"command\" on field \
|
|
|
|
\\"Dog.doesKnowCommand\"."
|
|
|
|
, locations = [AST.Location 4 35]
|
|
|
|
}
|
|
|
|
in validate queryString `shouldBe` [expected]
|
|
|
|
|
|
|
|
it "rejects directive arguments missing in the definition" $
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
|
|
|
dog {
|
2020-10-03 07:34:34 +02:00
|
|
|
isHousetrained(atOtherHomes: true) @include(unless: false, if: true)
|
2020-09-28 07:06:15 +02:00
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Unknown argument \"unless\" on directive \"@include\"."
|
|
|
|
, locations = [AST.Location 4 63]
|
|
|
|
}
|
|
|
|
in validate queryString `shouldBe` [expected]
|
2020-09-29 06:21:32 +02:00
|
|
|
|
|
|
|
it "rejects undefined directives" $
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
|
|
|
dog {
|
|
|
|
isHousetrained(atOtherHomes: true) @ignore(if: true)
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message = "Unknown directive \"@ignore\"."
|
|
|
|
, locations = [AST.Location 4 54]
|
|
|
|
}
|
|
|
|
in validate queryString `shouldBe` [expected]
|
2020-09-30 05:14:52 +02:00
|
|
|
|
|
|
|
it "rejects undefined input object fields" $
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
2020-10-04 18:51:21 +02:00
|
|
|
findDog(complex: { favoriteCookieFlavor: "Bacon", name: "Jack" }) {
|
2020-09-30 05:14:52 +02:00
|
|
|
name
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Field \"favoriteCookieFlavor\" is not defined \
|
|
|
|
\by type \"DogData\"."
|
|
|
|
, locations = [AST.Location 3 36]
|
|
|
|
}
|
|
|
|
in validate queryString `shouldBe` [expected]
|
2020-10-02 06:31:38 +02:00
|
|
|
|
|
|
|
it "rejects directives in invalid locations" $
|
|
|
|
let queryString = [r|
|
|
|
|
query @skip(if: $foo) {
|
|
|
|
dog {
|
|
|
|
name
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message = "Directive \"@skip\" may not be used on QUERY."
|
|
|
|
, locations = [AST.Location 2 21]
|
|
|
|
}
|
|
|
|
in validate queryString `shouldBe` [expected]
|
2020-10-04 18:51:21 +02:00
|
|
|
|
|
|
|
it "rejects missing required input fields" $
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
|
|
|
findDog(complex: { name: null }) {
|
|
|
|
name
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Input field \"name\" of type \"DogData\" is required, \
|
|
|
|
\but it was not provided."
|
|
|
|
, locations = [AST.Location 3 34]
|
|
|
|
}
|
|
|
|
in validate queryString `shouldBe` [expected]
|
2020-11-06 08:33:51 +01:00
|
|
|
|
|
|
|
it "finds corresponding subscription fragment" $
|
|
|
|
let queryString = [r|
|
|
|
|
subscription sub {
|
|
|
|
...anotherSubscription
|
|
|
|
...multipleSubscriptions
|
|
|
|
}
|
|
|
|
fragment multipleSubscriptions on Subscription {
|
|
|
|
newMessage {
|
|
|
|
body
|
|
|
|
}
|
|
|
|
disallowedSecondRootField {
|
|
|
|
sender
|
|
|
|
}
|
|
|
|
}
|
|
|
|
fragment anotherSubscription on Subscription {
|
|
|
|
newMessage {
|
|
|
|
body
|
|
|
|
sender
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Subscription \"sub\" must select only one top level \
|
|
|
|
\field."
|
|
|
|
, locations = [AST.Location 2 15]
|
|
|
|
}
|
|
|
|
in validate queryString `shouldBe` [expected]
|
2020-11-15 10:11:09 +01:00
|
|
|
|
|
|
|
it "fails to merge fields of mismatching types" $
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
|
|
|
dog {
|
|
|
|
name: nickname
|
|
|
|
name
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Fields \"name\" conflict because \"nickname\" and \
|
|
|
|
\\"name\" are different fields. Use different aliases \
|
|
|
|
\on the fields to fetch both if this was intentional."
|
|
|
|
, locations = [AST.Location 4 19, AST.Location 5 19]
|
|
|
|
}
|
|
|
|
in validate queryString `shouldBe` [expected]
|
|
|
|
|
|
|
|
it "fails if the arguments of the same field don't match" $
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
|
|
|
dog {
|
|
|
|
doesKnowCommand(dogCommand: SIT)
|
|
|
|
doesKnowCommand(dogCommand: HEEL)
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Fields \"doesKnowCommand\" conflict because they have \
|
|
|
|
\different arguments. Use different aliases on the \
|
|
|
|
\fields to fetch both if this was intentional."
|
|
|
|
, locations = [AST.Location 4 19, AST.Location 5 19]
|
|
|
|
}
|
|
|
|
in validate queryString `shouldBe` [expected]
|
|
|
|
|
|
|
|
it "fails to merge same-named field and alias" $
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
|
|
|
dog {
|
|
|
|
doesKnowCommand(dogCommand: SIT)
|
|
|
|
doesKnowCommand: isHousetrained(atOtherHomes: true)
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Fields \"doesKnowCommand\" conflict because \
|
|
|
|
\\"doesKnowCommand\" and \"isHousetrained\" are \
|
|
|
|
\different fields. Use different aliases on the fields \
|
|
|
|
\to fetch both if this was intentional."
|
|
|
|
, locations = [AST.Location 4 19, AST.Location 5 19]
|
|
|
|
}
|
|
|
|
in validate queryString `shouldBe` [expected]
|
|
|
|
|
|
|
|
it "looks for fields after a successfully merged field pair" $
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
|
|
|
dog {
|
|
|
|
name
|
|
|
|
doesKnowCommand(dogCommand: SIT)
|
|
|
|
}
|
|
|
|
dog {
|
|
|
|
name
|
|
|
|
doesKnowCommand: isHousetrained(atOtherHomes: true)
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Fields \"doesKnowCommand\" conflict because \
|
|
|
|
\\"doesKnowCommand\" and \"isHousetrained\" are \
|
|
|
|
\different fields. Use different aliases on the fields \
|
|
|
|
\to fetch both if this was intentional."
|
|
|
|
, locations = [AST.Location 5 19, AST.Location 9 19]
|
|
|
|
}
|
|
|
|
in validate queryString `shouldBe` [expected]
|
2020-11-19 08:48:37 +01:00
|
|
|
|
|
|
|
it "rejects object inline spreads outside object scope" $
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
|
|
|
dog {
|
|
|
|
... on Cat {
|
|
|
|
meowVolume
|
|
|
|
}
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Fragment cannot be spread here as objects of type \
|
|
|
|
\\"Dog\" can never be of type \"Cat\"."
|
|
|
|
, locations = [AST.Location 4 19]
|
|
|
|
}
|
|
|
|
in validate queryString `shouldBe` [expected]
|
|
|
|
|
|
|
|
it "rejects object named spreads outside object scope" $
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
|
|
|
dog {
|
|
|
|
... catInDogFragmentInvalid
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|
|
|
|
fragment catInDogFragmentInvalid on Cat {
|
|
|
|
meowVolume
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Fragment \"catInDogFragmentInvalid\" cannot be spread \
|
|
|
|
\here as objects of type \"Dog\" can never be of type \
|
|
|
|
\\"Cat\"."
|
|
|
|
, locations = [AST.Location 4 19]
|
|
|
|
}
|
|
|
|
in validate queryString `shouldBe` [expected]
|
2020-12-26 06:31:56 +01:00
|
|
|
|
2021-02-03 05:42:10 +01:00
|
|
|
it "rejects wrongly typed variable arguments" $
|
2020-12-26 06:31:56 +01:00
|
|
|
let queryString = [r|
|
|
|
|
query catCommandArgQuery($catCommandArg: CatCommand) {
|
|
|
|
cat {
|
|
|
|
doesKnowCommand(catCommand: $catCommandArg)
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Variable \"$catCommandArg\" of type \"CatCommand\" \
|
|
|
|
\used in position expecting type \"!CatCommand\"."
|
|
|
|
, locations = [AST.Location 2 40]
|
|
|
|
}
|
|
|
|
in validate queryString `shouldBe` [expected]
|
|
|
|
|
2021-02-03 05:42:10 +01:00
|
|
|
it "rejects wrongly typed variable arguments" $
|
2020-12-26 06:31:56 +01:00
|
|
|
let queryString = [r|
|
|
|
|
query intCannotGoIntoBoolean($intArg: Int) {
|
|
|
|
dog {
|
|
|
|
isHousetrained(atOtherHomes: $intArg)
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Variable \"$intArg\" of type \"Int\" used in position \
|
|
|
|
\expecting type \"Boolean\"."
|
|
|
|
, locations = [AST.Location 2 44]
|
|
|
|
}
|
|
|
|
in validate queryString `shouldBe` [expected]
|
2021-02-03 05:42:10 +01:00
|
|
|
|
|
|
|
it "rejects values of incorrect types" $
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
|
|
|
dog {
|
|
|
|
isHousetrained(atOtherHomes: 3)
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
2021-02-04 08:12:12 +01:00
|
|
|
"Value 3 cannot be coerced to type \"Boolean\"."
|
2021-02-03 05:42:10 +01:00
|
|
|
, locations = [AST.Location 4 48]
|
|
|
|
}
|
|
|
|
in validate queryString `shouldBe` [expected]
|
|
|
|
|
|
|
|
it "checks for (non-)nullable arguments" $
|
|
|
|
let queryString = [r|
|
|
|
|
{
|
|
|
|
dog {
|
|
|
|
doesKnowCommand(dogCommand: null)
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|]
|
|
|
|
expected = Error
|
|
|
|
{ message =
|
|
|
|
"Field \"doesKnowCommand\" argument \"dogCommand\" of \
|
|
|
|
\type \"DogCommand\" is required, but it was not \
|
|
|
|
\provided."
|
|
|
|
, locations = [AST.Location 4 19]
|
|
|
|
}
|
|
|
|
in validate queryString `shouldBe` [expected]
|