mirror of
https://github.com/hasura/graphql-engine.git
synced 2024-12-17 12:31:52 +03:00
8db9b77c77
Pretty much all quasi-quoted names in the server code base have ended up in `Hasura.GraphQL.Parser.Constants`. I'm now finding this unpleasant for two reasons: 1. I would like to factor out the parser code into its own Cabal package, and I don't want to have to expose all these names. 2. Most of them really have nothing to do with the parsers. In order to remedy this, I have: 1. moved the names used by parser code to `Hasura.GraphQL.Parser.DirectiveName`, as they're all related to directives; 2. moved `Hasura.GraphQL.Parser.Constants` to `Hasura.Name`, changing the qualified import name from `G` to `Name`; 3. moved names only used in tests to the appropriate test case; 4. removed unused items from `Hasura.Name`; and 5. grouped related names. Most of the changes are simply changing `G` to `Name`, which I find much more meaningful. PR-URL: https://github.com/hasura/graphql-engine-mono/pull/4777 GitOrigin-RevId: a77aa0aee137b2b5e6faec94495d3a9fbfa1348b
187 lines
6.2 KiB
Haskell
187 lines
6.2 KiB
Haskell
{-# LANGUAGE UndecidableInstances #-}
|
|
{-# OPTIONS_GHC -fno-warn-orphans #-}
|
|
|
|
-- | Postgres Instances Transport
|
|
--
|
|
-- Defines the MSSQL instance of 'BackendTransport' and how to interact with the
|
|
-- database for running queries, mutations, subscriptions, and so on.
|
|
module Hasura.Backends.Postgres.Instances.Transport
|
|
( runPGMutationTransaction,
|
|
)
|
|
where
|
|
|
|
import Data.Aeson qualified as J
|
|
import Data.ByteString qualified as B
|
|
import Data.HashMap.Strict.InsOrd qualified as OMap
|
|
import Data.Text.Extended
|
|
import Database.PG.Query qualified as Q
|
|
import Hasura.Backends.Postgres.Connection.MonadTx
|
|
import Hasura.Backends.Postgres.Execute.Subscription qualified as PGL
|
|
import Hasura.Backends.Postgres.Execute.Types
|
|
import Hasura.Backends.Postgres.Instances.Execute qualified as EQ
|
|
import Hasura.Backends.Postgres.SQL.Value
|
|
import Hasura.Backends.Postgres.Translate.Select (PostgresAnnotatedFieldJSON)
|
|
import Hasura.Base.Error
|
|
import Hasura.EncJSON
|
|
import Hasura.GraphQL.Execute.Backend
|
|
import Hasura.GraphQL.Execute.Subscription.Plan
|
|
import Hasura.GraphQL.Logging
|
|
import Hasura.GraphQL.Namespace
|
|
( RootFieldAlias,
|
|
RootFieldMap,
|
|
mkUnNamespacedRootFieldAlias,
|
|
)
|
|
import Hasura.GraphQL.Transport.Backend
|
|
import Hasura.GraphQL.Transport.HTTP.Protocol
|
|
import Hasura.Logging qualified as L
|
|
import Hasura.Name qualified as Name
|
|
import Hasura.Prelude
|
|
import Hasura.RQL.Types.Backend
|
|
import Hasura.SQL.Backend
|
|
import Hasura.Server.Types (RequestId)
|
|
import Hasura.Session
|
|
import Hasura.Tracing
|
|
import Hasura.Tracing qualified as Tracing
|
|
|
|
instance
|
|
( Backend ('Postgres pgKind),
|
|
PostgresAnnotatedFieldJSON pgKind
|
|
) =>
|
|
BackendTransport ('Postgres pgKind)
|
|
where
|
|
runDBQuery = runPGQuery
|
|
runDBMutation = runPGMutation
|
|
runDBSubscription = runPGSubscription
|
|
runDBStreamingSubscription = runPGStreamingSubscription
|
|
runDBQueryExplain = runPGQueryExplain
|
|
|
|
runPGQuery ::
|
|
( MonadIO m,
|
|
MonadError QErr m,
|
|
MonadQueryLog m,
|
|
MonadTrace m
|
|
) =>
|
|
RequestId ->
|
|
GQLReqUnparsed ->
|
|
RootFieldAlias ->
|
|
UserInfo ->
|
|
L.Logger L.Hasura ->
|
|
SourceConfig ('Postgres pgKind) ->
|
|
Tracing.TraceT (Q.TxET QErr IO) EncJSON ->
|
|
Maybe EQ.PreparedSql ->
|
|
-- | Also return the time spent in the PG query; for telemetry.
|
|
m (DiffTime, EncJSON)
|
|
runPGQuery reqId query fieldName _userInfo logger sourceConfig tx genSql = do
|
|
-- log the generated SQL and the graphql query
|
|
logQueryLog logger $ mkQueryLog query fieldName genSql reqId
|
|
withElapsedTime $
|
|
trace ("Postgres Query for root field " <>> fieldName) $
|
|
Tracing.interpTraceT (runQueryTx $ _pscExecCtx sourceConfig) tx
|
|
|
|
runPGMutation ::
|
|
( MonadIO m,
|
|
MonadError QErr m,
|
|
MonadQueryLog m,
|
|
MonadTrace m
|
|
) =>
|
|
RequestId ->
|
|
GQLReqUnparsed ->
|
|
RootFieldAlias ->
|
|
UserInfo ->
|
|
L.Logger L.Hasura ->
|
|
SourceConfig ('Postgres pgKind) ->
|
|
Tracing.TraceT (Q.TxET QErr IO) EncJSON ->
|
|
Maybe EQ.PreparedSql ->
|
|
m (DiffTime, EncJSON)
|
|
runPGMutation reqId query fieldName userInfo logger sourceConfig tx _genSql = do
|
|
-- log the graphql query
|
|
logQueryLog logger $ mkQueryLog query fieldName Nothing reqId
|
|
ctx <- Tracing.currentContext
|
|
withElapsedTime $
|
|
trace ("Postgres Mutation for root field " <>> fieldName) $
|
|
Tracing.interpTraceT
|
|
( liftEitherM . liftIO . runExceptT
|
|
. runTx (_pscExecCtx sourceConfig) Q.ReadWrite
|
|
. withTraceContext ctx
|
|
. withUserInfo userInfo
|
|
)
|
|
tx
|
|
|
|
runPGSubscription ::
|
|
MonadIO m =>
|
|
SourceConfig ('Postgres pgKind) ->
|
|
MultiplexedQuery ('Postgres pgKind) ->
|
|
[(CohortId, CohortVariables)] ->
|
|
m (DiffTime, Either QErr [(CohortId, B.ByteString)])
|
|
runPGSubscription sourceConfig query variables =
|
|
withElapsedTime $
|
|
runExceptT $ runQueryTx (_pscExecCtx sourceConfig) $ PGL.executeMultiplexedQuery query variables
|
|
|
|
runPGStreamingSubscription ::
|
|
MonadIO m =>
|
|
SourceConfig ('Postgres pgKind) ->
|
|
MultiplexedQuery ('Postgres pgKind) ->
|
|
[(CohortId, CohortVariables)] ->
|
|
m (DiffTime, Either QErr [(CohortId, B.ByteString, CursorVariableValues)])
|
|
runPGStreamingSubscription sourceConfig query variables =
|
|
withElapsedTime $
|
|
runExceptT $ do
|
|
res <- runQueryTx (_pscExecCtx sourceConfig) $ PGL.executeStreamingMultiplexedQuery query variables
|
|
pure $ res <&> (\(cohortId, cohortRes, cursorVariableVals) -> (cohortId, cohortRes, Q.getAltJ cursorVariableVals))
|
|
|
|
runPGQueryExplain ::
|
|
forall pgKind m.
|
|
( MonadIO m,
|
|
MonadError QErr m
|
|
) =>
|
|
DBStepInfo ('Postgres pgKind) ->
|
|
m EncJSON
|
|
runPGQueryExplain (DBStepInfo _ sourceConfig _ action) =
|
|
-- All Postgres transport functions use the same monad stack: the ExecutionMonad defined in the
|
|
-- matching instance of BackendExecute. However, Explain doesn't need tracing! Rather than
|
|
-- introducing a separate "ExplainMonad", we simply use @runTraceTWithReporter@ to remove the
|
|
-- TraceT.
|
|
runQueryTx (_pscExecCtx sourceConfig) $ runTraceTWithReporter noReporter "explain" $ action
|
|
|
|
mkQueryLog ::
|
|
GQLReqUnparsed ->
|
|
RootFieldAlias ->
|
|
Maybe EQ.PreparedSql ->
|
|
RequestId ->
|
|
QueryLog
|
|
mkQueryLog gqlQuery fieldName preparedSql requestId =
|
|
QueryLog gqlQuery ((fieldName,) <$> generatedQuery) requestId QueryLogKindDatabase
|
|
where
|
|
generatedQuery =
|
|
preparedSql <&> \(EQ.PreparedSql query args) ->
|
|
GeneratedQuery (Q.getQueryText query) (J.toJSON $ pgScalarValueToJson . snd <$> args)
|
|
|
|
-- ad-hoc transaction optimisation
|
|
-- see Note [Backwards-compatible transaction optimisation]
|
|
|
|
runPGMutationTransaction ::
|
|
( MonadIO m,
|
|
MonadError QErr m,
|
|
MonadQueryLog m,
|
|
MonadTrace m
|
|
) =>
|
|
RequestId ->
|
|
GQLReqUnparsed ->
|
|
UserInfo ->
|
|
L.Logger L.Hasura ->
|
|
SourceConfig ('Postgres pgKind) ->
|
|
RootFieldMap (DBStepInfo ('Postgres pgKind)) ->
|
|
m (DiffTime, RootFieldMap EncJSON)
|
|
runPGMutationTransaction reqId query userInfo logger sourceConfig mutations = do
|
|
logQueryLog logger $ mkQueryLog query (mkUnNamespacedRootFieldAlias Name._transaction) Nothing reqId
|
|
ctx <- Tracing.currentContext
|
|
withElapsedTime $ do
|
|
Tracing.interpTraceT
|
|
( liftEitherM . liftIO . runExceptT
|
|
. runTx (_pscExecCtx sourceConfig) Q.ReadWrite
|
|
. withTraceContext ctx
|
|
. withUserInfo userInfo
|
|
)
|
|
$ flip OMap.traverseWithKey mutations \fieldName dbsi ->
|
|
trace ("Postgres Mutation for root field " <>> fieldName) $ dbsiAction dbsi
|