forked from OSS/graphql
Validate anonymous operation definitions
This commit is contained in:
parent
7355533268
commit
e6a6926e18
@ -1,4 +1,4 @@
|
|||||||
# GraphQL implementation in Haskell.
|
# GraphQL implementation in Haskell
|
||||||
|
|
||||||
[![Hackage Version](https://img.shields.io/hackage/v/graphql.svg)](https://hackage.haskell.org/package/graphql)
|
[![Hackage Version](https://img.shields.io/hackage/v/graphql.svg)](https://hackage.haskell.org/package/graphql)
|
||||||
[![Build Status](https://github.com/caraus-ecms/graphql/workflows/Haskell%20CI/badge.svg)](https://github.com/caraus-ecms/graphql/actions?query=workflow%3A%22Haskell+CI%22)
|
[![Build Status](https://github.com/caraus-ecms/graphql/workflows/Haskell%20CI/badge.svg)](https://github.com/caraus-ecms/graphql/actions?query=workflow%3A%22Haskell+CI%22)
|
||||||
|
@ -62,6 +62,12 @@ data Location = Location
|
|||||||
, column :: Word
|
, column :: Word
|
||||||
} deriving (Eq, Show)
|
} deriving (Eq, Show)
|
||||||
|
|
||||||
|
instance Ord Location where
|
||||||
|
compare (Location thisLine thisColumn) (Location thatLine thatColumn)
|
||||||
|
| thisLine < thatLine = LT
|
||||||
|
| thisLine > thatLine = GT
|
||||||
|
| otherwise = compare thisColumn thatColumn
|
||||||
|
|
||||||
-- ** Document
|
-- ** Document
|
||||||
|
|
||||||
-- | GraphQL document.
|
-- | GraphQL document.
|
||||||
|
@ -3,6 +3,7 @@
|
|||||||
obtain one at https://mozilla.org/MPL/2.0/. -}
|
obtain one at https://mozilla.org/MPL/2.0/. -}
|
||||||
|
|
||||||
{-# LANGUAGE ExplicitForAll #-}
|
{-# LANGUAGE ExplicitForAll #-}
|
||||||
|
{-# LANGUAGE LambdaCase #-}
|
||||||
{-# LANGUAGE OverloadedStrings #-}
|
{-# LANGUAGE OverloadedStrings #-}
|
||||||
|
|
||||||
-- | This module contains default rules defined in the GraphQL specification.
|
-- | This module contains default rules defined in the GraphQL specification.
|
||||||
@ -27,22 +28,19 @@ specifiedRules :: forall m. [Rule m]
|
|||||||
specifiedRules =
|
specifiedRules =
|
||||||
[ executableDefinitionsRule
|
[ executableDefinitionsRule
|
||||||
, singleFieldSubscriptionsRule
|
, singleFieldSubscriptionsRule
|
||||||
|
, loneAnonymousOperationRule
|
||||||
]
|
]
|
||||||
|
|
||||||
-- | Definition must be OperationDefinition or FragmentDefinition.
|
-- | Definition must be OperationDefinition or FragmentDefinition.
|
||||||
executableDefinitionsRule :: forall m. Rule m
|
executableDefinitionsRule :: forall m. Rule m
|
||||||
executableDefinitionsRule = DefinitionRule go
|
executableDefinitionsRule = DefinitionRule $ \case
|
||||||
where
|
ExecutableDefinition _ -> lift Nothing
|
||||||
go :: Definition -> RuleT m
|
_ -> pure "Definition must be OperationDefinition or FragmentDefinition."
|
||||||
go (ExecutableDefinition _) = lift Nothing
|
|
||||||
go _ = pure
|
|
||||||
"Definition must be OperationDefinition or FragmentDefinition."
|
|
||||||
|
|
||||||
-- | Subscription operations must have exactly one root field.
|
-- | Subscription operations must have exactly one root field.
|
||||||
singleFieldSubscriptionsRule :: forall m. Rule m
|
singleFieldSubscriptionsRule :: forall m. Rule m
|
||||||
singleFieldSubscriptionsRule = OperationDefinitionRule go
|
singleFieldSubscriptionsRule = OperationDefinitionRule $ \case
|
||||||
where
|
OperationDefinition Subscription name' _ _ rootFields _ -> do
|
||||||
go (OperationDefinition Subscription name' _ _ rootFields _) = do
|
|
||||||
groupedFieldSet <- evalStateT (collectFields rootFields) HashSet.empty
|
groupedFieldSet <- evalStateT (collectFields rootFields) HashSet.empty
|
||||||
case HashSet.size groupedFieldSet of
|
case HashSet.size groupedFieldSet of
|
||||||
1 -> lift Nothing
|
1 -> lift Nothing
|
||||||
@ -54,7 +52,8 @@ singleFieldSubscriptionsRule = OperationDefinitionRule go
|
|||||||
]
|
]
|
||||||
| otherwise -> pure
|
| otherwise -> pure
|
||||||
"Anonymous Subscription must select only one top level field."
|
"Anonymous Subscription must select only one top level field."
|
||||||
go _ = lift Nothing
|
_ -> lift Nothing
|
||||||
|
where
|
||||||
collectFields selectionSet = foldM forEach HashSet.empty selectionSet
|
collectFields selectionSet = foldM forEach HashSet.empty selectionSet
|
||||||
forEach accumulator (Field alias name _ directives _)
|
forEach accumulator (Field alias name _ directives _)
|
||||||
| any skip directives = pure accumulator
|
| any skip directives = pure accumulator
|
||||||
@ -98,3 +97,26 @@ singleFieldSubscriptionsRule = OperationDefinitionRule go
|
|||||||
Nothing -> pure accumulator
|
Nothing -> pure accumulator
|
||||||
Just (FragmentDefinition _ typeCondition _ selectionSet _) ->
|
Just (FragmentDefinition _ typeCondition _ selectionSet _) ->
|
||||||
collectFromFragment typeCondition selectionSet accumulator
|
collectFromFragment typeCondition selectionSet accumulator
|
||||||
|
|
||||||
|
-- | GraphQL allows a short‐hand form for defining query operations when only
|
||||||
|
-- that one operation exists in the document.
|
||||||
|
loneAnonymousOperationRule :: forall m. Rule m
|
||||||
|
loneAnonymousOperationRule = OperationDefinitionRule $ \case
|
||||||
|
SelectionSet _ thisLocation -> check thisLocation
|
||||||
|
OperationDefinition _ Nothing _ _ _ thisLocation -> check thisLocation
|
||||||
|
_ -> lift Nothing
|
||||||
|
where
|
||||||
|
check thisLocation = asks ast
|
||||||
|
>>= lift . foldr (filterAnonymousOperations thisLocation) Nothing
|
||||||
|
filterAnonymousOperations thisLocation definition Nothing
|
||||||
|
| ExecutableDefinition executableDefinition <- definition
|
||||||
|
, DefinitionOperation operationDefinition <- executableDefinition =
|
||||||
|
compareAnonymousOperations thisLocation operationDefinition
|
||||||
|
filterAnonymousOperations _ _ accumulator = accumulator
|
||||||
|
compareAnonymousOperations thisLocation operationDefinition
|
||||||
|
| OperationDefinition _ _ _ _ _ thatLocation <- operationDefinition
|
||||||
|
, thisLocation /= thatLocation = pure message
|
||||||
|
| SelectionSet _ thatLocation <- operationDefinition
|
||||||
|
, thisLocation /= thatLocation = pure message
|
||||||
|
compareAnonymousOperations _ _ = Nothing
|
||||||
|
message = "This anonymous operation must be the only defined operation."
|
||||||
|
@ -1,4 +1,4 @@
|
|||||||
resolver: lts-16.10
|
resolver: lts-16.11
|
||||||
|
|
||||||
packages:
|
packages:
|
||||||
- .
|
- .
|
||||||
|
@ -209,3 +209,27 @@ spec =
|
|||||||
, path = []
|
, path = []
|
||||||
}
|
}
|
||||||
in validate queryString `shouldBe` Seq.singleton expected
|
in validate queryString `shouldBe` Seq.singleton expected
|
||||||
|
|
||||||
|
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]
|
||||||
|
, path = []
|
||||||
|
}
|
||||||
|
in validate queryString `shouldBe` Seq.singleton expected
|
||||||
|
Loading…
Reference in New Issue
Block a user