2019-07-10 05:57:35 +02:00
|
|
|
{-# LANGUAGE OverloadedStrings #-}
|
|
|
|
{-# LANGUAGE QuasiQuotes #-}
|
2019-11-03 10:42:10 +01:00
|
|
|
module Language.GraphQL.AST.LexerSpec
|
2019-07-10 05:57:35 +02:00
|
|
|
( spec
|
|
|
|
) where
|
|
|
|
|
2019-07-22 05:50:00 +02:00
|
|
|
import Data.Text (Text)
|
2019-07-10 05:57:35 +02:00
|
|
|
import Data.Void (Void)
|
2019-11-03 10:42:10 +01:00
|
|
|
import Language.GraphQL.AST.Lexer
|
2019-09-27 10:50:38 +02:00
|
|
|
import Test.Hspec (Spec, context, describe, it)
|
2020-01-25 16:37:17 +01:00
|
|
|
import Test.Hspec.Megaparsec (shouldParse, shouldFailOn, shouldSucceedOn)
|
2019-09-27 10:50:38 +02:00
|
|
|
import Text.Megaparsec (ParseErrorBundle, parse)
|
2019-07-10 05:57:35 +02:00
|
|
|
import Text.RawString.QQ (r)
|
|
|
|
|
|
|
|
spec :: Spec
|
|
|
|
spec = describe "Lexer" $ do
|
|
|
|
context "Reference tests" $ do
|
2019-07-22 05:50:00 +02:00
|
|
|
it "accepts BOM header" $
|
2019-09-27 10:50:38 +02:00
|
|
|
parse unicodeBOM "" `shouldSucceedOn` "\xfeff"
|
2019-07-22 05:50:00 +02:00
|
|
|
|
2019-07-10 05:57:35 +02:00
|
|
|
it "lexes strings" $ do
|
2019-09-27 10:50:38 +02:00
|
|
|
parse string "" [r|"simple"|] `shouldParse` "simple"
|
|
|
|
parse string "" [r|" white space "|] `shouldParse` " white space "
|
|
|
|
parse string "" [r|"quote \""|] `shouldParse` [r|quote "|]
|
|
|
|
parse string "" [r|"escaped \n"|] `shouldParse` "escaped \n"
|
|
|
|
parse string "" [r|"slashes \\ \/"|] `shouldParse` [r|slashes \ /|]
|
|
|
|
parse string "" [r|"unicode \u1234\u5678\u90AB\uCDEF"|]
|
|
|
|
`shouldParse` "unicode ሴ噸邫췯"
|
2019-07-10 05:57:35 +02:00
|
|
|
|
|
|
|
it "lexes block string" $ do
|
2019-09-27 10:50:38 +02:00
|
|
|
parse blockString "" [r|"""simple"""|] `shouldParse` "simple"
|
|
|
|
parse blockString "" [r|""" white space """|]
|
|
|
|
`shouldParse` " white space "
|
|
|
|
parse blockString "" [r|"""contains " quote"""|]
|
|
|
|
`shouldParse` [r|contains " quote|]
|
|
|
|
parse blockString "" [r|"""contains \""" triplequote"""|]
|
|
|
|
`shouldParse` [r|contains """ triplequote|]
|
|
|
|
parse blockString "" "\"\"\"multi\nline\"\"\"" `shouldParse` "multi\nline"
|
|
|
|
parse blockString "" "\"\"\"multi\rline\r\nnormalized\"\"\""
|
|
|
|
`shouldParse` "multi\nline\nnormalized"
|
|
|
|
parse blockString "" "\"\"\"multi\rline\r\nnormalized\"\"\""
|
|
|
|
`shouldParse` "multi\nline\nnormalized"
|
|
|
|
parse blockString "" [r|"""unescaped \n\r\b\t\f\u1234"""|]
|
|
|
|
`shouldParse` [r|unescaped \n\r\b\t\f\u1234|]
|
|
|
|
parse blockString "" [r|"""slashes \\ \/"""|]
|
|
|
|
`shouldParse` [r|slashes \\ \/|]
|
|
|
|
parse blockString "" [r|"""
|
2019-07-10 05:57:35 +02:00
|
|
|
|
|
|
|
spans
|
|
|
|
multiple
|
|
|
|
lines
|
|
|
|
|
2019-09-27 10:50:38 +02:00
|
|
|
"""|] `shouldParse` "spans\n multiple\n lines"
|
2019-07-10 05:57:35 +02:00
|
|
|
|
|
|
|
it "lexes numbers" $ do
|
2019-09-27 10:50:38 +02:00
|
|
|
parse integer "" "4" `shouldParse` (4 :: Int)
|
|
|
|
parse float "" "4.123" `shouldParse` 4.123
|
|
|
|
parse integer "" "-4" `shouldParse` (-4 :: Int)
|
|
|
|
parse integer "" "9" `shouldParse` (9 :: Int)
|
|
|
|
parse integer "" "0" `shouldParse` (0 :: Int)
|
|
|
|
parse float "" "-4.123" `shouldParse` (-4.123)
|
|
|
|
parse float "" "0.123" `shouldParse` 0.123
|
|
|
|
parse float "" "123e4" `shouldParse` 123e4
|
|
|
|
parse float "" "123E4" `shouldParse` 123E4
|
|
|
|
parse float "" "123e-4" `shouldParse` 123e-4
|
|
|
|
parse float "" "123e+4" `shouldParse` 123e+4
|
|
|
|
parse float "" "-1.123e4" `shouldParse` (-1.123e4)
|
|
|
|
parse float "" "-1.123E4" `shouldParse` (-1.123E4)
|
|
|
|
parse float "" "-1.123e-4" `shouldParse` (-1.123e-4)
|
|
|
|
parse float "" "-1.123e+4" `shouldParse` (-1.123e+4)
|
|
|
|
parse float "" "-1.123e4567" `shouldParse` (-1.123e4567)
|
2019-07-10 05:57:35 +02:00
|
|
|
|
|
|
|
it "lexes punctuation" $ do
|
2019-11-19 09:41:52 +01:00
|
|
|
parse bang "" "!" `shouldParse` "!"
|
|
|
|
parse dollar "" "$" `shouldParse` "$"
|
2019-09-27 10:50:38 +02:00
|
|
|
runBetween parens `shouldSucceedOn` "()"
|
|
|
|
parse spread "" "..." `shouldParse` "..."
|
|
|
|
parse colon "" ":" `shouldParse` ":"
|
|
|
|
parse equals "" "=" `shouldParse` "="
|
2020-01-15 20:20:50 +01:00
|
|
|
parse at "" "@" `shouldParse` "@"
|
2019-09-27 10:50:38 +02:00
|
|
|
runBetween brackets `shouldSucceedOn` "[]"
|
|
|
|
runBetween braces `shouldSucceedOn` "{}"
|
|
|
|
parse pipe "" "|" `shouldParse` "|"
|
2019-07-10 05:57:35 +02:00
|
|
|
|
|
|
|
context "Implementation tests" $ do
|
|
|
|
it "lexes empty block strings" $
|
2019-09-27 10:50:38 +02:00
|
|
|
parse blockString "" [r|""""""|] `shouldParse` ""
|
2019-07-10 05:57:35 +02:00
|
|
|
it "lexes ampersand" $
|
2019-09-27 10:50:38 +02:00
|
|
|
parse amp "" "&" `shouldParse` "&"
|
2020-01-17 12:22:29 +01:00
|
|
|
it "lexes schema extensions" $
|
2020-01-28 11:08:28 +01:00
|
|
|
parseExtend "schema" `shouldSucceedOn` "extend schema"
|
2020-01-25 16:37:17 +01:00
|
|
|
it "fails if the given token doesn't match" $
|
2020-01-28 11:08:28 +01:00
|
|
|
parseExtend "schema" `shouldFailOn` "extend shema"
|
|
|
|
|
|
|
|
parseExtend :: Text -> (Text -> Either (ParseErrorBundle Text Void) ())
|
|
|
|
parseExtend extension = parse (extend extension "" $ pure $ pure ()) ""
|
2019-07-10 05:57:35 +02:00
|
|
|
|
2019-07-22 05:50:00 +02:00
|
|
|
runBetween :: (Parser () -> Parser ()) -> Text -> Either (ParseErrorBundle Text Void) ()
|
2019-07-10 05:57:35 +02:00
|
|
|
runBetween parser = parse (parser $ pure ()) ""
|