mirror of
https://github.com/hasura/graphql-engine.git
synced 2024-12-17 20:41:49 +03:00
647231b685
Manually enables: * EmptyCase * ExistentialQuantification * QuantifiedConstraints * QuasiQuotes * TemplateHaskell * TypeFamilyDependencies ...in the following components: * 'graphql-engine' library * 'graphql-engine' 'src-test' * 'graphql-engine' 'tests/integration' * 'graphql-engine' tests-hspec' Additionally, performs some light refactoring and documentation. PR-URL: https://github.com/hasura/graphql-engine-mono/pull/3991 GitOrigin-RevId: 514477d3466b01f60eca8935d0fef60dd0756838
49 lines
1.5 KiB
Haskell
49 lines
1.5 KiB
Haskell
{-# LANGUAGE TemplateHaskell #-}
|
|
|
|
module Hasura.Backends.MySQL.SQL
|
|
( runSQL,
|
|
RunSQL (..),
|
|
)
|
|
where
|
|
|
|
import Data.Aeson qualified as J
|
|
import Data.Aeson.TH
|
|
import Data.ByteString hiding (null, reverse)
|
|
import Data.Pool (withResource)
|
|
import Data.String (fromString)
|
|
import Data.Text qualified as T
|
|
import Data.Text.Encoding (decodeUtf8With)
|
|
import Data.Text.Encoding.Error (lenientDecode)
|
|
import Database.MySQL.Base (fetchFields, query, storeResult)
|
|
import Database.MySQL.Base.Types (Field (fieldName))
|
|
import Hasura.Backends.MySQL.Connection (fetchAllRows)
|
|
import Hasura.Backends.MySQL.Types (SourceConfig (..))
|
|
import Hasura.Base.Error
|
|
import Hasura.EncJSON
|
|
import Hasura.Prelude
|
|
import Hasura.RQL.DDL.Schema (RunSQLRes (..))
|
|
import Hasura.RQL.Types
|
|
|
|
data RunSQL = RunSQL
|
|
{ _Sql :: !Text,
|
|
_Source :: !SourceName
|
|
}
|
|
deriving (Show, Eq)
|
|
|
|
$(deriveJSON hasuraJSON ''RunSQL)
|
|
|
|
runSQL :: (MonadIO m, CacheRWM m, MonadError QErr m, MetadataM m) => RunSQL -> m EncJSON
|
|
runSQL (RunSQL sql source) = do
|
|
pool <- scConnectionPool <$> askSourceConfig @'MySQL source
|
|
result :: [[Maybe ByteString]] <- liftIO $
|
|
withResource pool $ \conn -> do
|
|
query conn (fromString . T.unpack $ sql)
|
|
r <- storeResult conn
|
|
fieldNames <- fmap (Just . fieldName) <$> fetchFields r -- fieldNames as Maybes for convenience
|
|
rows <- fetchAllRows r
|
|
pure (fieldNames : rows)
|
|
pure . encJFromJValue $
|
|
if null result
|
|
then RunSQLRes "CommandOK" J.Null
|
|
else RunSQLRes "TuplesOk" . J.toJSON . (fmap . fmap . fmap) (decodeUtf8With lenientDecode) $ result
|