2019-11-26 15:14:21 +03:00
|
|
|
{-# LANGUAGE RecordWildCards #-}
|
2018-06-27 16:11:32 +03:00
|
|
|
|
2019-11-26 15:14:21 +03:00
|
|
|
module Main where
|
2019-03-12 08:46:27 +03:00
|
|
|
|
2020-07-14 22:00:58 +03:00
|
|
|
import Control.Exception
|
2020-09-08 21:13:35 +03:00
|
|
|
import Data.Int (Int64)
|
2020-01-23 00:55:55 +03:00
|
|
|
import Data.Text.Conversions (convertText)
|
2020-11-24 09:10:04 +03:00
|
|
|
import Data.Time.Clock (getCurrentTime)
|
2020-09-08 21:13:35 +03:00
|
|
|
import Data.Time.Clock.POSIX (getPOSIXTime)
|
2020-01-23 00:55:55 +03:00
|
|
|
|
2019-11-26 15:14:21 +03:00
|
|
|
import Hasura.App
|
2020-11-24 09:10:04 +03:00
|
|
|
import Hasura.Logging (Hasura, LogLevel (..), defaultEnabledEngineLogTypes)
|
2020-12-14 07:30:19 +03:00
|
|
|
import Hasura.Metadata.Class
|
2018-06-27 16:11:32 +03:00
|
|
|
import Hasura.Prelude
|
2019-11-20 21:21:30 +03:00
|
|
|
import Hasura.RQL.DDL.Schema
|
2019-10-21 19:01:05 +03:00
|
|
|
import Hasura.RQL.Types
|
2018-06-27 16:11:32 +03:00
|
|
|
import Hasura.Server.Init
|
2020-02-07 14:03:12 +03:00
|
|
|
import Hasura.Server.Migrate (downgradeCatalog, dropCatalog)
|
2019-11-26 15:14:21 +03:00
|
|
|
import Hasura.Server.Version
|
2018-06-27 16:11:32 +03:00
|
|
|
|
2020-07-14 22:00:58 +03:00
|
|
|
import qualified Data.ByteString.Char8 as BC
|
2019-11-26 15:14:21 +03:00
|
|
|
import qualified Data.ByteString.Lazy as BL
|
|
|
|
import qualified Data.ByteString.Lazy.Char8 as BLC
|
2020-07-14 22:00:58 +03:00
|
|
|
import qualified Data.Environment as Env
|
2019-11-26 15:14:21 +03:00
|
|
|
import qualified Database.PG.Query as Q
|
2020-07-15 13:40:48 +03:00
|
|
|
import qualified Hasura.Tracing as Tracing
|
2020-07-14 22:00:58 +03:00
|
|
|
import qualified System.Exit as Sys
|
2020-10-30 21:55:53 +03:00
|
|
|
import qualified System.Metrics as EKG
|
2020-11-12 12:25:48 +03:00
|
|
|
import qualified System.Posix.Signals as Signals
|
2020-08-18 22:53:12 +03:00
|
|
|
|
2019-03-12 08:46:27 +03:00
|
|
|
|
2018-06-27 16:11:32 +03:00
|
|
|
main :: IO ()
|
2020-07-14 22:00:58 +03:00
|
|
|
main = do
|
|
|
|
tryExit $ do
|
|
|
|
args <- parseArgs
|
|
|
|
env <- Env.getEnvironment
|
2020-11-25 13:56:44 +03:00
|
|
|
runApp env args
|
2020-07-14 22:00:58 +03:00
|
|
|
where
|
|
|
|
tryExit io = try io >>= \case
|
|
|
|
Left (ExitException _code msg) -> BC.putStrLn msg >> Sys.exitFailure
|
|
|
|
Right r -> return r
|
2018-07-27 12:34:50 +03:00
|
|
|
|
2020-11-25 13:56:44 +03:00
|
|
|
runApp :: Env.Environment -> HGEOptions Hasura -> IO ()
|
2020-11-24 09:10:04 +03:00
|
|
|
runApp env (HGEOptionsG rci hgeCmd) = do
|
|
|
|
initTime <- liftIO getCurrentTime
|
|
|
|
globalCtx@GlobalCtx{..} <- initGlobalCtx rci
|
|
|
|
|
2020-07-14 22:00:58 +03:00
|
|
|
withVersion $$(getVersionFromEnvironment) $ case hgeCmd of
|
2019-11-26 15:14:21 +03:00
|
|
|
HCServe serveOptions -> do
|
2020-11-24 09:10:04 +03:00
|
|
|
serveCtx <- initialiseServeCtx env globalCtx serveOptions
|
2020-11-12 12:25:48 +03:00
|
|
|
|
2020-09-08 19:19:52 +03:00
|
|
|
ekgStore <- liftIO do
|
|
|
|
s <- EKG.newStore
|
|
|
|
EKG.registerGcMetrics s
|
2020-11-12 12:25:48 +03:00
|
|
|
|
2020-09-08 21:13:35 +03:00
|
|
|
let getTimeMs :: IO Int64
|
|
|
|
getTimeMs = (round . (* 1000)) `fmap` getPOSIXTime
|
|
|
|
|
|
|
|
EKG.registerCounter "ekg.server_timestamp_ms" getTimeMs s
|
2020-09-08 19:19:52 +03:00
|
|
|
pure s
|
2020-11-12 12:25:48 +03:00
|
|
|
|
2020-07-14 22:00:58 +03:00
|
|
|
let shutdownApp = return ()
|
2020-07-16 16:19:42 +03:00
|
|
|
-- Catches the SIGTERM signal and initiates a graceful shutdown.
|
2020-06-16 20:44:59 +03:00
|
|
|
-- Graceful shutdown for regular HTTP requests is already implemented in
|
2020-06-03 00:27:14 +03:00
|
|
|
-- Warp, and is triggered by invoking the 'closeSocket' callback.
|
2020-06-16 20:44:59 +03:00
|
|
|
-- We only catch the SIGTERM signal once, that is, if the user hits CTRL-C
|
2020-06-03 00:27:14 +03:00
|
|
|
-- once again, we terminate the process immediately.
|
|
|
|
_ <- liftIO $ Signals.installHandler
|
|
|
|
Signals.sigTERM
|
2020-11-24 09:10:04 +03:00
|
|
|
(Signals.CatchOnce (shutdownGracefully $ _scShutdownLatch serveCtx))
|
2020-06-03 00:27:14 +03:00
|
|
|
Nothing
|
2020-12-02 09:16:05 +03:00
|
|
|
serverMetrics <- liftIO $ createServerMetrics ekgStore
|
2020-11-25 13:56:44 +03:00
|
|
|
flip runPGMetadataStorageApp (_scPgPool serveCtx) $
|
2020-12-02 09:16:05 +03:00
|
|
|
runHGEServer env serveOptions serveCtx Nothing initTime shutdownApp Nothing serverMetrics ekgStore
|
2020-07-14 22:00:58 +03:00
|
|
|
|
2018-12-19 14:38:33 +03:00
|
|
|
HCExport -> do
|
2020-12-08 17:22:31 +03:00
|
|
|
res <- runTxWithMinimalPool _gcConnInfo fetchMetadataFromCatalog
|
2020-07-14 22:00:58 +03:00
|
|
|
either (printErrJExit MetadataExportError) printJSON res
|
2019-01-02 14:24:17 +03:00
|
|
|
|
2018-12-19 14:38:33 +03:00
|
|
|
HCClean -> do
|
2020-11-24 09:10:04 +03:00
|
|
|
res <- runTxWithMinimalPool _gcConnInfo dropCatalog
|
|
|
|
let cleanSuccessMsg = "successfully cleaned graphql-engine related data"
|
|
|
|
either (printErrJExit MetadataCleanError) (const $ liftIO $ putStrLn cleanSuccessMsg) res
|
2019-01-02 14:24:17 +03:00
|
|
|
|
2018-12-19 14:38:33 +03:00
|
|
|
HCExecute -> do
|
2019-11-26 15:14:21 +03:00
|
|
|
queryBs <- liftIO BL.getContents
|
2019-04-17 19:29:39 +03:00
|
|
|
let sqlGenCtx = SQLGenCtx False
|
2020-11-24 09:10:04 +03:00
|
|
|
pool <- mkMinimalPool _gcConnInfo
|
2020-12-14 07:30:19 +03:00
|
|
|
res <- flip runPGMetadataStorageApp pool $
|
|
|
|
runMetadataStorageT $ liftEitherM $
|
2020-12-21 12:11:37 +03:00
|
|
|
runAsAdmin pool sqlGenCtx RemoteSchemaPermsDisabled _gcHttpManager $ do
|
2020-12-14 07:30:19 +03:00
|
|
|
metadata <- liftTx fetchMetadataFromCatalog
|
|
|
|
schemaCache <- buildRebuildableSchemaCache env metadata
|
|
|
|
execQuery env queryBs
|
|
|
|
& Tracing.runTraceTWithReporter Tracing.noReporter "execute"
|
|
|
|
& runMetadataT metadata
|
|
|
|
& runCacheRWT schemaCache
|
|
|
|
& fmap (\((res, _), _, _) -> res)
|
2020-07-14 22:00:58 +03:00
|
|
|
either (printErrJExit ExecuteProcessError) (liftIO . BLC.putStrLn) res
|
2019-01-28 16:55:28 +03:00
|
|
|
|
2020-02-07 14:03:12 +03:00
|
|
|
HCDowngrade opts -> do
|
2020-11-24 09:10:04 +03:00
|
|
|
res <- runTxWithMinimalPool _gcConnInfo $ downgradeCatalog opts initTime
|
2020-07-14 22:00:58 +03:00
|
|
|
either (printErrJExit DowngradeProcessError) (liftIO . print) res
|
2020-02-07 14:03:12 +03:00
|
|
|
|
2020-01-23 00:55:55 +03:00
|
|
|
HCVersion -> liftIO $ putStrLn $ "Hasura GraphQL Engine: " ++ convertText currentVersion
|
2019-11-26 15:14:21 +03:00
|
|
|
where
|
2020-11-24 09:10:04 +03:00
|
|
|
runTxWithMinimalPool connInfo tx = do
|
|
|
|
minimalPool <- mkMinimalPool connInfo
|
|
|
|
liftIO $ runExceptT $ Q.runTx minimalPool (Q.ReadCommitted, Nothing) tx
|
|
|
|
|
|
|
|
-- | Generate Postgres pool with single connection.
|
|
|
|
-- It is useful when graphql-engine executes a transaction on database
|
|
|
|
-- and exits in commands other than 'serve'.
|
|
|
|
mkMinimalPool connInfo = do
|
|
|
|
pgLogger <- _lsPgLogger <$> mkLoggers defaultEnabledEngineLogTypes LevelInfo
|
|
|
|
let connParams = Q.defaultConnParams { Q.cpConns = 1 }
|
|
|
|
liftIO $ Q.initPGPool connInfo connParams pgLogger
|