2022-03-10 13:33:55 +03:00
|
|
|
-- | The modules in the @Hasura.Backends.MSSQL.FromIr@ namespace translates the
|
|
|
|
-- RQL IR into TSQL, the SQL dialect of MSSQL, as defined in abstract syntax in
|
|
|
|
-- "Hasura.Backends.MSSQL.Types".
|
2021-09-24 01:56:37 +03:00
|
|
|
--
|
2022-03-10 13:33:55 +03:00
|
|
|
-- The translation happens in the @FromIr@ monad, which manages identifier
|
|
|
|
-- scoping and error collection.
|
2021-09-24 01:56:37 +03:00
|
|
|
--
|
2022-03-10 13:33:55 +03:00
|
|
|
-- The actual rendering of this AST into TSQL text happens in
|
|
|
|
-- "Hasura.Backends.MSSQL.ToQuery".
|
2021-02-23 20:37:27 +03:00
|
|
|
module Hasura.Backends.MSSQL.FromIr
|
2022-03-10 13:33:55 +03:00
|
|
|
( -- * The central Monad
|
2021-02-23 20:37:27 +03:00
|
|
|
FromIr,
|
2023-04-21 16:50:23 +03:00
|
|
|
runFromIrErrorOnCTEs,
|
2023-04-19 17:52:43 +03:00
|
|
|
runFromIrUseCTEs,
|
|
|
|
runFromIrUseCTEsT,
|
2022-03-10 13:33:55 +03:00
|
|
|
Error (..),
|
2023-04-26 00:04:29 +03:00
|
|
|
tellBefore,
|
|
|
|
tellAfter,
|
2023-04-19 17:52:43 +03:00
|
|
|
tellCTE,
|
2022-03-10 13:33:55 +03:00
|
|
|
|
|
|
|
-- * Name generation
|
|
|
|
NameTemplate (..),
|
|
|
|
generateAlias,
|
2021-02-23 20:37:27 +03:00
|
|
|
)
|
|
|
|
where
|
2021-09-24 01:56:37 +03:00
|
|
|
|
2021-02-23 20:37:27 +03:00
|
|
|
import Control.Monad.Validate
|
2022-03-10 13:33:55 +03:00
|
|
|
import Control.Monad.Validate qualified as V
|
2023-03-27 19:54:27 +03:00
|
|
|
import Control.Monad.Writer.Strict
|
2021-02-23 20:37:27 +03:00
|
|
|
import Data.Map.Strict (Map)
|
|
|
|
import Data.Map.Strict qualified as M
|
|
|
|
import Data.Text qualified as T
|
2023-06-02 13:36:06 +03:00
|
|
|
import Data.Text.Extended qualified as T
|
2021-02-23 20:37:27 +03:00
|
|
|
import Hasura.Backends.MSSQL.Instances.Types ()
|
2021-12-15 20:07:21 +03:00
|
|
|
import Hasura.Backends.MSSQL.Types.Internal as TSQL
|
2022-03-10 13:33:55 +03:00
|
|
|
import Hasura.Base.Error (QErr, throw500)
|
2023-06-02 13:36:06 +03:00
|
|
|
import Hasura.NativeQuery.Metadata (InterpolatedQuery, NativeQueryName (getNativeQueryName))
|
2021-02-23 20:37:27 +03:00
|
|
|
import Hasura.Prelude
|
2021-06-11 06:26:50 +03:00
|
|
|
import Hasura.RQL.IR qualified as IR
|
2023-04-24 21:35:48 +03:00
|
|
|
import Hasura.RQL.Types.BackendType
|
2021-02-23 20:37:27 +03:00
|
|
|
|
2023-03-27 19:54:27 +03:00
|
|
|
-- | Allow the query process to emit extra setup / teardown steps
|
2023-04-26 00:04:29 +03:00
|
|
|
data IRWriter = IRWriter
|
|
|
|
{ irwBefore :: [TempTableDDL],
|
|
|
|
irwAfter :: [TempTableDDL],
|
|
|
|
irwCTEs :: Maybe With
|
2023-03-27 19:54:27 +03:00
|
|
|
}
|
2023-04-26 00:04:29 +03:00
|
|
|
|
2023-06-02 13:36:06 +03:00
|
|
|
-- | Unique name counter
|
|
|
|
data IRState = IRState
|
|
|
|
{ irsCounter :: Int,
|
|
|
|
irsMap :: Map Text Int
|
|
|
|
}
|
|
|
|
|
2023-04-26 00:04:29 +03:00
|
|
|
instance Semigroup IRWriter where
|
|
|
|
(IRWriter a b c) <> (IRWriter a' b' c') = IRWriter (a <> a') (b' <> b) (c <> c')
|
2023-03-27 19:54:27 +03:00
|
|
|
|
|
|
|
instance Monoid IRWriter where
|
2023-04-26 00:04:29 +03:00
|
|
|
mempty = IRWriter mempty mempty Nothing
|
|
|
|
|
|
|
|
-- | add a step to be run before the main query
|
|
|
|
tellBefore :: TempTableDDL -> FromIr ()
|
|
|
|
tellBefore step =
|
|
|
|
tell (IRWriter {irwBefore = [step], irwAfter = mempty, irwCTEs = Nothing})
|
|
|
|
|
|
|
|
-- | add a step to be run after the main query
|
|
|
|
tellAfter :: TempTableDDL -> FromIr ()
|
|
|
|
tellAfter step =
|
|
|
|
tell (IRWriter {irwBefore = mempty, irwAfter = [step], irwCTEs = Nothing})
|
2023-04-19 17:52:43 +03:00
|
|
|
|
2023-06-02 13:36:06 +03:00
|
|
|
tellCTE :: NativeQueryName -> InterpolatedQuery Expression -> FromIr Text
|
|
|
|
tellCTE name cte = do
|
|
|
|
counter <- irsCounter <$> get
|
|
|
|
modify' \s -> s {irsCounter = (counter + 1)}
|
|
|
|
let alias = T.toTxt (getNativeQueryName name) <> tshow counter
|
|
|
|
tell
|
|
|
|
IRWriter
|
|
|
|
{ irwBefore = mempty,
|
|
|
|
irwAfter = mempty,
|
|
|
|
irwCTEs = Just (With $ pure $ CTEUnsafeRawSQL <$> Aliased cte alias)
|
|
|
|
}
|
|
|
|
pure alias
|
2023-03-27 19:54:27 +03:00
|
|
|
|
2022-03-10 13:33:55 +03:00
|
|
|
-- | The central Monad used throughout for all conversion functions.
|
2021-02-23 20:37:27 +03:00
|
|
|
--
|
2022-03-10 13:33:55 +03:00
|
|
|
-- It has the following features:
|
2021-02-23 20:37:27 +03:00
|
|
|
--
|
2022-03-10 13:33:55 +03:00
|
|
|
-- * It's a 'MonadValidate', so it'll continue going when it encounters 'Error's
|
|
|
|
-- to accumulate as many as possible.
|
2021-02-23 20:37:27 +03:00
|
|
|
--
|
2022-03-10 13:33:55 +03:00
|
|
|
-- * It has a facility for generating fresh, unique aliases, which lets the
|
|
|
|
-- translation output retain a resemblance with source names without the
|
|
|
|
-- translation process needing to be bothered about potential name shadowing.
|
|
|
|
-- See 'generateAlias'.
|
2023-04-21 16:50:23 +03:00
|
|
|
--
|
|
|
|
-- * It has a writer part for reporting native queries that need to be wrapped in a CTE
|
|
|
|
--
|
|
|
|
-- The Inner part 'FromIrInner' containing the state and validate are extracted to a different
|
|
|
|
-- type so we can peel the writer for queries and report errors in the process if needed.
|
2021-02-23 20:37:27 +03:00
|
|
|
newtype FromIr a = FromIr
|
2023-04-21 16:50:23 +03:00
|
|
|
{ unFromIr :: WriterT IRWriter FromIrInner a
|
2021-02-23 20:37:27 +03:00
|
|
|
}
|
2023-06-02 13:36:06 +03:00
|
|
|
deriving
|
|
|
|
( Functor,
|
|
|
|
Applicative,
|
|
|
|
Monad,
|
|
|
|
MonadValidate (NonEmpty Error),
|
|
|
|
MonadWriter IRWriter,
|
|
|
|
MonadState IRState
|
|
|
|
)
|
2021-02-23 20:37:27 +03:00
|
|
|
|
2023-04-21 16:50:23 +03:00
|
|
|
-- | We extract the state and validate parts of FromIr so we can peel off
|
|
|
|
-- the writer part of 'FromIr' for queries and report errors in the process if needed.
|
2023-06-02 13:36:06 +03:00
|
|
|
type FromIrInner = StateT IRState (Validate (NonEmpty Error))
|
2023-04-19 17:52:43 +03:00
|
|
|
|
|
|
|
-- | Run a 'FromIr' action, throwing errors that have been collected using the
|
|
|
|
-- supplied action, and attach CTEs created from native queries to the select query.
|
2023-05-24 16:51:56 +03:00
|
|
|
runFromIrUseCTEs :: (MonadError QErr m) => FromIr Select -> m (QueryWithDDL Select)
|
2023-04-19 17:52:43 +03:00
|
|
|
runFromIrUseCTEs fromir = runIdentity <$> runFromIr attachCTEs (Identity fromir)
|
|
|
|
|
|
|
|
-- | Run a 'FromIr' action, throwing errors that have been collected using the
|
|
|
|
-- supplied action, and attach CTEs created from native queries to the select query.
|
2023-04-26 00:04:29 +03:00
|
|
|
runFromIrUseCTEsT :: (Traversable t, MonadError QErr m) => t (FromIr Select) -> m (t (QueryWithDDL Select))
|
2023-04-19 17:52:43 +03:00
|
|
|
runFromIrUseCTEsT = runFromIr attachCTEs
|
|
|
|
|
2023-04-21 16:50:23 +03:00
|
|
|
-- | Run a 'FromIr' action, throwing errors that have been collected using the
|
|
|
|
-- supplied action, and discard CTEs created from native queries to the select query.
|
|
|
|
--
|
|
|
|
-- If CTEs were reported, we throw an error, since we don't support native queries
|
|
|
|
-- in this context yet.
|
2023-05-24 16:51:56 +03:00
|
|
|
runFromIrErrorOnCTEs :: (MonadError QErr m) => FromIr a -> m (QueryWithDDL a)
|
2023-04-21 16:50:23 +03:00
|
|
|
runFromIrErrorOnCTEs fromir = runIdentity <$> runFromIr errorOnCTEs (Identity fromir)
|
|
|
|
|
|
|
|
-- | Run a 'FromIr' action, throwing errors that have been collected using the supplied action.
|
2023-04-26 00:04:29 +03:00
|
|
|
runFromIr :: (Traversable t, MonadError QErr m) => ((a, IRWriter) -> FromIrInner (QueryWithDDL a)) -> t (FromIr a) -> m (t (QueryWithDDL a))
|
2023-04-21 16:50:23 +03:00
|
|
|
runFromIr toResult =
|
|
|
|
flip onLeft (throw500 . tshow)
|
|
|
|
. V.runValidate
|
2023-06-02 13:36:06 +03:00
|
|
|
. flip evalStateT (IRState 0 mempty)
|
2023-04-25 17:01:28 +03:00
|
|
|
. (traverse toResult =<<)
|
2023-04-21 16:50:23 +03:00
|
|
|
. traverse (runWriterT . unFromIr)
|
|
|
|
|
|
|
|
-- | attach CTEs created from native queries to the select query.
|
2023-05-24 16:51:56 +03:00
|
|
|
attachCTEs :: (MonadValidate (NonEmpty Error) m) => (Select, IRWriter) -> m (QueryWithDDL Select)
|
2023-04-26 00:04:29 +03:00
|
|
|
attachCTEs (select, IRWriter before after ctes) =
|
2023-05-24 16:51:56 +03:00
|
|
|
pure
|
|
|
|
$ QueryWithDDL
|
2023-04-26 00:04:29 +03:00
|
|
|
{ qwdBeforeSteps = before,
|
|
|
|
qwdQuery = select {selectWith = ctes <> selectWith select},
|
|
|
|
qwdAfterSteps = after
|
|
|
|
}
|
2023-04-19 17:52:43 +03:00
|
|
|
|
2023-04-21 16:50:23 +03:00
|
|
|
-- | If CTEs were reported, we throw an error, since we don't support native queries
|
|
|
|
-- in this context yet.
|
2023-05-24 16:51:56 +03:00
|
|
|
errorOnCTEs :: (MonadValidate (NonEmpty Error) m) => (a, IRWriter) -> m (QueryWithDDL a)
|
2023-04-26 00:04:29 +03:00
|
|
|
errorOnCTEs (result, IRWriter {irwBefore, irwAfter, irwCTEs}) =
|
|
|
|
case irwCTEs of
|
|
|
|
Nothing ->
|
2023-05-24 16:51:56 +03:00
|
|
|
pure
|
|
|
|
$ QueryWithDDL
|
2023-04-26 00:04:29 +03:00
|
|
|
{ qwdBeforeSteps = irwBefore,
|
|
|
|
qwdQuery = result,
|
|
|
|
qwdAfterSteps = irwAfter
|
|
|
|
}
|
2023-04-21 16:50:23 +03:00
|
|
|
Just _ -> refute $ pure NativeQueriesNotSupported
|
2021-02-23 20:37:27 +03:00
|
|
|
|
2022-03-10 13:33:55 +03:00
|
|
|
-- | Errors that may happen during translation.
|
|
|
|
data Error
|
|
|
|
= UnsupportedOpExpG (IR.OpExpG 'MSSQL Expression)
|
|
|
|
| FunctionNotSupported
|
2023-04-21 16:50:23 +03:00
|
|
|
| NativeQueriesNotSupported
|
2022-03-10 13:33:55 +03:00
|
|
|
deriving (Show, Eq)
|
2021-02-23 20:37:27 +03:00
|
|
|
|
2022-03-10 13:33:55 +03:00
|
|
|
-- | Hints about the type of entity that 'generateAlias' is producing an alias
|
|
|
|
-- for.
|
2021-02-23 20:37:27 +03:00
|
|
|
data NameTemplate
|
|
|
|
= ArrayRelationTemplate Text
|
|
|
|
| ArrayAggregateTemplate Text
|
|
|
|
| ObjectRelationTemplate Text
|
|
|
|
| TableTemplate Text
|
|
|
|
| ForOrderAlias Text
|
|
|
|
|
2022-03-10 13:33:55 +03:00
|
|
|
-- | Generate a fresh alias for a given entity to remove ambiguity and naming
|
|
|
|
-- conflicts between scopes at the TSQL level.
|
|
|
|
--
|
|
|
|
-- Names are generated in the form @type_name_occurrence@, where:
|
|
|
|
--
|
|
|
|
-- * @type@ hints at the type of entity,
|
|
|
|
-- * @name@ refers to the source name being aliased, and
|
|
|
|
-- * @occurrence@ is an integer counter that distinguishes each occurrence of @type_name@.
|
|
|
|
--
|
|
|
|
-- Example outputs:
|
|
|
|
--
|
|
|
|
-- > do
|
|
|
|
-- > "ar_articles_1" <- generateAlias (ArrayRelationTemplate "articles")
|
|
|
|
-- > "ar_articles_2" <- generateAlias (ArrayRelationTemplate "articles")
|
|
|
|
-- > "t_users_1" <- generateAlias (TableTemplate "users")
|
2021-09-20 13:26:21 +03:00
|
|
|
generateAlias :: NameTemplate -> FromIr Text
|
|
|
|
generateAlias template = do
|
2023-06-02 13:36:06 +03:00
|
|
|
FromIr (modify' (\s -> s {irsMap = M.insertWith (+) rendered 1 (irsMap s)}))
|
|
|
|
occurrence <- M.findWithDefault 1 rendered . irsMap <$> FromIr get
|
2022-03-10 13:33:55 +03:00
|
|
|
pure (rendered <> tshow occurrence)
|
2021-02-23 20:37:27 +03:00
|
|
|
where
|
2023-05-24 16:51:56 +03:00
|
|
|
rendered = T.take 20
|
|
|
|
$ case template of
|
2021-02-23 20:37:27 +03:00
|
|
|
ArrayRelationTemplate sample -> "ar_" <> sample
|
|
|
|
ArrayAggregateTemplate sample -> "aa_" <> sample
|
|
|
|
ObjectRelationTemplate sample -> "or_" <> sample
|
|
|
|
TableTemplate sample -> "t_" <> sample
|
|
|
|
ForOrderAlias sample -> "order_" <> sample
|