2021-02-23 20:37:27 +03:00
|
|
|
-- | Planning T-SQL queries and subscriptions.
|
|
|
|
|
|
|
|
module Hasura.Backends.MSSQL.Plan where
|
|
|
|
-- TODO: Re-add the export list after cleaning up the module
|
2021-05-21 14:37:34 +03:00
|
|
|
-- ( planQuery
|
|
|
|
-- , planSubscription
|
2021-02-23 20:37:27 +03:00
|
|
|
-- ) where
|
|
|
|
|
|
|
|
import Hasura.Prelude hiding (first)
|
|
|
|
|
|
|
|
import qualified Data.Aeson as J
|
2021-05-21 14:37:34 +03:00
|
|
|
import Data.ByteString.Lazy (toStrict)
|
2021-02-23 20:37:27 +03:00
|
|
|
import qualified Data.HashMap.Strict as HM
|
|
|
|
import qualified Data.HashMap.Strict.InsOrd as OMap
|
|
|
|
import qualified Data.HashSet as Set
|
|
|
|
import qualified Data.Text as T
|
|
|
|
import qualified Database.ODBC.SQLServer as ODBC
|
|
|
|
import qualified Language.GraphQL.Draft.Syntax as G
|
|
|
|
|
|
|
|
import Control.Monad.Validate
|
|
|
|
import Data.Text.Extended
|
|
|
|
|
|
|
|
import qualified Hasura.GraphQL.Parser as GraphQL
|
|
|
|
import qualified Hasura.RQL.Types.Column as RQL
|
|
|
|
|
|
|
|
import Hasura.Backends.MSSQL.FromIr as TSQL
|
|
|
|
import Hasura.Backends.MSSQL.Types as TSQL
|
2021-05-11 18:18:31 +03:00
|
|
|
import Hasura.Base.Error
|
2021-02-23 20:37:27 +03:00
|
|
|
import Hasura.GraphQL.Context
|
|
|
|
import Hasura.SQL.Backend
|
|
|
|
import Hasura.Session
|
|
|
|
|
|
|
|
|
|
|
|
newtype QDB v b = QDB (QueryDB b v)
|
|
|
|
|
|
|
|
type SubscriptionRootFieldMSSQL v = RootField (QDB v) Void Void {-(RQL.AnnActionAsyncQuery 'MSSQL v)-} Void
|
|
|
|
|
|
|
|
|
|
|
|
-- --------------------------------------------------------------------------------
|
|
|
|
-- -- Top-level planner
|
|
|
|
|
2021-05-21 14:37:34 +03:00
|
|
|
planQuery
|
2021-02-23 20:37:27 +03:00
|
|
|
:: MonadError QErr m
|
2021-05-21 14:37:34 +03:00
|
|
|
=> SessionVariables
|
2021-02-23 20:37:27 +03:00
|
|
|
-> QueryDB 'MSSQL (GraphQL.UnpreparedValue 'MSSQL)
|
2021-06-01 13:04:29 +03:00
|
|
|
-> m Select
|
2021-05-21 14:37:34 +03:00
|
|
|
planQuery sessionVariables queryDB = do
|
2021-06-01 13:04:29 +03:00
|
|
|
rootField <- traverseQueryDB (prepareValueQuery sessionVariables) queryDB
|
2021-02-23 20:37:27 +03:00
|
|
|
select <-
|
|
|
|
runValidate (TSQL.runFromIr (TSQL.fromRootField rootField))
|
|
|
|
`onLeft` (throw400 NotSupported . tshow)
|
2021-06-01 13:04:29 +03:00
|
|
|
pure $
|
2021-02-23 20:37:27 +03:00
|
|
|
select
|
|
|
|
{ selectFor =
|
|
|
|
case selectFor select of
|
|
|
|
NoFor -> NoFor
|
2021-04-28 14:05:33 +03:00
|
|
|
JsonFor forJson ->
|
|
|
|
JsonFor forJson {jsonRoot =
|
|
|
|
case jsonRoot forJson of
|
|
|
|
NoRoot -> Root "root"
|
|
|
|
-- Keep whatever's there if already
|
|
|
|
-- specified. In the case of an
|
|
|
|
-- aggregate query, the root will
|
|
|
|
-- be specified "aggregate", for
|
|
|
|
-- example.
|
|
|
|
keep -> keep
|
|
|
|
}
|
2021-02-23 20:37:27 +03:00
|
|
|
}
|
|
|
|
|
2021-06-01 13:04:29 +03:00
|
|
|
-- | Prepare a value without any query planning; we just execute the
|
|
|
|
-- query with the values embedded.
|
|
|
|
prepareValueQuery
|
|
|
|
:: MonadError QErr m
|
|
|
|
=> SessionVariables
|
|
|
|
-> GraphQL.UnpreparedValue 'MSSQL
|
|
|
|
-> m TSQL.Expression
|
|
|
|
prepareValueQuery sessionVariables =
|
|
|
|
{- History note:
|
|
|
|
This function used to be called 'planNoPlan', and was used for building sql
|
|
|
|
expressions for queries. That evolved differently, but this function is now
|
|
|
|
left as a *suggestion* for implementing support for mutations.
|
|
|
|
-}
|
|
|
|
\case
|
|
|
|
GraphQL.UVLiteral x -> pure x
|
|
|
|
GraphQL.UVSession -> pure $ ValueExpression $ ODBC.ByteStringValue $ toStrict $ J.encode sessionVariables
|
|
|
|
GraphQL.UVParameter _ RQL.ColumnValue{..} -> pure $ ValueExpression cvValue
|
|
|
|
GraphQL.UVSessionVar _typ sessionVariable -> do
|
|
|
|
value <- getSessionVariableValue sessionVariable sessionVariables
|
|
|
|
`onNothing` throw400 NotFound ("missing session variable: " <>> sessionVariable)
|
|
|
|
pure $ ValueExpression $ ODBC.TextValue value
|
|
|
|
|
2021-05-21 14:37:34 +03:00
|
|
|
planSubscription
|
2021-04-20 19:57:14 +03:00
|
|
|
:: MonadError QErr m
|
|
|
|
=> OMap.InsOrdHashMap G.Name (QueryDB 'MSSQL (GraphQL.UnpreparedValue 'MSSQL))
|
|
|
|
-> SessionVariables
|
|
|
|
-> m (Reselect, PrepareState)
|
2021-05-21 14:37:34 +03:00
|
|
|
planSubscription unpreparedMap sessionVariables = do
|
2021-04-20 19:57:14 +03:00
|
|
|
let (rootFieldMap, prepareState) =
|
|
|
|
runState
|
|
|
|
(traverse
|
2021-05-21 14:37:34 +03:00
|
|
|
(traverseQueryDB (prepareValueSubscription (getSessionVariablesSet sessionVariables)))
|
2021-04-20 19:57:14 +03:00
|
|
|
unpreparedMap)
|
|
|
|
emptyPrepareState
|
|
|
|
selectMap <-
|
|
|
|
runValidate (TSQL.runFromIr (traverse TSQL.fromRootField rootFieldMap))
|
|
|
|
`onLeft` (throw400 NotSupported . tshow)
|
|
|
|
pure (collapseMap selectMap, prepareState)
|
2021-02-23 20:37:27 +03:00
|
|
|
|
|
|
|
-- Plan a query without prepare/exec.
|
|
|
|
-- planNoPlanMap ::
|
|
|
|
-- OMap.InsOrdHashMap G.Name (SubscriptionRootFieldMSSQL (GraphQL.UnpreparedValue 'MSSQL))
|
|
|
|
-- -> Either PrepareError Reselect
|
|
|
|
-- planNoPlanMap _unpreparedMap =
|
|
|
|
-- let rootFieldMap = runIdentity $
|
|
|
|
-- traverse (traverseQueryRootField (pure . prepareValueNoPlan)) unpreparedMap
|
|
|
|
-- selectMap <-
|
|
|
|
-- first
|
|
|
|
-- FromIrError
|
|
|
|
-- (runValidate (TSQL.runFromIr (traverse TSQL.fromRootField rootFieldMap)))
|
|
|
|
-- pure (collapseMap selectMap)
|
|
|
|
|
|
|
|
--------------------------------------------------------------------------------
|
|
|
|
-- Converting a root field into a T-SQL select statement
|
|
|
|
|
|
|
|
-- | Collapse a set of selects into a single select that projects
|
|
|
|
-- these as subselects.
|
|
|
|
collapseMap :: OMap.InsOrdHashMap G.Name Select
|
|
|
|
-> Reselect
|
|
|
|
collapseMap selects =
|
|
|
|
Reselect
|
|
|
|
{ reselectFor =
|
|
|
|
JsonFor ForJson {jsonCardinality = JsonSingleton, jsonRoot = NoRoot}
|
|
|
|
, reselectWhere = Where mempty
|
|
|
|
, reselectProjections =
|
|
|
|
map projectSelect (OMap.toList selects)
|
|
|
|
}
|
|
|
|
where
|
|
|
|
projectSelect :: (G.Name, Select) -> Projection
|
|
|
|
projectSelect (name, select) =
|
|
|
|
ExpressionProjection
|
|
|
|
(Aliased
|
|
|
|
{ aliasedThing = SelectExpression select
|
|
|
|
, aliasedAlias = G.unName name
|
|
|
|
})
|
|
|
|
|
|
|
|
--------------------------------------------------------------------------------
|
|
|
|
-- Session variables
|
|
|
|
|
|
|
|
globalSessionExpression :: TSQL.Expression
|
|
|
|
globalSessionExpression =
|
|
|
|
ValueExpression (ODBC.TextValue "current_setting('hasura.user')::json")
|
|
|
|
|
|
|
|
|
|
|
|
--------------------------------------------------------------------------------
|
|
|
|
-- Resolving values
|
|
|
|
|
|
|
|
data PrepareError
|
|
|
|
= FromIrError (NonEmpty TSQL.Error)
|
|
|
|
|
|
|
|
data PrepareState = PrepareState
|
2021-04-20 19:57:14 +03:00
|
|
|
{ positionalArguments :: ![RQL.ColumnValue 'MSSQL]
|
2021-02-23 20:37:27 +03:00
|
|
|
, namedArguments :: !(HashMap G.Name (RQL.ColumnValue 'MSSQL))
|
|
|
|
, sessionVariables :: !(Set.HashSet SessionVariable)
|
|
|
|
}
|
|
|
|
|
|
|
|
emptyPrepareState :: PrepareState
|
2021-04-20 19:57:14 +03:00
|
|
|
emptyPrepareState = PrepareState
|
|
|
|
{ positionalArguments = mempty
|
|
|
|
, namedArguments = mempty
|
|
|
|
, sessionVariables = mempty
|
|
|
|
}
|
2021-02-23 20:37:27 +03:00
|
|
|
|
2021-05-21 14:37:34 +03:00
|
|
|
|
2021-02-23 20:37:27 +03:00
|
|
|
-- | Prepare a value for multiplexed queries.
|
2021-05-21 14:37:34 +03:00
|
|
|
prepareValueSubscription
|
2021-04-20 19:57:14 +03:00
|
|
|
:: Set.HashSet SessionVariable
|
|
|
|
-> GraphQL.UnpreparedValue 'MSSQL
|
2021-02-23 20:37:27 +03:00
|
|
|
-> State PrepareState TSQL.Expression
|
2021-05-21 14:37:34 +03:00
|
|
|
prepareValueSubscription globalVariables =
|
2021-02-23 20:37:27 +03:00
|
|
|
\case
|
|
|
|
GraphQL.UVLiteral x -> pure x
|
2021-05-21 14:37:34 +03:00
|
|
|
|
2021-04-20 19:57:14 +03:00
|
|
|
GraphQL.UVSession -> do
|
|
|
|
modify' (\s -> s {sessionVariables = sessionVariables s <> globalVariables})
|
2021-05-21 14:37:34 +03:00
|
|
|
pure $ resultVarExp (RootPath `FieldPath` "session")
|
|
|
|
|
2021-02-23 20:37:27 +03:00
|
|
|
GraphQL.UVSessionVar _typ text -> do
|
|
|
|
modify' (\s -> s {sessionVariables = text `Set.insert` sessionVariables s})
|
2021-05-21 14:37:34 +03:00
|
|
|
pure $ resultVarExp (sessionDot $ toTxt text)
|
|
|
|
|
2021-04-20 19:57:14 +03:00
|
|
|
GraphQL.UVParameter mVariableInfo columnValue ->
|
2021-02-23 20:37:27 +03:00
|
|
|
case fmap GraphQL.getName mVariableInfo of
|
|
|
|
Nothing -> do
|
2021-05-10 13:17:54 +03:00
|
|
|
currentIndex <- (toInteger . length) <$> gets positionalArguments
|
2021-04-20 19:57:14 +03:00
|
|
|
modify' (\s -> s {
|
|
|
|
positionalArguments = positionalArguments s <> [columnValue] })
|
2021-05-21 14:37:34 +03:00
|
|
|
pure (resultVarExp (syntheticIx currentIndex))
|
2021-02-23 20:37:27 +03:00
|
|
|
Just name -> do
|
|
|
|
modify
|
|
|
|
(\s ->
|
|
|
|
s
|
|
|
|
{ namedArguments =
|
2021-04-20 19:57:14 +03:00
|
|
|
HM.insert name columnValue (namedArguments s)
|
2021-02-23 20:37:27 +03:00
|
|
|
})
|
2021-05-21 14:37:34 +03:00
|
|
|
pure $ resultVarExp (queryDot $ G.unName name)
|
|
|
|
|
|
|
|
where
|
|
|
|
resultVarExp :: JsonPath -> Expression
|
|
|
|
resultVarExp =
|
|
|
|
JsonValueExpression $
|
|
|
|
ColumnExpression $
|
|
|
|
FieldName
|
|
|
|
{ fieldNameEntity = rowAlias
|
|
|
|
, fieldName = resultVarsAlias
|
|
|
|
}
|
|
|
|
|
|
|
|
queryDot :: Text -> JsonPath
|
|
|
|
queryDot name = RootPath `FieldPath` "query" `FieldPath` name
|
|
|
|
|
|
|
|
syntheticIx :: Integer -> JsonPath
|
|
|
|
syntheticIx i = (RootPath `FieldPath` "synthetic" `IndexPath` i)
|
|
|
|
|
|
|
|
sessionDot :: Text -> JsonPath
|
|
|
|
sessionDot name = RootPath `FieldPath` "session" `FieldPath` name
|
2021-02-23 20:37:27 +03:00
|
|
|
|
|
|
|
|
|
|
|
resultIdAlias :: T.Text
|
|
|
|
resultIdAlias = "result_id"
|
|
|
|
|
|
|
|
resultVarsAlias :: T.Text
|
|
|
|
resultVarsAlias = "result_vars"
|
|
|
|
|
|
|
|
resultAlias :: T.Text
|
|
|
|
resultAlias = "result"
|
|
|
|
|
|
|
|
rowAlias :: T.Text
|
|
|
|
rowAlias = "row"
|