2021-01-29 04:02:34 +03:00
module Hasura.Server.Rest
( runCustomEndpoint ,
RestRequest ( .. ) ,
)
where
2021-09-24 01:56:37 +03:00
2021-01-29 04:02:34 +03:00
import Control.Monad.Trans.Control ( MonadBaseControl )
import Data.Aeson hiding ( json )
import Data.Aeson qualified as J
import Data.Align qualified as Align
import Data.Environment qualified as Env
2022-03-03 23:12:09 +03:00
import Data.HashMap.Strict.Extended qualified as M
2021-01-29 04:02:34 +03:00
import Data.Text qualified as T
import Data.Text.Encoding qualified as T
import Data.Text.Extended
2021-08-24 20:41:24 +03:00
import Data.These ( These ( .. ) )
2021-05-11 18:18:31 +03:00
import Hasura.Base.Error
2021-01-29 04:02:34 +03:00
import Hasura.EncJSON
import Hasura.GraphQL.Execute qualified as E
import Hasura.GraphQL.Execute.Backend qualified as EB
2021-03-13 17:40:50 +03:00
import Hasura.GraphQL.Logging ( MonadQueryLog )
2021-08-02 19:04:22 +03:00
import Hasura.GraphQL.ParameterizedQueryHash ( ParameterizedQueryHashList ( .. ) )
2022-07-15 13:09:24 +03:00
import Hasura.GraphQL.Parser.Name qualified as GName
2021-01-29 04:02:34 +03:00
import Hasura.GraphQL.Transport.HTTP qualified as GH
import Hasura.GraphQL.Transport.HTTP.Protocol
import Hasura.HTTP
import Hasura.Metadata.Class
import Hasura.Prelude hiding ( get , put )
2022-03-13 10:40:06 +03:00
import Hasura.RQL.Types.Endpoint
2022-04-27 16:57:28 +03:00
import Hasura.RQL.Types.QueryCollection
2021-09-29 19:20:06 +03:00
import Hasura.Server.Limits
2021-07-05 12:45:31 +03:00
import Hasura.Server.Logging
2022-06-23 12:14:24 +03:00
import Hasura.Server.Name qualified as Name
2021-01-29 04:02:34 +03:00
import Hasura.Server.Types
import Hasura.Session
2021-07-29 11:29:12 +03:00
import Hasura.Tracing qualified as Tracing
import Language.GraphQL.Draft.Syntax qualified as G
2021-01-29 04:02:34 +03:00
import Network.HTTP.Types qualified as HTTP
2021-07-29 11:29:12 +03:00
import Network.Wai.Extended qualified as Wai
2021-02-12 06:04:09 +03:00
2021-01-29 04:02:34 +03:00
-- Note: There may be a better way of constructing this when building the Endpoint datastructure.
parseVariableNames :: EndpointMetadata GQLQueryWithText -> [ Text ]
parseVariableNames queryx =
mapMaybe ( T . stripPrefix " : " ) $ T . split ( == '/' ) ( toTxt $ _ceUrl queryx )
-- Given a list of expected variables and the parsed vars from the path,
-- return a map of variable names to `These expected parsed`.
alignVars :: [ G . VariableDefinition ] -> [ ( Text , Either Text Value ) ] -> HashMap G . Name ( These G . VariableDefinition ( Either Text Value ) )
alignVars defVars parseVars =
Align . align
( M . fromList ( map ( \ v -> ( G . _vdName v , v ) ) defVars ) )
( M . fromList ( mapMaybe ( \ ( k , v ) -> ( , v ) <$> G . mkName k ) parseVars ) )
2022-05-02 06:33:17 +03:00
-- | `resolveVar` is responsible for decoding variables sent via REST request.
-- These can either be via body (represented by Right) or via query-param or URL param (represented by Left).
-- A variable can be expected, unexpected, or missing (represented by These, This, and That).
2021-01-29 04:02:34 +03:00
resolveVar :: G . Name -> These G . VariableDefinition ( Either Text J . Value ) -> Either Text ( Maybe Value )
2022-05-02 06:33:17 +03:00
resolveVar _ ( This _expectedVar ) = Right Nothing -- If a variable is expected but missing, assign a missing value `Nothing` to it for resolution in query execution. This allows Null defaulting.
resolveVar varName ( That _providedVar ) = Left $ " Unexpected variable " <> toTxt @ G . Name varName -- If a variable is unexpected but present, throw an error.
resolveVar _varName ( These _expectedVar ( Right bodyVar ) ) = Right ( Just bodyVar ) -- Variables sent via body can be passed through to execution without parsing.
resolveVar varName ( These expectedVar ( Left l ) ) =
2021-01-29 04:02:34 +03:00
case G . _vdType expectedVar of
2022-05-02 06:33:17 +03:00
G . TypeList _ _ -> Left $ " List variables are not currently supported in URL or Query parameters. (Variable " <> toTxt @ G . Name varName <> " , with value " <> tshow l <> " ) "
G . TypeNamed ( G . Nullability nullable ) typeName
2022-07-15 13:09:24 +03:00
| typeName == GName . _Boolean && T . null l -> Right $ Just $ J . Bool True -- Booleans indicated true by a standalone key.
2022-05-02 06:33:17 +03:00
| nullable && T . null l -> Right Nothing -- Missing value, but nullable variable sets value to null.
| otherwise -> case J . decodeStrict ( T . encodeUtf8 l ) of -- We special case parsing of bools and numbers and pass the rest through as literal strings.
2022-07-15 13:09:24 +03:00
Just v @ ( J . Bool _ ) | typeName ` elem ` [ Name . _Bool , GName . _Boolean ] -> Right $ Just v
Just v @ ( J . Number _ ) | typeName ` elem ` [ GName . _Int , GName . _Float , Name . _Number , Name . _Double , Name . _float8 , Name . _numeric ] -> Right $ Just v
2022-05-02 06:33:17 +03:00
_ -> Right $ Just $ J . String l
2021-01-29 04:02:34 +03:00
mkPassthroughRequest :: EndpointMetadata GQLQueryWithText -> VariableValues -> GQLReq GQLQueryText
mkPassthroughRequest queryx resolvedVariables =
GQLReq
Nothing
( GQLQueryText $ getGQLQueryText ( _edQuery ( _ceDefinition queryx ) ) )
( Just resolvedVariables )
data RestRequest method = RestRequest
{ -- | Remainder of the url path after `api/rest`
reqPath :: Text ,
reqMethod :: method , -- EndpointMethod
2021-09-24 01:56:37 +03:00
2021-01-29 04:02:34 +03:00
-- | URL Query/Request Body Arguments
reqArgs :: [ ( Text , Either Text J . Value ) ]
}
deriving ( Functor , Foldable , Traversable )
-- | Implements all the custom endpoints by looking up the
-- path/methods in the endpoint trie and delegating to the graphql
-- handler.
runCustomEndpoint ::
forall m .
2021-10-13 19:38:56 +03:00
( MonadIO m ,
2021-01-29 04:02:34 +03:00
MonadError QErr m ,
Tracing . MonadTrace m ,
MonadBaseControl IO m ,
E . MonadGQLExecutionCheck m ,
MonadQueryLog m ,
GH . MonadExecuteQuery m ,
2023-02-03 04:03:23 +03:00
MonadMetadataStorage m ,
2021-09-29 19:20:06 +03:00
EB . MonadQueryTags m ,
HasResourceLimits m
2021-01-29 04:02:34 +03:00
) =>
Env . Environment ->
E . ExecutionCtx ->
RequestId ->
UserInfo ->
[ HTTP . Header ] ->
Wai . IpAddress ->
RestRequest EndpointMethod ->
EndpointTrie GQLQueryWithText ->
2022-12-15 10:48:18 +03:00
m ( HttpLogGraphQLInfo , HttpResponse EncJSON )
2021-01-29 04:02:34 +03:00
runCustomEndpoint env execCtx requestId userInfo reqHeaders ipAddress RestRequest { .. } endpoints = do
-- First match the path to an endpoint.
case matchPath reqMethod ( T . split ( == '/' ) reqPath ) endpoints of
MatchFound ( queryx :: EndpointMetadata GQLQueryWithText ) matches ->
let definitions =
queryx
& _ceDefinition
& _edQuery
& getGQLQuery
& unGQLQuery
& G . getExecutableDefinitions
in -- Next, pattern match on the query definition to extract the
-- (hopefully single) ExecutableDefinitionOperation structure, so that
-- we can get hold of the list of query variables.
case definitions of
[ G . ExecutableDefinitionOperation ( G . OperationDefinitionTyped typedDef ) ] -> do
-- Perform a join between the expected variables and the provided variables.
-- If there is a mismatch, throw an error. Also, check that the provided
-- values are compatible with the expected types.
let expectedVariables = G . _todVariableDefinitions typedDef
let joinedVars = M . traverseWithKey resolveVar ( alignVars expectedVariables ( reqArgs ++ zip ( parseVariableNames queryx ) ( map Left matches ) ) )
2021-09-24 01:56:37 +03:00
2021-02-12 06:04:09 +03:00
resolvedVariablesMaybe <- joinedVars ` onLeft ` throw400 BadRequest
2021-09-24 01:56:37 +03:00
2022-07-29 17:52:02 +03:00
let resolvedVariables = catMaybes resolvedVariablesMaybe
2021-09-24 01:56:37 +03:00
2021-01-29 04:02:34 +03:00
-- Construct a graphql query by pairing the resolved variables
-- with the query string from the schema cache, and pass it
-- through to the /v1/graphql endpoint.
2021-04-06 20:52:55 +03:00
( httpLoggingMetadata , handlerResp ) <- flip runReaderT execCtx $ do
2021-09-15 11:29:34 +03:00
( gqlOperationLog , resp ) <- GH . runGQ env ( E . _ecxLogger execCtx ) requestId userInfo ipAddress reqHeaders E . QueryHasura ( mkPassthroughRequest queryx resolvedVariables )
2022-12-15 10:48:18 +03:00
let httpLoggingGQInfo = ( CommonHttpLogMetadata RequestModeNonBatchable Nothing , ( PQHSetSingleton ( gqolParameterizedQueryHash gqlOperationLog ) ) )
return ( httpLoggingGQInfo , fst <$> resp )
2021-01-29 04:02:34 +03:00
case sequence handlerResp of
2021-08-02 19:04:22 +03:00
Just resp -> pure ( httpLoggingMetadata , fmap encodeHTTPResp resp )
2021-01-29 04:02:34 +03:00
-- a Nothing value here indicates a failure to parse the cached request from redis.
-- TODO: Do we need an additional log message here?
Nothing -> throw500 " An unexpected error occurred while fetching the data from the cache "
2021-09-24 01:56:37 +03:00
2021-01-29 04:02:34 +03:00
-- Note: This fallthrough is required for runtime scenarios where the endpoint is ambiguous, such as:
-- Endpoints /:a/b + /a/:b = Request /a/b - Invalid, but checked at runtime.
_ -> throw500 " A stored query should contain exactly one definition "
MatchNotFound -> throw404 " Endpoint not found "
MatchMissingKey allowedMethods -> throw405 $ " Allowed methods: " <> commaSeparated allowedMethods
MatchAmbiguous -> throw500 " Multiple endpoints match request "