2018-11-16 15:40:23 +03:00
|
|
|
module Hasura.RQL.GBoolExp
|
|
|
|
( toSQLBoolExp
|
|
|
|
, getBoolExpDeps
|
|
|
|
, annBoolExp
|
|
|
|
) where
|
2018-06-27 16:11:32 +03:00
|
|
|
|
|
|
|
import Hasura.Prelude
|
|
|
|
import Hasura.RQL.Types
|
|
|
|
import Hasura.SQL.Types
|
|
|
|
|
|
|
|
import qualified Hasura.SQL.DML as S
|
|
|
|
|
2019-08-17 00:35:22 +03:00
|
|
|
import Control.Lens (filtered, has)
|
2018-06-27 16:11:32 +03:00
|
|
|
import Data.Aeson
|
2019-08-17 00:35:22 +03:00
|
|
|
import Data.Data.Lens (template)
|
2018-06-27 16:11:32 +03:00
|
|
|
|
|
|
|
import qualified Data.HashMap.Strict as M
|
|
|
|
import qualified Data.Text.Extended as T
|
|
|
|
|
2019-07-10 13:19:58 +03:00
|
|
|
type OpRhsParser m v =
|
2019-07-22 15:47:13 +03:00
|
|
|
PGType PGColumnType -> Value -> m v
|
2019-07-10 13:19:58 +03:00
|
|
|
|
2019-07-15 11:52:45 +03:00
|
|
|
-- | Represents a reference to a Postgres column, possibly casted an arbitrary
|
|
|
|
-- number of times. Used within 'parseOperationsExpression' for bookkeeping.
|
|
|
|
data ColumnReference
|
2019-08-11 18:34:38 +03:00
|
|
|
= ColumnReferenceColumn !PGColumnInfo
|
2019-07-22 15:47:13 +03:00
|
|
|
| ColumnReferenceCast !ColumnReference !PGColumnType
|
2019-07-15 11:52:45 +03:00
|
|
|
deriving (Show, Eq)
|
|
|
|
|
2019-07-22 15:47:13 +03:00
|
|
|
columnReferenceType :: ColumnReference -> PGColumnType
|
2019-07-15 11:52:45 +03:00
|
|
|
columnReferenceType = \case
|
|
|
|
ColumnReferenceColumn column -> pgiType column
|
|
|
|
ColumnReferenceCast _ targetType -> targetType
|
|
|
|
|
|
|
|
instance DQuote ColumnReference where
|
|
|
|
dquoteTxt = \case
|
2019-09-19 07:47:36 +03:00
|
|
|
ColumnReferenceColumn column -> dquoteTxt $ pgiColumn column
|
2019-07-15 11:52:45 +03:00
|
|
|
ColumnReferenceCast reference targetType ->
|
2019-08-06 18:24:08 +03:00
|
|
|
dquoteTxt reference <> "::" <> dquoteTxt targetType
|
2019-07-15 11:52:45 +03:00
|
|
|
|
|
|
|
parseOperationsExpression
|
|
|
|
:: forall m v
|
|
|
|
. (MonadError QErr m)
|
2019-07-10 13:19:58 +03:00
|
|
|
=> OpRhsParser m v
|
2019-11-20 21:21:30 +03:00
|
|
|
-> FieldInfoMap FieldInfo
|
2019-08-11 18:34:38 +03:00
|
|
|
-> PGColumnInfo
|
2018-06-27 16:11:32 +03:00
|
|
|
-> Value
|
2019-07-10 13:19:58 +03:00
|
|
|
-> m [OpExpG v]
|
2019-07-15 11:52:45 +03:00
|
|
|
parseOperationsExpression rhsParser fim columnInfo =
|
2019-09-19 07:47:36 +03:00
|
|
|
withPathK (getPGColTxt $ pgiColumn columnInfo) .
|
2019-07-15 11:52:45 +03:00
|
|
|
parseOperations (ColumnReferenceColumn columnInfo)
|
|
|
|
where
|
|
|
|
parseOperations :: ColumnReference -> Value -> m [OpExpG v]
|
|
|
|
parseOperations column = \case
|
|
|
|
Object o -> mapM (parseOperation column) (M.toList o)
|
|
|
|
val -> pure . AEQ False <$> rhsParser columnType val
|
|
|
|
where
|
2019-08-11 18:34:38 +03:00
|
|
|
columnType = PGTypeScalar $ columnReferenceType column
|
2019-07-15 11:52:45 +03:00
|
|
|
|
|
|
|
parseOperation :: ColumnReference -> (T.Text, Value) -> m (OpExpG v)
|
|
|
|
parseOperation column (opStr, val) = withPathK opStr $
|
|
|
|
case opStr of
|
|
|
|
"$cast" -> parseCast
|
|
|
|
"_cast" -> parseCast
|
|
|
|
|
|
|
|
"$eq" -> parseEq
|
|
|
|
"_eq" -> parseEq
|
|
|
|
|
|
|
|
"$ne" -> parseNe
|
|
|
|
"_ne" -> parseNe
|
|
|
|
"$neq" -> parseNe
|
|
|
|
"_neq" -> parseNe
|
|
|
|
|
|
|
|
"$in" -> parseIn
|
|
|
|
"_in" -> parseIn
|
|
|
|
|
|
|
|
"$nin" -> parseNin
|
|
|
|
"_nin" -> parseNin
|
|
|
|
|
|
|
|
"$gt" -> parseGt
|
|
|
|
"_gt" -> parseGt
|
|
|
|
|
|
|
|
"$lt" -> parseLt
|
|
|
|
"_lt" -> parseLt
|
|
|
|
|
|
|
|
"$gte" -> parseGte
|
|
|
|
"_gte" -> parseGte
|
|
|
|
|
|
|
|
"$lte" -> parseLte
|
|
|
|
"_lte" -> parseLte
|
|
|
|
|
|
|
|
"$like" -> parseLike
|
|
|
|
"_like" -> parseLike
|
|
|
|
|
|
|
|
"$nlike" -> parseNlike
|
|
|
|
"_nlike" -> parseNlike
|
|
|
|
|
|
|
|
"$ilike" -> parseIlike
|
|
|
|
"_ilike" -> parseIlike
|
|
|
|
|
|
|
|
"$nilike" -> parseNilike
|
|
|
|
"_nilike" -> parseNilike
|
|
|
|
|
|
|
|
"$similar" -> parseSimilar
|
|
|
|
"_similar" -> parseSimilar
|
|
|
|
"$nsimilar" -> parseNsimilar
|
|
|
|
"_nsimilar" -> parseNsimilar
|
|
|
|
|
|
|
|
"$is_null" -> parseIsNull
|
|
|
|
"_is_null" -> parseIsNull
|
|
|
|
|
|
|
|
-- jsonb type
|
2019-07-22 15:47:13 +03:00
|
|
|
"_contains" -> guardType [PGJSONB] >> AContains <$> parseOne
|
|
|
|
"$contains" -> guardType [PGJSONB] >> AContains <$> parseOne
|
|
|
|
"_contained_in" -> guardType [PGJSONB] >> AContainedIn <$> parseOne
|
|
|
|
"$contained_in" -> guardType [PGJSONB] >> AContainedIn <$> parseOne
|
|
|
|
"_has_key" -> guardType [PGJSONB] >> AHasKey <$> parseWithTy (PGColumnScalar PGText)
|
|
|
|
"$has_key" -> guardType [PGJSONB] >> AHasKey <$> parseWithTy (PGColumnScalar PGText)
|
|
|
|
|
|
|
|
"_has_keys_any" -> guardType [PGJSONB] >> AHasKeysAny <$> parseManyWithType (PGColumnScalar PGText)
|
|
|
|
"$has_keys_any" -> guardType [PGJSONB] >> AHasKeysAny <$> parseManyWithType (PGColumnScalar PGText)
|
|
|
|
"_has_keys_all" -> guardType [PGJSONB] >> AHasKeysAll <$> parseManyWithType (PGColumnScalar PGText)
|
|
|
|
"$has_keys_all" -> guardType [PGJSONB] >> AHasKeysAll <$> parseManyWithType (PGColumnScalar PGText)
|
2019-07-15 11:52:45 +03:00
|
|
|
|
|
|
|
-- geometry types
|
|
|
|
"_st_contains" -> parseGeometryOp ASTContains
|
|
|
|
"$st_contains" -> parseGeometryOp ASTContains
|
|
|
|
"_st_crosses" -> parseGeometryOp ASTCrosses
|
|
|
|
"$st_crosses" -> parseGeometryOp ASTCrosses
|
|
|
|
"_st_equals" -> parseGeometryOp ASTEquals
|
|
|
|
"$st_equals" -> parseGeometryOp ASTEquals
|
|
|
|
"_st_overlaps" -> parseGeometryOp ASTOverlaps
|
|
|
|
"$st_overlaps" -> parseGeometryOp ASTOverlaps
|
|
|
|
"_st_touches" -> parseGeometryOp ASTTouches
|
|
|
|
"$st_touches" -> parseGeometryOp ASTTouches
|
|
|
|
"_st_within" -> parseGeometryOp ASTWithin
|
|
|
|
"$st_within" -> parseGeometryOp ASTWithin
|
|
|
|
-- geometry and geography types
|
|
|
|
"_st_intersects" -> parseGeometryOrGeographyOp ASTIntersects
|
|
|
|
"$st_intersects" -> parseGeometryOrGeographyOp ASTIntersects
|
|
|
|
"_st_d_within" -> parseSTDWithinObj
|
|
|
|
"$st_d_within" -> parseSTDWithinObj
|
|
|
|
|
|
|
|
"$ceq" -> parseCeq
|
|
|
|
"_ceq" -> parseCeq
|
|
|
|
|
|
|
|
"$cne" -> parseCne
|
|
|
|
"_cne" -> parseCne
|
|
|
|
"$cneq" -> parseCne
|
|
|
|
"_cneq" -> parseCne
|
|
|
|
|
|
|
|
"$cgt" -> parseCgt
|
|
|
|
"_cgt" -> parseCgt
|
|
|
|
|
|
|
|
"$clt" -> parseClt
|
|
|
|
"_clt" -> parseClt
|
|
|
|
|
|
|
|
"$cgte" -> parseCgte
|
|
|
|
"_cgte" -> parseCgte
|
|
|
|
|
|
|
|
"$clte" -> parseClte
|
|
|
|
"_clte" -> parseClte
|
|
|
|
|
|
|
|
x -> throw400 UnexpectedPayload $ "Unknown operator : " <> x
|
|
|
|
where
|
|
|
|
colTy = columnReferenceType column
|
|
|
|
|
|
|
|
parseEq = AEQ False <$> parseOne -- equals
|
|
|
|
parseNe = ANE False <$> parseOne -- <>
|
|
|
|
parseIn = AIN <$> parseManyWithType colTy -- in an array
|
|
|
|
parseNin = ANIN <$> parseManyWithType colTy -- not in an array
|
|
|
|
parseGt = AGT <$> parseOne -- >
|
|
|
|
parseLt = ALT <$> parseOne -- <
|
|
|
|
parseGte = AGTE <$> parseOne -- >=
|
|
|
|
parseLte = ALTE <$> parseOne -- <=
|
2019-07-22 15:47:13 +03:00
|
|
|
parseLike = guardType stringTypes >> ALIKE <$> parseOne
|
|
|
|
parseNlike = guardType stringTypes >> ANLIKE <$> parseOne
|
|
|
|
parseIlike = guardType stringTypes >> AILIKE <$> parseOne
|
|
|
|
parseNilike = guardType stringTypes >> ANILIKE <$> parseOne
|
|
|
|
parseSimilar = guardType stringTypes >> ASIMILAR <$> parseOne
|
|
|
|
parseNsimilar = guardType stringTypes >> ANSIMILAR <$> parseOne
|
2019-07-15 11:52:45 +03:00
|
|
|
|
|
|
|
parseIsNull = bool ANISNOTNULL ANISNULL -- is null
|
|
|
|
<$> parseVal
|
|
|
|
|
|
|
|
parseCeq = CEQ <$> decodeAndValidateRhsCol
|
|
|
|
parseCne = CNE <$> decodeAndValidateRhsCol
|
|
|
|
parseCgt = CGT <$> decodeAndValidateRhsCol
|
|
|
|
parseClt = CLT <$> decodeAndValidateRhsCol
|
|
|
|
parseCgte = CGTE <$> decodeAndValidateRhsCol
|
|
|
|
parseClte = CLTE <$> decodeAndValidateRhsCol
|
|
|
|
|
|
|
|
parseCast = do
|
|
|
|
castOperations <- parseVal
|
|
|
|
parsedCastOperations <-
|
|
|
|
forM (M.toList castOperations) $ \(targetTypeName, castedComparisons) -> do
|
2019-10-18 11:29:47 +03:00
|
|
|
let targetType = textToPGScalarType targetTypeName
|
2019-07-22 15:47:13 +03:00
|
|
|
castedColumn = ColumnReferenceCast column (PGColumnScalar targetType)
|
2019-07-15 11:52:45 +03:00
|
|
|
checkValidCast targetType
|
|
|
|
parsedCastedComparisons <- withPathK targetTypeName $
|
|
|
|
parseOperations castedColumn castedComparisons
|
|
|
|
return (targetType, parsedCastedComparisons)
|
|
|
|
return . ACast $ M.fromList parsedCastOperations
|
|
|
|
|
|
|
|
checkValidCast targetType = case (colTy, targetType) of
|
2019-07-22 15:47:13 +03:00
|
|
|
(PGColumnScalar PGGeometry, PGGeography) -> return ()
|
|
|
|
(PGColumnScalar PGGeography, PGGeometry) -> return ()
|
2019-07-15 11:52:45 +03:00
|
|
|
_ -> throw400 UnexpectedPayload $
|
|
|
|
"cannot cast column of type " <> colTy <<> " to type " <>> targetType
|
|
|
|
|
|
|
|
parseGeometryOp f =
|
2019-07-22 15:47:13 +03:00
|
|
|
guardType [PGGeometry] >> f <$> parseOneNoSess colTy val
|
2019-07-15 11:52:45 +03:00
|
|
|
parseGeometryOrGeographyOp f =
|
2019-07-22 15:47:13 +03:00
|
|
|
guardType geoTypes >> f <$> parseOneNoSess colTy val
|
2019-07-15 11:52:45 +03:00
|
|
|
|
|
|
|
parseSTDWithinObj = case colTy of
|
2019-07-22 15:47:13 +03:00
|
|
|
PGColumnScalar PGGeometry -> do
|
2019-07-15 11:52:45 +03:00
|
|
|
DWithinGeomOp distVal fromVal <- parseVal
|
2019-07-22 15:47:13 +03:00
|
|
|
dist <- withPathK "distance" $ parseOneNoSess (PGColumnScalar PGFloat) distVal
|
2019-07-15 11:52:45 +03:00
|
|
|
from <- withPathK "from" $ parseOneNoSess colTy fromVal
|
|
|
|
return $ ASTDWithinGeom $ DWithinGeomOp dist from
|
2019-07-22 15:47:13 +03:00
|
|
|
PGColumnScalar PGGeography -> do
|
2019-07-15 11:52:45 +03:00
|
|
|
DWithinGeogOp distVal fromVal sphVal <- parseVal
|
2019-07-22 15:47:13 +03:00
|
|
|
dist <- withPathK "distance" $ parseOneNoSess (PGColumnScalar PGFloat) distVal
|
2019-07-15 11:52:45 +03:00
|
|
|
from <- withPathK "from" $ parseOneNoSess colTy fromVal
|
2019-07-22 15:47:13 +03:00
|
|
|
useSpheroid <- withPathK "use_spheroid" $ parseOneNoSess (PGColumnScalar PGBoolean) sphVal
|
2019-07-15 11:52:45 +03:00
|
|
|
return $ ASTDWithinGeog $ DWithinGeogOp dist from useSpheroid
|
|
|
|
_ -> throwError $ buildMsg colTy [PGGeometry, PGGeography]
|
|
|
|
|
|
|
|
decodeAndValidateRhsCol =
|
|
|
|
parseVal >>= validateRhsCol
|
|
|
|
|
|
|
|
validateRhsCol rhsCol = do
|
|
|
|
let errMsg = "column operators can only compare postgres columns"
|
|
|
|
rhsType <- askPGType fim rhsCol errMsg
|
|
|
|
if colTy /= rhsType
|
|
|
|
then throw400 UnexpectedPayload $
|
|
|
|
"incompatible column types : " <> column <<> ", " <>> rhsCol
|
|
|
|
else return rhsCol
|
|
|
|
|
2019-08-11 18:34:38 +03:00
|
|
|
parseWithTy ty = rhsParser (PGTypeScalar ty) val
|
2019-07-15 11:52:45 +03:00
|
|
|
|
|
|
|
-- parse one with the column's type
|
|
|
|
parseOne = parseWithTy colTy
|
2019-08-11 18:34:38 +03:00
|
|
|
parseOneNoSess ty = rhsParser (PGTypeScalar ty)
|
2019-07-15 11:52:45 +03:00
|
|
|
|
2019-07-22 15:47:13 +03:00
|
|
|
parseManyWithType ty = rhsParser (PGTypeArray ty) val
|
|
|
|
|
|
|
|
guardType validTys = unless (isScalarColumnWhere (`elem` validTys) colTy) $
|
|
|
|
throwError $ buildMsg colTy validTys
|
|
|
|
buildMsg ty expTys = err400 UnexpectedPayload
|
|
|
|
$ " is of type " <> ty <<> "; this operator works only on columns of type "
|
|
|
|
<> T.intercalate "/" (map dquote expTys)
|
2019-07-15 11:52:45 +03:00
|
|
|
|
|
|
|
parseVal :: (FromJSON a) => m a
|
|
|
|
parseVal = decodeValue val
|
2018-06-27 16:11:32 +03:00
|
|
|
|
|
|
|
-- This convoluted expression instead of col = val
|
|
|
|
-- to handle the case of col : null
|
|
|
|
equalsBoolExpBuilder :: S.SQLExp -> S.SQLExp -> S.BoolExp
|
|
|
|
equalsBoolExpBuilder qualColExp rhsExp =
|
|
|
|
S.BEBin S.OrOp (S.BECompare S.SEQ qualColExp rhsExp)
|
|
|
|
(S.BEBin S.AndOp
|
|
|
|
(S.BENull qualColExp)
|
|
|
|
(S.BENull rhsExp))
|
|
|
|
|
|
|
|
notEqualsBoolExpBuilder :: S.SQLExp -> S.SQLExp -> S.BoolExp
|
|
|
|
notEqualsBoolExpBuilder qualColExp rhsExp =
|
|
|
|
S.BEBin S.OrOp (S.BECompare S.SNE qualColExp rhsExp)
|
|
|
|
(S.BEBin S.AndOp
|
|
|
|
(S.BENotNull qualColExp)
|
|
|
|
(S.BENull rhsExp))
|
|
|
|
|
|
|
|
annBoolExp
|
2019-11-20 21:21:30 +03:00
|
|
|
:: (QErrM m, TableCoreInfoRM m)
|
2019-07-10 13:19:58 +03:00
|
|
|
=> OpRhsParser m v
|
2019-11-20 21:21:30 +03:00
|
|
|
-> FieldInfoMap FieldInfo
|
2019-09-05 10:34:53 +03:00
|
|
|
-> GBoolExp ColExp
|
2019-07-10 13:19:58 +03:00
|
|
|
-> m (AnnBoolExp v)
|
2019-09-05 10:34:53 +03:00
|
|
|
annBoolExp rhsParser fim boolExp =
|
|
|
|
case boolExp of
|
|
|
|
BoolAnd exps -> BoolAnd <$> procExps exps
|
|
|
|
BoolOr exps -> BoolOr <$> procExps exps
|
|
|
|
BoolNot e -> BoolNot <$> annBoolExp rhsParser fim e
|
|
|
|
BoolExists (GExists refqt whereExp) ->
|
|
|
|
withPathK "_exists" $ do
|
|
|
|
refFields <- withPathK "_table" $ askFieldInfoMap refqt
|
|
|
|
annWhereExp <- withPathK "_where" $
|
|
|
|
annBoolExp rhsParser refFields whereExp
|
|
|
|
return $ BoolExists $ GExists refqt annWhereExp
|
|
|
|
BoolFld fld -> BoolFld <$> annColExp rhsParser fim fld
|
|
|
|
where
|
|
|
|
procExps = mapM (annBoolExp rhsParser fim)
|
2018-06-27 16:11:32 +03:00
|
|
|
|
|
|
|
annColExp
|
2019-11-20 21:21:30 +03:00
|
|
|
:: (QErrM m, TableCoreInfoRM m)
|
2019-07-10 13:19:58 +03:00
|
|
|
=> OpRhsParser m v
|
2019-11-20 21:21:30 +03:00
|
|
|
-> FieldInfoMap FieldInfo
|
2018-06-27 16:11:32 +03:00
|
|
|
-> ColExp
|
2019-07-10 13:19:58 +03:00
|
|
|
-> m (AnnBoolExpFld v)
|
|
|
|
annColExp rhsParser colInfoMap (ColExp fieldName colVal) = do
|
2018-06-27 16:11:32 +03:00
|
|
|
colInfo <- askFieldInfo colInfoMap fieldName
|
|
|
|
case colInfo of
|
2020-02-04 18:34:17 +03:00
|
|
|
FIColumn (PGColumnInfo _ _ _ (PGColumnScalar PGJSON) _ _) ->
|
2018-06-27 16:11:32 +03:00
|
|
|
throwError (err400 UnexpectedPayload "JSON column can not be part of where clause")
|
|
|
|
FIColumn pgi ->
|
2019-07-15 11:52:45 +03:00
|
|
|
AVCol pgi <$> parseOperationsExpression rhsParser colInfoMap pgi colVal
|
2018-06-27 16:11:32 +03:00
|
|
|
FIRelationship relInfo -> do
|
|
|
|
relBoolExp <- decodeValue colVal
|
|
|
|
relFieldInfoMap <- askFieldInfoMap $ riRTable relInfo
|
2019-09-05 10:34:53 +03:00
|
|
|
annRelBoolExp <- annBoolExp rhsParser relFieldInfoMap $
|
|
|
|
unBoolExp relBoolExp
|
2018-11-16 15:40:23 +03:00
|
|
|
return $ AVRel relInfo annRelBoolExp
|
2019-10-18 11:29:47 +03:00
|
|
|
FIComputedField _ ->
|
|
|
|
throw400 UnexpectedPayload "Computed columns can not be part of the where clause"
|
2020-05-27 18:02:58 +03:00
|
|
|
-- TODO Rakesh
|
|
|
|
FIRemoteRelationship{} ->
|
|
|
|
throw400 UnexpectedPayload "remote field unsupported"
|
2018-06-27 16:11:32 +03:00
|
|
|
|
2018-11-16 15:40:23 +03:00
|
|
|
toSQLBoolExp
|
|
|
|
:: S.Qual -> AnnBoolExpSQL -> S.BoolExp
|
|
|
|
toSQLBoolExp tq e =
|
|
|
|
evalState (convBoolRhs' tq e) 0
|
2018-06-27 16:11:32 +03:00
|
|
|
|
2018-11-16 15:40:23 +03:00
|
|
|
convBoolRhs'
|
|
|
|
:: S.Qual -> AnnBoolExpSQL -> State Word64 S.BoolExp
|
|
|
|
convBoolRhs' tq =
|
|
|
|
foldBoolExp (convColRhs tq)
|
2018-06-27 16:11:32 +03:00
|
|
|
|
|
|
|
convColRhs
|
2018-11-16 15:40:23 +03:00
|
|
|
:: S.Qual -> AnnBoolExpFldSQL -> State Word64 S.BoolExp
|
|
|
|
convColRhs tableQual = \case
|
2019-09-17 04:51:11 +03:00
|
|
|
AVCol colInfo opExps -> do
|
2019-10-18 11:29:47 +03:00
|
|
|
let colFld = fromPGCol $ pgiColumn colInfo
|
|
|
|
bExps = map (mkFieldCompExp tableQual colFld) opExps
|
2018-11-16 15:40:23 +03:00
|
|
|
return $ foldr (S.BEBin S.AndOp) (S.BELit True) bExps
|
|
|
|
|
|
|
|
AVRel (RelInfo _ _ colMapping relTN _) nesAnn -> do
|
2018-06-27 16:11:32 +03:00
|
|
|
-- Convert the where clause on the relationship
|
2018-11-16 15:40:23 +03:00
|
|
|
curVarNum <- get
|
|
|
|
put $ curVarNum + 1
|
|
|
|
let newIden = Iden $ "_be_" <> T.pack (show curVarNum) <> "_"
|
2020-03-10 15:45:47 +03:00
|
|
|
<> snakeCaseQualObject relTN
|
2020-02-04 18:34:17 +03:00
|
|
|
newIdenQ = S.QualIden newIden Nothing
|
2018-11-16 15:40:23 +03:00
|
|
|
annRelBoolExp <- convBoolRhs' newIdenQ nesAnn
|
|
|
|
let backCompExp = foldr (S.BEBin S.AndOp) (S.BELit True) $
|
2019-12-13 00:46:33 +03:00
|
|
|
flip map (M.toList colMapping) $ \(lCol, rCol) ->
|
|
|
|
S.BECompare S.SEQ
|
2020-02-04 18:34:17 +03:00
|
|
|
(mkQCol (S.QualIden newIden Nothing) rCol)
|
2019-12-13 00:46:33 +03:00
|
|
|
(mkQCol tableQual lCol)
|
2018-06-27 16:11:32 +03:00
|
|
|
innerBoolExp = S.BEBin S.AndOp backCompExp annRelBoolExp
|
2018-11-16 15:40:23 +03:00
|
|
|
return $ S.mkExists (S.FISimple relTN $ Just $ S.Alias newIden) innerBoolExp
|
|
|
|
where
|
|
|
|
mkQCol q = S.SEQIden . S.QIden q . toIden
|
2018-06-27 16:11:32 +03:00
|
|
|
|
2019-09-05 10:34:53 +03:00
|
|
|
foldExists :: GExists AnnBoolExpFldSQL -> State Word64 S.BoolExp
|
|
|
|
foldExists (GExists qt wh) = do
|
|
|
|
whereExp <- foldBoolExp (convColRhs (S.QualTable qt)) wh
|
|
|
|
return $ S.mkExists (S.FISimple qt Nothing) whereExp
|
|
|
|
|
|
|
|
foldBoolExp
|
|
|
|
:: (AnnBoolExpFldSQL -> State Word64 S.BoolExp)
|
|
|
|
-> AnnBoolExpSQL
|
|
|
|
-> State Word64 S.BoolExp
|
|
|
|
foldBoolExp f = \case
|
|
|
|
BoolAnd bes -> do
|
|
|
|
sqlBExps <- mapM (foldBoolExp f) bes
|
|
|
|
return $ foldr (S.BEBin S.AndOp) (S.BELit True) sqlBExps
|
|
|
|
|
|
|
|
BoolOr bes -> do
|
|
|
|
sqlBExps <- mapM (foldBoolExp f) bes
|
|
|
|
return $ foldr (S.BEBin S.OrOp) (S.BELit False) sqlBExps
|
|
|
|
|
|
|
|
BoolNot notExp -> S.BENot <$> foldBoolExp f notExp
|
|
|
|
BoolExists existsExp -> foldExists existsExp
|
|
|
|
BoolFld ce -> f ce
|
|
|
|
|
2019-10-18 11:29:47 +03:00
|
|
|
mkFieldCompExp
|
|
|
|
:: S.Qual -> FieldName -> OpExpG S.SQLExp -> S.BoolExp
|
|
|
|
mkFieldCompExp qual lhsField = mkCompExp (mkQField lhsField)
|
2018-06-27 16:11:32 +03:00
|
|
|
where
|
2018-11-16 15:40:23 +03:00
|
|
|
mkQCol = S.SEQIden . S.QIden qual . toIden
|
2019-10-18 11:29:47 +03:00
|
|
|
mkQField = S.SEQIden . S.QIden qual . Iden . getFieldNameTxt
|
2019-01-17 09:21:38 +03:00
|
|
|
|
2019-07-15 11:52:45 +03:00
|
|
|
mkCompExp :: S.SQLExp -> OpExpG S.SQLExp -> S.BoolExp
|
|
|
|
mkCompExp lhs = \case
|
|
|
|
ACast casts -> mkCastsExp casts
|
|
|
|
AEQ False val -> equalsBoolExpBuilder lhs val
|
|
|
|
AEQ True val -> S.BECompare S.SEQ lhs val
|
|
|
|
ANE False val -> notEqualsBoolExpBuilder lhs val
|
|
|
|
ANE True val -> S.BECompare S.SNE lhs val
|
|
|
|
|
|
|
|
AIN val -> S.BECompareAny S.SEQ lhs val
|
|
|
|
ANIN val -> S.BENot $ S.BECompareAny S.SEQ lhs val
|
|
|
|
|
|
|
|
AGT val -> S.BECompare S.SGT lhs val
|
|
|
|
ALT val -> S.BECompare S.SLT lhs val
|
|
|
|
AGTE val -> S.BECompare S.SGTE lhs val
|
|
|
|
ALTE val -> S.BECompare S.SLTE lhs val
|
|
|
|
ALIKE val -> S.BECompare S.SLIKE lhs val
|
|
|
|
ANLIKE val -> S.BECompare S.SNLIKE lhs val
|
|
|
|
AILIKE val -> S.BECompare S.SILIKE lhs val
|
|
|
|
ANILIKE val -> S.BECompare S.SNILIKE lhs val
|
|
|
|
ASIMILAR val -> S.BECompare S.SSIMILAR lhs val
|
|
|
|
ANSIMILAR val -> S.BECompare S.SNSIMILAR lhs val
|
|
|
|
AContains val -> S.BECompare S.SContains lhs val
|
|
|
|
AContainedIn val -> S.BECompare S.SContainedIn lhs val
|
|
|
|
AHasKey val -> S.BECompare S.SHasKey lhs val
|
|
|
|
|
|
|
|
AHasKeysAny val -> S.BECompare S.SHasKeysAny lhs val
|
|
|
|
AHasKeysAll val -> S.BECompare S.SHasKeysAll lhs val
|
|
|
|
|
|
|
|
ASTContains val -> mkGeomOpBe "ST_Contains" val
|
|
|
|
ASTCrosses val -> mkGeomOpBe "ST_Crosses" val
|
|
|
|
ASTEquals val -> mkGeomOpBe "ST_Equals" val
|
|
|
|
ASTIntersects val -> mkGeomOpBe "ST_Intersects" val
|
|
|
|
ASTOverlaps val -> mkGeomOpBe "ST_Overlaps" val
|
|
|
|
ASTTouches val -> mkGeomOpBe "ST_Touches" val
|
|
|
|
ASTWithin val -> mkGeomOpBe "ST_Within" val
|
|
|
|
ASTDWithinGeom (DWithinGeomOp r val) ->
|
|
|
|
applySQLFn "ST_DWithin" [lhs, val, r]
|
|
|
|
ASTDWithinGeog (DWithinGeogOp r val sph) ->
|
|
|
|
applySQLFn "ST_DWithin" [lhs, val, r, sph]
|
|
|
|
|
2019-08-29 16:07:05 +03:00
|
|
|
ASTIntersectsRast val ->
|
|
|
|
applySTIntersects [lhs, val]
|
|
|
|
ASTIntersectsNbandGeom (STIntersectsNbandGeommin nband geommin) ->
|
|
|
|
applySTIntersects [lhs, nband, geommin]
|
|
|
|
ASTIntersectsGeomNband (STIntersectsGeomminNband geommin mNband)->
|
|
|
|
applySTIntersects [lhs, geommin, withSQLNull mNband]
|
|
|
|
|
2019-07-15 11:52:45 +03:00
|
|
|
ANISNULL -> S.BENull lhs
|
|
|
|
ANISNOTNULL -> S.BENotNull lhs
|
|
|
|
CEQ rhsCol -> S.BECompare S.SEQ lhs $ mkQCol rhsCol
|
|
|
|
CNE rhsCol -> S.BECompare S.SNE lhs $ mkQCol rhsCol
|
|
|
|
CGT rhsCol -> S.BECompare S.SGT lhs $ mkQCol rhsCol
|
|
|
|
CLT rhsCol -> S.BECompare S.SLT lhs $ mkQCol rhsCol
|
|
|
|
CGTE rhsCol -> S.BECompare S.SGTE lhs $ mkQCol rhsCol
|
|
|
|
CLTE rhsCol -> S.BECompare S.SLTE lhs $ mkQCol rhsCol
|
|
|
|
where
|
|
|
|
mkGeomOpBe fn v = applySQLFn fn [lhs, v]
|
|
|
|
|
|
|
|
applySQLFn f exps = S.BEExp $ S.SEFnApp f exps Nothing
|
|
|
|
|
2019-08-29 16:07:05 +03:00
|
|
|
applySTIntersects = applySQLFn "ST_Intersects"
|
|
|
|
|
|
|
|
withSQLNull = fromMaybe S.SENull
|
|
|
|
|
2019-07-15 11:52:45 +03:00
|
|
|
mkCastsExp casts =
|
|
|
|
sqlAll . flip map (M.toList casts) $ \(targetType, operations) ->
|
2019-08-11 18:34:38 +03:00
|
|
|
let targetAnn = S.mkTypeAnn $ PGTypeScalar targetType
|
2019-07-15 11:52:45 +03:00
|
|
|
in sqlAll $ map (mkCompExp (S.SETyAnn lhs targetAnn)) operations
|
|
|
|
|
|
|
|
sqlAll = foldr (S.BEBin S.AndOp) (S.BELit True)
|
2019-01-17 09:21:38 +03:00
|
|
|
|
2019-08-17 00:35:22 +03:00
|
|
|
hasStaticExp :: OpExpG PartialSQLExp -> Bool
|
|
|
|
hasStaticExp = has (template . filtered isStaticValue)
|
|
|
|
|
|
|
|
getColExpDeps
|
|
|
|
:: QualifiedTable -> AnnBoolExpFldPartialSQL -> [SchemaDependency]
|
2018-11-16 15:40:23 +03:00
|
|
|
getColExpDeps tn = \case
|
2019-04-24 13:28:10 +03:00
|
|
|
AVCol colInfo opExps ->
|
2019-09-19 07:47:36 +03:00
|
|
|
let cn = pgiColumn colInfo
|
2019-08-17 00:35:22 +03:00
|
|
|
colDepReason = bool DRSessionVariable DROnType $ any hasStaticExp opExps
|
|
|
|
colDep = mkColDep colDepReason tn cn
|
2019-04-24 13:28:10 +03:00
|
|
|
depColsInOpExp = mapMaybe opExpDepCol opExps
|
2019-08-17 00:35:22 +03:00
|
|
|
colDepsInOpExp = map (mkColDep DROnType tn) depColsInOpExp
|
|
|
|
in colDep:colDepsInOpExp
|
2018-11-16 15:40:23 +03:00
|
|
|
AVRel relInfo relBoolExp ->
|
|
|
|
let rn = riName relInfo
|
|
|
|
relTN = riRTable relInfo
|
2019-08-17 00:35:22 +03:00
|
|
|
pd = SchemaDependency (SOTableObj tn (TORel rn)) DROnType
|
2018-11-16 15:40:23 +03:00
|
|
|
in pd : getBoolExpDeps relTN relBoolExp
|
|
|
|
|
2019-08-17 00:35:22 +03:00
|
|
|
getBoolExpDeps :: QualifiedTable -> AnnBoolExpPartialSQL -> [SchemaDependency]
|
2019-09-05 10:34:53 +03:00
|
|
|
getBoolExpDeps tn = \case
|
|
|
|
BoolAnd exps -> procExps exps
|
|
|
|
BoolOr exps -> procExps exps
|
|
|
|
BoolNot e -> getBoolExpDeps tn e
|
|
|
|
BoolExists (GExists refqt whereExp) ->
|
|
|
|
let tableDep = SchemaDependency (SOTable refqt) DRRemoteTable
|
|
|
|
in tableDep:getBoolExpDeps refqt whereExp
|
|
|
|
BoolFld fld -> getColExpDeps tn fld
|
|
|
|
where
|
|
|
|
procExps = concatMap (getBoolExpDeps tn)
|