2018-06-27 16:11:32 +03:00
|
|
|
module Hasura.SQL.Value where
|
|
|
|
|
|
|
|
import Hasura.SQL.GeoJSON
|
|
|
|
import Hasura.SQL.Time
|
|
|
|
import Hasura.SQL.Types
|
|
|
|
|
|
|
|
import qualified Database.PG.Query as Q
|
|
|
|
import qualified Database.PG.Query.PTI as PTI
|
|
|
|
import qualified Hasura.SQL.DML as S
|
|
|
|
|
|
|
|
import Data.Aeson
|
|
|
|
import Data.Aeson.Internal
|
|
|
|
import Data.Int
|
|
|
|
import Data.Scientific
|
|
|
|
import Data.Time
|
2018-08-06 15:15:08 +03:00
|
|
|
import Hasura.Prelude
|
2018-06-27 16:11:32 +03:00
|
|
|
|
|
|
|
import qualified Data.Aeson.Text as AE
|
|
|
|
import qualified Data.Aeson.Types as AT
|
|
|
|
import qualified Data.Text as T
|
|
|
|
import qualified Data.Text.Encoding as TE
|
|
|
|
import qualified Data.Text.Lazy as TL
|
|
|
|
|
|
|
|
import qualified Database.PostgreSQL.LibPQ as PQ
|
|
|
|
import qualified PostgreSQL.Binary.Encoding as PE
|
|
|
|
|
|
|
|
-- Binary value. Used in prepared sq
|
|
|
|
data PGColValue
|
|
|
|
= PGValInteger !Int32
|
|
|
|
| PGValSmallInt !Int16
|
|
|
|
| PGValBigInt !Int64
|
|
|
|
| PGValFloat !Float
|
|
|
|
| PGValDouble !Double
|
|
|
|
| PGValNumeric !Scientific
|
|
|
|
| PGValBoolean !Bool
|
|
|
|
| PGValChar !Char
|
|
|
|
| PGValVarchar !T.Text
|
|
|
|
| PGValText !T.Text
|
|
|
|
| PGValDate !Day
|
|
|
|
| PGValTimeStampTZ !UTCTime
|
|
|
|
| PGValTimeTZ !ZonedTimeOfDay
|
2019-08-06 18:27:35 +03:00
|
|
|
| PGNull !PGScalarType
|
2018-06-27 16:11:32 +03:00
|
|
|
| PGValJSON !Q.JSON
|
|
|
|
| PGValJSONB !Q.JSONB
|
2018-09-27 15:23:17 +03:00
|
|
|
| PGValGeo !GeometryWithCRS
|
2018-06-27 16:11:32 +03:00
|
|
|
| PGValUnknown !T.Text
|
|
|
|
deriving (Show, Eq)
|
|
|
|
|
2019-04-17 12:48:41 +03:00
|
|
|
data TxtEncodedPGVal
|
|
|
|
= TENull
|
|
|
|
| TELit !Text
|
2019-04-18 14:20:27 +03:00
|
|
|
deriving (Show, Eq, Generic)
|
|
|
|
|
|
|
|
instance Hashable TxtEncodedPGVal
|
|
|
|
|
|
|
|
instance ToJSON TxtEncodedPGVal where
|
|
|
|
toJSON = \case
|
|
|
|
TENull -> Null
|
|
|
|
TELit t -> String t
|
2019-04-17 12:48:41 +03:00
|
|
|
|
|
|
|
txtEncodedPGVal :: PGColValue -> TxtEncodedPGVal
|
|
|
|
txtEncodedPGVal colVal = case colVal of
|
|
|
|
PGValInteger i -> TELit $ T.pack $ show i
|
|
|
|
PGValSmallInt i -> TELit $ T.pack $ show i
|
|
|
|
PGValBigInt i -> TELit $ T.pack $ show i
|
|
|
|
PGValFloat f -> TELit $ T.pack $ show f
|
|
|
|
PGValDouble d -> TELit $ T.pack $ show d
|
|
|
|
PGValNumeric sc -> TELit $ T.pack $ show sc
|
|
|
|
PGValBoolean b -> TELit $ bool "false" "true" b
|
|
|
|
PGValChar t -> TELit $ T.pack $ show t
|
|
|
|
PGValVarchar t -> TELit t
|
|
|
|
PGValText t -> TELit t
|
|
|
|
PGValDate d -> TELit $ T.pack $ showGregorian d
|
2018-06-27 16:11:32 +03:00
|
|
|
PGValTimeStampTZ u ->
|
2019-04-17 12:48:41 +03:00
|
|
|
TELit $ T.pack $ formatTime defaultTimeLocale "%FT%T%QZ" u
|
2018-06-27 16:11:32 +03:00
|
|
|
PGValTimeTZ (ZonedTimeOfDay tod tz) ->
|
2019-04-17 12:48:41 +03:00
|
|
|
TELit $ T.pack (show tod ++ timeZoneOffsetString tz)
|
2018-06-27 16:11:32 +03:00
|
|
|
PGNull _ ->
|
2019-04-17 12:48:41 +03:00
|
|
|
TENull
|
|
|
|
PGValJSON (Q.JSON j) -> TELit $ TL.toStrict $
|
2018-06-27 16:11:32 +03:00
|
|
|
AE.encodeToLazyText j
|
2019-04-17 12:48:41 +03:00
|
|
|
PGValJSONB (Q.JSONB j) -> TELit $ TL.toStrict $
|
2018-06-27 16:11:32 +03:00
|
|
|
AE.encodeToLazyText j
|
2019-04-17 12:48:41 +03:00
|
|
|
PGValGeo o -> TELit $ TL.toStrict $
|
2018-06-27 16:11:32 +03:00
|
|
|
AE.encodeToLazyText o
|
2019-04-17 12:48:41 +03:00
|
|
|
PGValUnknown t -> TELit t
|
|
|
|
|
|
|
|
txtEncoder :: PGColValue -> S.SQLExp
|
|
|
|
txtEncoder colVal = case txtEncodedPGVal colVal of
|
|
|
|
TENull -> S.SEUnsafe "NULL"
|
|
|
|
TELit t -> S.SELit t
|
2018-06-27 16:11:32 +03:00
|
|
|
|
|
|
|
binEncoder :: PGColValue -> Q.PrepArg
|
|
|
|
binEncoder colVal = case colVal of
|
|
|
|
PGValInteger i ->
|
|
|
|
Q.toPrepVal i
|
|
|
|
PGValSmallInt i ->
|
|
|
|
Q.toPrepVal i
|
|
|
|
PGValBigInt i ->
|
|
|
|
Q.toPrepVal i
|
|
|
|
PGValFloat f ->
|
|
|
|
Q.toPrepVal f
|
|
|
|
PGValDouble d ->
|
|
|
|
Q.toPrepVal d
|
|
|
|
PGValNumeric sc ->
|
|
|
|
Q.toPrepVal sc
|
|
|
|
PGValBoolean b ->
|
|
|
|
Q.toPrepVal b
|
|
|
|
PGValChar t ->
|
|
|
|
Q.toPrepVal t
|
|
|
|
PGValVarchar t ->
|
|
|
|
Q.toPrepVal t
|
|
|
|
PGValText t ->
|
|
|
|
Q.toPrepVal t
|
|
|
|
PGValDate d ->
|
|
|
|
Q.toPrepVal d
|
|
|
|
PGValTimeStampTZ u ->
|
|
|
|
Q.toPrepVal u
|
|
|
|
PGValTimeTZ (ZonedTimeOfDay t z) ->
|
|
|
|
Q.toPrepValHelper PTI.timetz PE.timetz_int (t, z)
|
|
|
|
PGNull ty ->
|
|
|
|
(pgTypeOid ty, Nothing)
|
|
|
|
PGValJSON u ->
|
|
|
|
Q.toPrepVal u
|
|
|
|
PGValJSONB u ->
|
|
|
|
Q.toPrepVal u
|
|
|
|
PGValGeo o ->
|
|
|
|
Q.toPrepVal $ TL.toStrict $ AE.encodeToLazyText o
|
|
|
|
PGValUnknown t ->
|
2019-04-17 12:48:41 +03:00
|
|
|
textToPrepVal t
|
|
|
|
|
|
|
|
textToPrepVal :: Text -> Q.PrepArg
|
|
|
|
textToPrepVal t =
|
|
|
|
(PTI.auto, Just (TE.encodeUtf8 t, PQ.Text))
|
2018-06-27 16:11:32 +03:00
|
|
|
|
2019-08-06 18:27:35 +03:00
|
|
|
parsePGValue' :: PGScalarType
|
2018-06-27 16:11:32 +03:00
|
|
|
-> Value
|
|
|
|
-> AT.Parser PGColValue
|
2019-07-22 15:47:13 +03:00
|
|
|
parsePGValue' ty v = case (ty, v) of
|
|
|
|
(_, Null) -> return $ PGNull ty
|
|
|
|
(PGSmallInt, val) -> PGValSmallInt <$> parseJSON val
|
|
|
|
(PGInteger, val) -> PGValInteger <$> parseJSON val
|
|
|
|
(PGBigInt, val) -> PGValBigInt <$> parseJSON val
|
|
|
|
(PGSerial, val) -> PGValInteger <$> parseJSON val
|
|
|
|
(PGBigSerial, val) -> PGValBigInt <$> parseJSON val
|
|
|
|
(PGFloat, val) -> PGValFloat <$> parseJSON val
|
|
|
|
(PGDouble, val) -> PGValDouble <$> parseJSON val
|
|
|
|
(PGNumeric, val) -> PGValNumeric <$> parseJSON val
|
|
|
|
(PGBoolean, val) -> PGValBoolean <$> parseJSON val
|
|
|
|
(PGChar, val) -> PGValChar <$> parseJSON val
|
|
|
|
(PGVarchar, val) -> PGValVarchar <$> parseJSON val
|
|
|
|
(PGText, val) -> PGValText <$> parseJSON val
|
|
|
|
(PGDate, val) -> PGValDate <$> parseJSON val
|
|
|
|
(PGTimeStampTZ, val) -> PGValTimeStampTZ <$> parseJSON val
|
|
|
|
(PGTimeTZ, val) -> PGValTimeTZ <$> parseJSON val
|
|
|
|
(PGJSON, val) -> PGValJSON . Q.JSON <$> parseJSON val
|
|
|
|
(PGJSONB, val) -> PGValJSONB . Q.JSONB <$> parseJSON val
|
|
|
|
(PGGeometry, val) -> PGValGeo <$> parseJSON val
|
|
|
|
(PGGeography, val) -> PGValGeo <$> parseJSON val
|
|
|
|
(PGUnknown _, String t) -> return $ PGValUnknown t
|
|
|
|
(PGUnknown tyName, _) -> fail $ "A string is expected for type : " ++ T.unpack tyName
|
2018-06-27 16:11:32 +03:00
|
|
|
|
2019-08-06 18:27:35 +03:00
|
|
|
parsePGValue :: PGScalarType -> Value -> AT.Parser PGColValue
|
2018-06-27 16:11:32 +03:00
|
|
|
parsePGValue pct val =
|
|
|
|
case val of
|
|
|
|
String t -> parsePGValue' pct val <|> return (PGValUnknown t)
|
|
|
|
_ -> parsePGValue' pct val
|
|
|
|
|
|
|
|
readEitherTxt :: (Read a) => T.Text -> Either String a
|
|
|
|
readEitherTxt = readEither . T.unpack
|
|
|
|
|
|
|
|
iresToEither :: IResult a -> Either String a
|
|
|
|
iresToEither (IError _ msg) = Left msg
|
|
|
|
iresToEither (ISuccess a) = return a
|
|
|
|
|
|
|
|
pgValFromJVal :: (FromJSON a) => Value -> Either String a
|
|
|
|
pgValFromJVal = iresToEither . ifromJSON
|
|
|
|
|
2019-08-06 18:27:35 +03:00
|
|
|
withGeoVal :: PGScalarType -> S.SQLExp -> S.SQLExp
|
2019-07-22 15:47:13 +03:00
|
|
|
withGeoVal ty v
|
|
|
|
| isGeoType ty = S.SEFnApp "ST_GeomFromGeoJSON" [v] Nothing
|
|
|
|
| otherwise = v
|
2019-01-17 09:21:38 +03:00
|
|
|
|
2019-08-06 18:27:35 +03:00
|
|
|
toPrepParam :: Int -> PGScalarType -> S.SQLExp
|
2019-01-28 20:46:31 +03:00
|
|
|
toPrepParam i ty =
|
|
|
|
withGeoVal ty $ S.SEPrep i
|
2019-01-17 09:21:38 +03:00
|
|
|
|
2019-07-22 15:47:13 +03:00
|
|
|
toBinaryValue :: PGScalarTyped PGColValue -> Q.PrepArg
|
|
|
|
toBinaryValue = binEncoder . pstValue
|
|
|
|
|
|
|
|
toTxtValue :: PGScalarTyped PGColValue -> S.SQLExp
|
|
|
|
toTxtValue (PGScalarTyped ty val) = S.withTyAnn ty . withGeoVal ty $ txtEncoder val
|
2018-08-06 15:15:08 +03:00
|
|
|
|
|
|
|
pgColValueToInt :: PGColValue -> Maybe Int
|
|
|
|
pgColValueToInt (PGValInteger i) = Just $ fromIntegral i
|
|
|
|
pgColValueToInt (PGValSmallInt i) = Just $ fromIntegral i
|
|
|
|
pgColValueToInt (PGValBigInt i) = Just $ fromIntegral i
|
|
|
|
pgColValueToInt _ = Nothing
|