2019-07-22 05:50:00 +02:00
|
|
|
{-# LANGUAGE OverloadedStrings #-}
|
2019-11-03 10:42:10 +01:00
|
|
|
module Language.GraphQL.AST.ParserSpec
|
2019-07-22 05:50:00 +02:00
|
|
|
( spec
|
|
|
|
) where
|
|
|
|
|
2020-01-25 16:37:17 +01:00
|
|
|
import Data.List.NonEmpty (NonEmpty(..))
|
2022-02-02 18:52:46 +01:00
|
|
|
import qualified Data.Text as Text
|
2020-01-25 16:37:17 +01:00
|
|
|
import Language.GraphQL.AST.Document
|
2021-02-20 16:06:27 +01:00
|
|
|
import qualified Language.GraphQL.AST.DirectiveLocation as DirLoc
|
2019-11-03 10:42:10 +01:00
|
|
|
import Language.GraphQL.AST.Parser
|
2022-01-06 14:49:54 +01:00
|
|
|
import Test.Hspec (Spec, describe, it, context)
|
2024-08-27 10:51:01 +02:00
|
|
|
import Test.Hspec.Megaparsec
|
|
|
|
( shouldParse
|
|
|
|
, shouldFailOn
|
|
|
|
, parseSatisfies
|
|
|
|
, shouldSucceedOn
|
|
|
|
)
|
2019-07-22 05:50:00 +02:00
|
|
|
import Text.Megaparsec (parse)
|
2022-02-02 18:52:46 +01:00
|
|
|
import Test.QuickCheck (property, NonEmptyList (..), mapSize)
|
|
|
|
import Language.GraphQL.AST.Arbitrary
|
2019-07-22 05:50:00 +02:00
|
|
|
|
|
|
|
spec :: Spec
|
2019-09-06 07:48:01 +02:00
|
|
|
spec = describe "Parser" $ do
|
2019-07-22 05:50:00 +02:00
|
|
|
it "accepts BOM header" $
|
2019-09-27 10:50:38 +02:00
|
|
|
parse document "" `shouldSucceedOn` "\xfeff{foo}"
|
2019-09-06 07:48:01 +02:00
|
|
|
|
2022-01-06 14:49:54 +01:00
|
|
|
context "Arguments" $ do
|
2024-10-17 18:08:30 +02:00
|
|
|
it "accepts block strings as argument" $
|
|
|
|
parse document "" `shouldSucceedOn`
|
|
|
|
"{ hello(text: \"\"\"Argument\"\"\") }"
|
|
|
|
|
|
|
|
it "accepts strings as argument" $
|
|
|
|
parse document "" `shouldSucceedOn` "{ hello(text: \"Argument\") }"
|
|
|
|
|
|
|
|
it "accepts int as argument" $
|
|
|
|
parse document "" `shouldSucceedOn` "{ user(id: 4) }"
|
|
|
|
|
|
|
|
it "accepts boolean as argument" $
|
|
|
|
parse document "" `shouldSucceedOn`
|
|
|
|
"{ hello(flag: true) { field1 } }"
|
|
|
|
|
|
|
|
it "accepts float as argument" $
|
|
|
|
parse document "" `shouldSucceedOn`
|
|
|
|
"{ body(height: 172.5) { height } }"
|
|
|
|
|
|
|
|
it "accepts empty list as argument" $
|
|
|
|
parse document "" `shouldSucceedOn` "{ query(list: []) { field1 } }"
|
|
|
|
|
|
|
|
it "accepts two required arguments" $
|
|
|
|
parse document "" `shouldSucceedOn`
|
|
|
|
"mutation auth($username: String!, $password: String!) { test }"
|
|
|
|
|
|
|
|
it "accepts two string arguments" $
|
|
|
|
parse document "" `shouldSucceedOn`
|
|
|
|
"mutation auth { test(username: \"username\", password: \"password\") }"
|
|
|
|
|
|
|
|
it "accepts two block string arguments" $
|
|
|
|
let given = "mutation auth {\n\
|
|
|
|
\ test(username: \"\"\"username\"\"\", password: \"\"\"password\"\"\")\n\
|
|
|
|
\}"
|
|
|
|
in parse document "" `shouldSucceedOn` given
|
|
|
|
|
|
|
|
it "fails to parse an empty argument list in parens" $
|
|
|
|
parse document "" `shouldFailOn` "{ test() }"
|
|
|
|
|
|
|
|
it "accepts any arguments" $ mapSize (const 10) $ property $ \xs ->
|
|
|
|
let arguments' = map printArgument
|
|
|
|
$ getNonEmpty (xs :: NonEmptyList (AnyArgument AnyValue))
|
|
|
|
query' = "query(" <> Text.intercalate ", " arguments' <> ")"
|
|
|
|
in parse document "" `shouldSucceedOn` ("{ " <> query' <> " }")
|
2020-01-03 07:20:48 +01:00
|
|
|
|
|
|
|
it "parses minimal schema definition" $
|
2024-10-17 18:08:30 +02:00
|
|
|
parse document "" `shouldSucceedOn` "schema { query: Query }"
|
2020-01-05 07:42:04 +01:00
|
|
|
|
|
|
|
it "parses minimal scalar definition" $
|
2024-10-17 18:08:30 +02:00
|
|
|
parse document "" `shouldSucceedOn` "scalar Time"
|
2020-01-05 07:42:04 +01:00
|
|
|
|
|
|
|
it "parses ImplementsInterfaces" $
|
2024-10-17 18:08:30 +02:00
|
|
|
parse document "" `shouldSucceedOn`
|
|
|
|
"type Person implements NamedEntity & ValuedEntity {\n\
|
|
|
|
\ name: String\n\
|
|
|
|
\}"
|
2020-01-05 07:42:04 +01:00
|
|
|
|
|
|
|
it "parses a type without ImplementsInterfaces" $
|
2024-10-17 18:08:30 +02:00
|
|
|
parse document "" `shouldSucceedOn`
|
|
|
|
"type Person {\n\
|
|
|
|
\ name: String\n\
|
|
|
|
\}"
|
2020-01-05 07:42:04 +01:00
|
|
|
|
|
|
|
it "parses ArgumentsDefinition in an ObjectDefinition" $
|
2024-10-17 18:08:30 +02:00
|
|
|
parse document "" `shouldSucceedOn`
|
|
|
|
"type Person {\n\
|
|
|
|
\ name(first: String, last: String): String\n\
|
|
|
|
\}"
|
2020-01-07 13:56:58 +01:00
|
|
|
|
|
|
|
it "parses minimal union type definition" $
|
2024-10-17 18:08:30 +02:00
|
|
|
parse document "" `shouldSucceedOn`
|
|
|
|
"union SearchResult = Photo | Person"
|
2020-01-11 08:32:25 +01:00
|
|
|
|
|
|
|
it "parses minimal interface type definition" $
|
2024-10-17 18:08:30 +02:00
|
|
|
parse document "" `shouldSucceedOn`
|
|
|
|
"interface NamedEntity {\n\
|
|
|
|
\ name: String\n\
|
|
|
|
\}"
|
2020-01-12 07:07:04 +01:00
|
|
|
|
2024-11-05 19:44:45 +01:00
|
|
|
it "parses ImplementsInterfaces on interfaces" $
|
|
|
|
parse document "" `shouldSucceedOn`
|
|
|
|
"interface Person implements NamedEntity & ValuedEntity {\n\
|
|
|
|
\ name: String\n\
|
|
|
|
\}"
|
|
|
|
|
2020-01-12 07:07:04 +01:00
|
|
|
it "parses minimal enum type definition" $
|
2024-10-17 18:08:30 +02:00
|
|
|
parse document "" `shouldSucceedOn`
|
|
|
|
"enum Direction {\n\
|
|
|
|
\ NORTH\n\
|
|
|
|
\ EAST\n\
|
|
|
|
\ SOUTH\n\
|
|
|
|
\ WEST\n\
|
|
|
|
\}"
|
2020-01-12 07:07:04 +01:00
|
|
|
|
|
|
|
it "parses minimal input object type definition" $
|
2024-10-17 18:08:30 +02:00
|
|
|
parse document "" `shouldSucceedOn`
|
|
|
|
"input Point2D {\n\
|
|
|
|
\ x: Float\n\
|
|
|
|
\ y: Float\n\
|
|
|
|
\}"
|
2020-01-15 20:20:50 +01:00
|
|
|
|
|
|
|
it "parses minimal input enum definition with an optional pipe" $
|
2024-10-17 18:08:30 +02:00
|
|
|
parse document "" `shouldSucceedOn`
|
|
|
|
"directive @example on\n\
|
|
|
|
\ | FIELD\n\
|
|
|
|
\ | FRAGMENT_SPREAD"
|
2020-01-25 16:37:17 +01:00
|
|
|
|
2021-02-20 16:06:27 +01:00
|
|
|
it "parses two minimal directive definitions" $
|
2024-08-27 10:51:01 +02:00
|
|
|
let directive name' loc = TypeSystemDefinition
|
|
|
|
$ DirectiveDefinition
|
|
|
|
(Description Nothing)
|
|
|
|
name'
|
|
|
|
(ArgumentsDefinition [])
|
|
|
|
False
|
|
|
|
(loc :| [])
|
|
|
|
example1 = directive "example1"
|
|
|
|
(DirLoc.TypeSystemDirectiveLocation DirLoc.FieldDefinition)
|
|
|
|
(Location {line = 1, column = 1})
|
|
|
|
example2 = directive "example2"
|
|
|
|
(DirLoc.ExecutableDirectiveLocation DirLoc.Field)
|
|
|
|
(Location {line = 2, column = 1})
|
|
|
|
testSchemaExtension = example1 :| [example2]
|
2024-10-17 18:08:30 +02:00
|
|
|
query = Text.unlines
|
|
|
|
[ "directive @example1 on FIELD_DEFINITION"
|
|
|
|
, "directive @example2 on FIELD"
|
|
|
|
]
|
2021-02-20 16:06:27 +01:00
|
|
|
in parse document "" query `shouldParse` testSchemaExtension
|
|
|
|
|
|
|
|
it "parses a directive definition with a default empty list argument" $
|
2024-08-27 10:51:01 +02:00
|
|
|
let argumentValue = Just
|
|
|
|
$ Node (ConstList [])
|
|
|
|
$ Location{ line = 1, column = 33 }
|
|
|
|
loc = DirLoc.TypeSystemDirectiveLocation DirLoc.FieldDefinition
|
|
|
|
argumentValueDefinition = InputValueDefinition
|
|
|
|
(Description Nothing)
|
|
|
|
"foo"
|
|
|
|
(TypeList (TypeNamed "String"))
|
|
|
|
argumentValue
|
|
|
|
[]
|
|
|
|
definition = DirectiveDefinition
|
|
|
|
(Description Nothing)
|
|
|
|
"test"
|
2024-10-17 18:08:30 +02:00
|
|
|
(ArgumentsDefinition [argumentValueDefinition])
|
2024-08-27 10:51:01 +02:00
|
|
|
False
|
|
|
|
(loc :| [])
|
|
|
|
directive = TypeSystemDefinition definition
|
|
|
|
$ Location{ line = 1, column = 1 }
|
2024-10-17 18:08:30 +02:00
|
|
|
query = "directive @test(foo: [String] = []) on FIELD_DEFINITION"
|
2024-08-27 10:51:01 +02:00
|
|
|
in parse document "" query `shouldParse` (directive :| [])
|
2021-02-20 16:06:27 +01:00
|
|
|
|
2020-01-25 16:37:17 +01:00
|
|
|
it "parses schema extension with a new directive" $
|
2024-10-17 18:08:30 +02:00
|
|
|
parse document "" `shouldSucceedOn` "extend schema @newDirective"
|
2020-01-25 16:37:17 +01:00
|
|
|
|
|
|
|
it "parses schema extension with an operation type definition" $
|
2024-10-17 18:08:30 +02:00
|
|
|
parse document "" `shouldSucceedOn` "extend schema { query: Query }"
|
2020-01-25 16:37:17 +01:00
|
|
|
|
|
|
|
it "parses schema extension with an operation type and directive" $
|
2020-09-18 07:32:58 +02:00
|
|
|
let newDirective = Directive "newDirective" [] $ Location 1 15
|
2020-07-20 21:29:12 +02:00
|
|
|
schemaExtension = SchemaExtension
|
2020-01-25 16:37:17 +01:00
|
|
|
$ SchemaOperationExtension [newDirective]
|
|
|
|
$ OperationTypeDefinition Query "Query" :| []
|
2020-07-20 21:29:12 +02:00
|
|
|
testSchemaExtension = TypeSystemExtension schemaExtension
|
|
|
|
$ Location 1 1
|
2024-10-17 18:08:30 +02:00
|
|
|
query = "extend schema @newDirective { query: Query }"
|
2020-01-25 16:37:17 +01:00
|
|
|
in parse document "" query `shouldParse` (testSchemaExtension :| [])
|
2020-01-28 11:08:28 +01:00
|
|
|
|
2024-08-27 10:51:01 +02:00
|
|
|
it "parses a repeatable directive definition" $
|
2024-10-17 18:08:30 +02:00
|
|
|
let given = "directive @test repeatable on FIELD_DEFINITION"
|
2024-08-27 10:51:01 +02:00
|
|
|
isRepeatable (TypeSystemDefinition definition' _ :| [])
|
|
|
|
| DirectiveDefinition _ _ _ repeatable _ <- definition' = repeatable
|
|
|
|
isRepeatable _ = False
|
|
|
|
in parse document "" given `parseSatisfies` isRepeatable
|
|
|
|
|
2020-01-28 11:08:28 +01:00
|
|
|
it "parses an object extension" $
|
2024-10-17 18:08:30 +02:00
|
|
|
parse document "" `shouldSucceedOn`
|
|
|
|
"extend type Story { isHiddenLocally: Boolean }"
|
2020-05-22 10:11:48 +02:00
|
|
|
|
|
|
|
it "rejects variables in DefaultValue" $
|
2024-10-17 18:08:30 +02:00
|
|
|
parse document "" `shouldFailOn`
|
|
|
|
"query ($book: String = \"Zarathustra\", $author: String = $book) {\n\
|
|
|
|
\ title\n\
|
|
|
|
\}"
|
2020-07-09 08:11:12 +02:00
|
|
|
|
2022-01-06 14:49:54 +01:00
|
|
|
it "rejects empty selection set" $
|
2024-10-17 18:08:30 +02:00
|
|
|
parse document "" `shouldFailOn` "query { innerField {} }"
|
2022-01-06 14:49:54 +01:00
|
|
|
|
2020-07-09 08:11:12 +02:00
|
|
|
it "parses documents beginning with a comment" $
|
2024-10-17 18:08:30 +02:00
|
|
|
parse document "" `shouldSucceedOn`
|
|
|
|
"\"\"\"\n\
|
|
|
|
\Query\n\
|
|
|
|
\\"\"\"\n\
|
|
|
|
\type Query {\n\
|
|
|
|
\ queryField: String\n\
|
|
|
|
\}"
|
2020-07-11 06:34:10 +02:00
|
|
|
|
|
|
|
it "parses subscriptions" $
|
2024-10-17 18:08:30 +02:00
|
|
|
parse document "" `shouldSucceedOn`
|
|
|
|
"subscription NewMessages {\n\
|
|
|
|
\ newMessage(roomId: 123) {\n\
|
|
|
|
\ sender\n\
|
|
|
|
\ }\n\
|
|
|
|
\}"
|