2020-05-27 02:01:03 +03:00
|
|
|
{-# OPTIONS_GHC -Wwarn #-}
|
|
|
|
|
2020-01-23 07:16:09 +03:00
|
|
|
{-|
|
2020-05-22 21:12:28 +03:00
|
|
|
Top-Level Pier Management
|
2020-01-23 07:16:09 +03:00
|
|
|
|
2020-05-22 21:12:28 +03:00
|
|
|
This is the code that starts the IO drivers and deals with
|
|
|
|
communication between the serf, the log, and the IO drivers.
|
2020-01-23 07:16:09 +03:00
|
|
|
-}
|
2020-01-24 08:28:38 +03:00
|
|
|
module Urbit.Vere.Pier
|
2020-05-27 02:01:03 +03:00
|
|
|
( booted
|
|
|
|
, runSerf
|
|
|
|
, resumed
|
|
|
|
, getSnapshot
|
|
|
|
, pier
|
|
|
|
, runPersist
|
|
|
|
, runCompute
|
|
|
|
, generateBootSeq
|
|
|
|
)
|
|
|
|
where
|
2019-05-30 23:19:26 +03:00
|
|
|
|
2020-01-24 08:28:38 +03:00
|
|
|
import Urbit.Prelude
|
2019-07-24 04:34:16 +03:00
|
|
|
|
2020-05-13 22:35:57 +03:00
|
|
|
import Control.Monad.Trans.Maybe
|
2019-09-17 21:19:53 +03:00
|
|
|
import RIO.Directory
|
2020-01-24 08:28:38 +03:00
|
|
|
import Urbit.Arvo
|
|
|
|
import Urbit.King.Config
|
|
|
|
import Urbit.Vere.Pier.Types
|
|
|
|
|
|
|
|
import Data.Text (append)
|
|
|
|
import System.Posix.Files (ownerModes, setFileMode)
|
2020-06-01 01:04:56 +03:00
|
|
|
import Urbit.King.App (HasKingEnv, HasPierEnv(..), PierEnv)
|
2020-01-24 08:28:38 +03:00
|
|
|
import Urbit.Vere.Ames (ames)
|
|
|
|
import Urbit.Vere.Behn (behn)
|
|
|
|
import Urbit.Vere.Clay (clay)
|
2020-05-08 21:29:18 +03:00
|
|
|
import Urbit.Vere.Eyre (eyre)
|
2020-05-11 23:42:30 +03:00
|
|
|
import Urbit.Vere.Eyre.Multi (MultiEyreApi)
|
2020-01-24 08:28:38 +03:00
|
|
|
import Urbit.Vere.Http.Client (client)
|
|
|
|
import Urbit.Vere.Log (EventLog)
|
2020-06-01 01:04:56 +03:00
|
|
|
import Urbit.Vere.Serf (ComputeRequest(..), EvErr(..), Serf, SpinState)
|
2019-06-19 01:38:24 +03:00
|
|
|
|
2020-02-15 11:21:55 +03:00
|
|
|
import qualified System.Entropy as Ent
|
|
|
|
import qualified Urbit.King.API as King
|
|
|
|
import qualified Urbit.Time as Time
|
|
|
|
import qualified Urbit.Vere.Log as Log
|
|
|
|
import qualified Urbit.Vere.Serf as Serf
|
|
|
|
import qualified Urbit.Vere.Term as Term
|
|
|
|
import qualified Urbit.Vere.Term.API as Term
|
|
|
|
import qualified Urbit.Vere.Term.Demux as Term
|
|
|
|
import qualified Urbit.Vere.Term.Render as Term
|
2019-05-30 23:19:26 +03:00
|
|
|
|
2019-06-18 02:47:20 +03:00
|
|
|
|
2019-06-25 04:10:41 +03:00
|
|
|
--------------------------------------------------------------------------------
|
2019-06-18 02:47:20 +03:00
|
|
|
|
2019-08-28 14:45:49 +03:00
|
|
|
setupPierDirectory :: FilePath -> RIO e ()
|
2019-08-15 05:42:48 +03:00
|
|
|
setupPierDirectory shipPath = do
|
2020-05-22 21:12:28 +03:00
|
|
|
for_ ["put", "get", "log", "chk"] $ \seg -> do
|
|
|
|
let pax = shipPath <> "/.urb/" <> seg
|
|
|
|
createDirectoryIfMissing True pax
|
|
|
|
io $ setFileMode pax ownerModes
|
2019-07-21 04:29:39 +03:00
|
|
|
|
2019-06-18 02:47:20 +03:00
|
|
|
|
2019-07-21 22:56:18 +03:00
|
|
|
-- Load pill into boot sequence. -----------------------------------------------
|
2019-07-16 03:01:45 +03:00
|
|
|
|
2019-08-28 14:45:49 +03:00
|
|
|
genEntropy :: RIO e Word512
|
2020-01-23 12:22:30 +03:00
|
|
|
genEntropy = fromIntegral . bytesAtom <$> io (Ent.getEntropy 64)
|
2019-07-16 03:01:45 +03:00
|
|
|
|
2019-10-03 21:31:15 +03:00
|
|
|
generateBootSeq :: Ship -> Pill -> Bool -> LegacyBootEvent -> RIO e BootSeq
|
2020-05-22 21:12:28 +03:00
|
|
|
generateBootSeq ship Pill {..} lite boot = do
|
|
|
|
ent <- genEntropy
|
|
|
|
let ovums = preKern ent <> pKernelOvums <> postKern <> pUserspaceOvums
|
|
|
|
pure $ BootSeq ident pBootFormulas ovums
|
|
|
|
where
|
|
|
|
ident = LogIdentity ship isFake (fromIntegral $ length pBootFormulas)
|
|
|
|
preKern ent =
|
|
|
|
[ EvBlip $ BlipEvArvo $ ArvoEvWhom () ship
|
|
|
|
, EvBlip $ BlipEvArvo $ ArvoEvWack () ent
|
|
|
|
]
|
|
|
|
postKern = [EvBlip $ BlipEvTerm $ TermEvBoot (1, ()) lite boot]
|
|
|
|
isFake = case boot of
|
|
|
|
Fake _ -> True
|
|
|
|
_ -> False
|
2019-07-16 03:01:45 +03:00
|
|
|
|
|
|
|
|
2019-07-21 22:56:18 +03:00
|
|
|
-- Write a batch of jobs into the event log ------------------------------------
|
2019-07-19 03:52:53 +03:00
|
|
|
|
2019-08-28 14:45:49 +03:00
|
|
|
writeJobs :: EventLog -> Vector Job -> RIO e ()
|
2019-07-19 03:52:53 +03:00
|
|
|
writeJobs log !jobs = do
|
2020-05-22 21:12:28 +03:00
|
|
|
expect <- Log.nextEv log
|
|
|
|
events <- fmap fromList $ traverse fromJob (zip [expect ..] $ toList jobs)
|
|
|
|
Log.appendEvents log events
|
|
|
|
where
|
|
|
|
fromJob :: (EventId, Job) -> RIO e ByteString
|
|
|
|
fromJob (expectedId, job) = do
|
|
|
|
unless (expectedId == jobId job) $ error $ show
|
|
|
|
("bad job id!", expectedId, jobId job)
|
|
|
|
pure $ jamBS $ jobPayload job
|
2019-07-21 04:29:39 +03:00
|
|
|
|
2020-05-22 21:12:28 +03:00
|
|
|
jobPayload :: Job -> Noun
|
|
|
|
jobPayload (RunNok (LifeCyc _ m n)) = toNoun (m, n)
|
|
|
|
jobPayload (DoWork (Work _ m d o )) = toNoun (m, d, o)
|
2019-07-19 03:52:53 +03:00
|
|
|
|
2019-06-29 04:46:33 +03:00
|
|
|
|
2019-07-21 22:56:18 +03:00
|
|
|
-- Boot a new ship. ------------------------------------------------------------
|
|
|
|
|
2020-05-28 21:56:51 +03:00
|
|
|
printTank :: (Text -> IO ()) -> Atom -> Tank -> IO ()
|
|
|
|
printTank f _ = io . f . unlines . fmap unTape . wash (WashCfg 0 80)
|
|
|
|
|
|
|
|
runSerf
|
|
|
|
:: HasLogFunc e
|
|
|
|
=> TVar (Text -> IO ())
|
|
|
|
-> FilePath
|
|
|
|
-> [Serf.Flag]
|
|
|
|
-> RAcquire e Serf
|
|
|
|
runSerf vSlog pax fax = do
|
|
|
|
env <- ask
|
|
|
|
Serf.withSerf (config env)
|
2020-05-27 02:01:03 +03:00
|
|
|
where
|
2020-05-28 21:56:51 +03:00
|
|
|
slog txt = join $ atomically (readTVar vSlog >>= pure . ($ txt))
|
|
|
|
config env = Serf.Config
|
|
|
|
{ scSerf = "urbit-worker" -- TODO Find the executable in some proper way.
|
2020-05-27 02:01:03 +03:00
|
|
|
, scPier = pax
|
|
|
|
, scFlag = fax
|
2020-05-28 21:56:51 +03:00
|
|
|
, scSlog = \(pri, tank) -> printTank slog pri tank
|
|
|
|
, scStdr = \line -> runRIO env $ logTrace (display ("SERF: " <> line))
|
|
|
|
, scDead = pure () -- TODO: What can be done?
|
2020-05-27 02:01:03 +03:00
|
|
|
}
|
2019-07-21 22:56:18 +03:00
|
|
|
|
2020-05-22 21:12:28 +03:00
|
|
|
booted
|
2020-05-30 03:15:16 +03:00
|
|
|
:: TVar (Text -> IO ())
|
|
|
|
-> Pill
|
2020-05-22 21:12:28 +03:00
|
|
|
-> Bool
|
2020-05-30 03:15:16 +03:00
|
|
|
-> [Serf.Flag]
|
2020-05-22 21:12:28 +03:00
|
|
|
-> Ship
|
|
|
|
-> LegacyBootEvent
|
2020-05-30 03:15:16 +03:00
|
|
|
-> RAcquire PierEnv (Serf, EventLog)
|
|
|
|
booted vSlog pill lite flags ship boot = do
|
|
|
|
rio $ bootNewShip pill lite flags ship boot
|
|
|
|
resumed vSlog Nothing flags
|
2019-08-15 05:42:48 +03:00
|
|
|
|
2020-05-27 02:01:03 +03:00
|
|
|
bootSeqJobs :: Time.Wen -> BootSeq -> [Job]
|
|
|
|
bootSeqJobs now (BootSeq ident nocks ovums) = zipWith ($) bootSeqFns [1 ..]
|
|
|
|
where
|
|
|
|
wen :: EventId -> Time.Wen
|
|
|
|
wen off = Time.addGap now ((fromIntegral off - 1) ^. from Time.microSecs)
|
|
|
|
|
|
|
|
bootSeqFns :: [EventId -> Job]
|
|
|
|
bootSeqFns = fmap muckNock nocks <> fmap muckOvum ovums
|
|
|
|
where
|
|
|
|
muckNock nok eId = RunNok $ LifeCyc eId 0 nok
|
|
|
|
muckOvum ov eId = DoWork $ Work eId 0 (wen eId) ov
|
|
|
|
|
|
|
|
bootNewShip
|
2020-05-30 03:15:16 +03:00
|
|
|
:: HasPierEnv e
|
2020-05-27 02:01:03 +03:00
|
|
|
=> Pill
|
|
|
|
-> Bool
|
|
|
|
-> [Serf.Flag]
|
|
|
|
-> Ship
|
|
|
|
-> LegacyBootEvent
|
|
|
|
-> RIO e ()
|
|
|
|
bootNewShip pill lite flags ship bootEv = do
|
|
|
|
seq@(BootSeq ident x y) <- generateBootSeq ship pill lite bootEv
|
|
|
|
logTrace "BootSeq Computed"
|
2019-08-15 05:42:48 +03:00
|
|
|
|
2019-12-17 17:31:50 +03:00
|
|
|
pierPath <- view pierPathL
|
2019-10-18 01:32:06 +03:00
|
|
|
|
2019-08-28 14:45:49 +03:00
|
|
|
liftRIO (setupPierDirectory pierPath)
|
2020-05-27 02:01:03 +03:00
|
|
|
logTrace "Directory setup."
|
2019-08-15 05:42:48 +03:00
|
|
|
|
2020-05-27 02:01:03 +03:00
|
|
|
rwith (Log.new (pierPath <> "/.urb/log") ident) $ \log -> do
|
|
|
|
logTrace "Event log initialized."
|
|
|
|
jobs <- (\now -> bootSeqJobs now seq) <$> io Time.now
|
|
|
|
writeJobs log (fromList jobs)
|
2019-07-21 22:56:18 +03:00
|
|
|
|
2020-05-27 02:01:03 +03:00
|
|
|
logTrace "Finsihed populating event log with boot sequence"
|
2019-08-15 05:42:48 +03:00
|
|
|
|
2019-07-21 22:56:18 +03:00
|
|
|
|
|
|
|
-- Resume an existing ship. ----------------------------------------------------
|
|
|
|
|
2020-05-27 02:01:03 +03:00
|
|
|
resumed
|
2020-05-30 03:15:16 +03:00
|
|
|
:: TVar (Text -> IO ())
|
2020-05-28 21:56:51 +03:00
|
|
|
-> Maybe Word64
|
2020-05-27 02:01:03 +03:00
|
|
|
-> [Serf.Flag]
|
2020-05-30 03:15:16 +03:00
|
|
|
-> RAcquire PierEnv (Serf, EventLog)
|
2020-05-28 21:56:51 +03:00
|
|
|
resumed vSlog replayUntil flags = do
|
2020-05-27 02:01:03 +03:00
|
|
|
rio $ logTrace "Resuming ship"
|
|
|
|
top <- view pierPathL
|
|
|
|
tap <- fmap (fromMaybe top) $ rio $ runMaybeT $ do
|
|
|
|
ev <- MaybeT (pure replayUntil)
|
|
|
|
MaybeT (getSnapshot top ev)
|
2020-02-06 02:20:32 +03:00
|
|
|
|
2020-05-27 02:01:03 +03:00
|
|
|
rio $ logTrace $ display @Text ("pier: " <> pack top)
|
|
|
|
rio $ logTrace $ display @Text ("running serf in: " <> pack tap)
|
2020-02-06 02:20:32 +03:00
|
|
|
|
2020-05-28 21:56:51 +03:00
|
|
|
log <- Log.existing (top <> "/.urb/log")
|
|
|
|
serf <- runSerf vSlog tap flags
|
2019-07-21 22:56:18 +03:00
|
|
|
|
2020-05-27 02:01:03 +03:00
|
|
|
rio $ do
|
|
|
|
logTrace "Replaying events"
|
|
|
|
Serf.execReplay serf log replayUntil
|
|
|
|
logTrace "Taking snapshot"
|
2020-05-29 05:14:25 +03:00
|
|
|
io (Serf.snapshot serf)
|
2020-05-27 02:01:03 +03:00
|
|
|
logTrace "Shuting down the serf"
|
2019-07-21 22:56:18 +03:00
|
|
|
|
2020-05-27 02:01:03 +03:00
|
|
|
pure (serf, log)
|
2019-07-21 22:56:18 +03:00
|
|
|
|
2020-01-25 03:20:13 +03:00
|
|
|
getSnapshot :: forall e. FilePath -> Word64 -> RIO e (Maybe FilePath)
|
2020-01-11 01:07:29 +03:00
|
|
|
getSnapshot top last = do
|
2020-01-25 03:20:13 +03:00
|
|
|
lastSnapshot <- lastMay <$> listReplays
|
|
|
|
pure (replayToPath <$> lastSnapshot)
|
|
|
|
where
|
|
|
|
replayDir = top </> ".partial-replay"
|
|
|
|
replayToPath eId = replayDir </> show eId
|
|
|
|
|
|
|
|
listReplays :: RIO e [Word64]
|
|
|
|
listReplays = do
|
|
|
|
createDirectoryIfMissing True replayDir
|
|
|
|
snapshotNums <- mapMaybe readMay <$> listDirectory replayDir
|
|
|
|
pure $ sort (filter (<= fromIntegral last) snapshotNums)
|
2020-01-11 01:07:29 +03:00
|
|
|
|
2019-07-21 22:56:18 +03:00
|
|
|
|
2019-06-29 04:46:33 +03:00
|
|
|
-- Run Pier --------------------------------------------------------------------
|
|
|
|
|
2019-09-18 09:59:07 +03:00
|
|
|
acquireWorker :: RIO e () -> RAcquire e (Async ())
|
2019-09-18 20:55:21 +03:00
|
|
|
acquireWorker act = mkRAcquire (async act) cancel
|
2019-09-18 09:59:07 +03:00
|
|
|
|
2020-05-27 03:08:07 +03:00
|
|
|
acquireWorkerBound :: RIO e () -> RAcquire e (Async ())
|
|
|
|
acquireWorkerBound act = mkRAcquire (asyncBound act) cancel
|
|
|
|
|
2020-05-13 22:35:57 +03:00
|
|
|
pier
|
2020-05-30 03:15:16 +03:00
|
|
|
:: (Serf, EventLog)
|
|
|
|
-> TVar (Text -> IO ())
|
2020-05-13 22:35:57 +03:00
|
|
|
-> MVar ()
|
|
|
|
-> MultiEyreApi
|
2020-05-30 03:15:16 +03:00
|
|
|
-> RAcquire PierEnv ()
|
|
|
|
pier (serf, log) vSlog mStart multi = do
|
2019-09-18 08:22:19 +03:00
|
|
|
computeQ <- newTQueueIO
|
|
|
|
persistQ <- newTQueueIO
|
|
|
|
executeQ <- newTQueueIO
|
|
|
|
saveM <- newEmptyTMVarIO
|
|
|
|
shutdownM <- newEmptyTMVarIO
|
2019-06-01 01:55:21 +03:00
|
|
|
|
2020-05-27 03:08:07 +03:00
|
|
|
kapi <- King.kingAPI
|
2019-12-17 21:06:20 +03:00
|
|
|
|
|
|
|
termApiQ <- atomically $ do
|
|
|
|
q <- newTQueue
|
|
|
|
writeTVar (King.kTermConn kapi) (Just $ writeTQueue q)
|
|
|
|
pure q
|
2019-12-17 19:55:10 +03:00
|
|
|
|
2019-09-10 23:31:18 +03:00
|
|
|
let shutdownEvent = putTMVar shutdownM ()
|
|
|
|
|
2019-12-17 14:29:58 +03:00
|
|
|
-- (sz, local) <- Term.localClient
|
2019-09-18 09:17:54 +03:00
|
|
|
|
2019-12-17 21:06:20 +03:00
|
|
|
-- (waitExternalTerm, termServPort) <- Term.termServer
|
2019-09-18 09:59:07 +03:00
|
|
|
|
|
|
|
(demux, muxed) <- atomically $ do
|
2019-09-18 09:17:54 +03:00
|
|
|
res <- Term.mkDemux
|
2019-12-17 14:29:58 +03:00
|
|
|
-- Term.addDemux local res
|
2019-09-18 09:59:07 +03:00
|
|
|
pure (res, Term.useDemux res)
|
|
|
|
|
2019-12-17 21:06:20 +03:00
|
|
|
-- rio $ logInfo $ display $
|
|
|
|
-- "TERMSERV Terminal Server running on port: " <> tshow termServPort
|
2019-09-18 09:59:07 +03:00
|
|
|
|
2019-12-17 21:06:20 +03:00
|
|
|
acquireWorker $ forever $ do
|
2020-05-28 21:56:51 +03:00
|
|
|
logTrace "TERMSERV Waiting for external terminal."
|
|
|
|
atomically $ do
|
|
|
|
ext <- Term.connClient <$> readTQueue termApiQ
|
|
|
|
Term.addDemux ext demux
|
|
|
|
logTrace "TERMSERV External terminal connected."
|
|
|
|
|
|
|
|
-- Slogs go to both stderr and to the terminal.
|
|
|
|
atomically $ do
|
|
|
|
oldSlog <- readTVar vSlog
|
|
|
|
writeTVar vSlog $ \txt -> do
|
|
|
|
atomically $ Term.trace muxed txt
|
|
|
|
oldSlog txt
|
2019-09-04 01:17:20 +03:00
|
|
|
|
2019-10-09 02:18:52 +03:00
|
|
|
let logId = Log.identity log
|
|
|
|
let ship = who logId
|
2019-06-19 01:38:24 +03:00
|
|
|
|
2019-10-12 00:05:25 +03:00
|
|
|
-- Our call above to set the logging function which echos errors from the
|
|
|
|
-- Serf doesn't have the appended \r\n because those \r\n s are added in
|
|
|
|
-- the c serf code. Logging output from our haskell process must manually
|
|
|
|
-- add them.
|
|
|
|
let showErr = atomically . Term.trace muxed . (flip append "\r\n")
|
2020-05-13 22:35:57 +03:00
|
|
|
|
|
|
|
env <- ask
|
|
|
|
|
2019-08-01 05:34:14 +03:00
|
|
|
let (bootEvents, startDrivers) =
|
2020-05-13 22:35:57 +03:00
|
|
|
drivers env multi ship (isFake logId)
|
2019-09-18 09:17:54 +03:00
|
|
|
(writeTQueue computeQ)
|
|
|
|
shutdownEvent
|
2020-02-15 11:21:55 +03:00
|
|
|
(Term.TSize{tsWide=80, tsTall=24}, muxed)
|
2019-10-12 00:05:25 +03:00
|
|
|
showErr
|
2019-06-19 01:38:24 +03:00
|
|
|
|
2019-09-10 23:31:18 +03:00
|
|
|
io $ atomically $ for_ bootEvents (writeTQueue computeQ)
|
2019-06-19 01:38:24 +03:00
|
|
|
|
2020-05-27 02:01:03 +03:00
|
|
|
let stubErrCallback = \_ -> pure ()
|
|
|
|
|
2020-05-28 21:21:43 +03:00
|
|
|
let computeConfig = ComputeConfig
|
2020-05-29 05:14:25 +03:00
|
|
|
{ ccOnWork = (\x -> EvErr x stubErrCallback) <$> readTQueue computeQ
|
2020-05-28 21:21:43 +03:00
|
|
|
, ccOnKill = takeTMVar shutdownM
|
|
|
|
, ccOnSave = takeTMVar saveM
|
|
|
|
, ccPutResult = writeTQueue persistQ
|
|
|
|
, ccShowSpinner = Term.spin muxed
|
|
|
|
, ccHideSpinner = Term.stopSpin muxed
|
|
|
|
}
|
|
|
|
|
|
|
|
tExe <- startDrivers >>= acquireWorker . router (readTQueue executeQ)
|
|
|
|
tDisk <- acquireWorkerBound (runPersist log persistQ (writeTQueue executeQ))
|
|
|
|
tCpu <- acquireWorker (runCompute serf computeConfig)
|
2019-07-20 06:00:23 +03:00
|
|
|
|
2019-09-10 23:31:18 +03:00
|
|
|
tSaveSignal <- saveSignalThread saveM
|
2019-09-06 22:59:56 +03:00
|
|
|
|
2020-01-11 03:39:31 +03:00
|
|
|
putMVar mStart ()
|
|
|
|
|
2019-08-01 08:16:02 +03:00
|
|
|
-- Wait for something to die.
|
2019-07-20 06:00:23 +03:00
|
|
|
|
2019-08-01 08:16:02 +03:00
|
|
|
let ded = asum [ death "effect thread" tExe
|
|
|
|
, death "persist thread" tDisk
|
|
|
|
, death "compute thread" tCpu
|
|
|
|
]
|
|
|
|
|
|
|
|
atomically ded >>= \case
|
2019-08-28 14:45:49 +03:00
|
|
|
Left (txt, exn) -> logError $ displayShow ("Somthing died", txt, exn)
|
2020-05-01 00:51:28 +03:00
|
|
|
Right tag -> logError $ displayShow ("Something simply exited", tag)
|
2019-08-01 08:16:02 +03:00
|
|
|
|
2019-09-20 01:40:23 +03:00
|
|
|
atomically $ (Term.spin muxed) (Just "shutdown")
|
|
|
|
|
|
|
|
|
2019-08-01 08:16:02 +03:00
|
|
|
death :: Text -> Async () -> STM (Either (Text, SomeException) Text)
|
|
|
|
death tag tid = do
|
|
|
|
waitCatchSTM tid <&> \case
|
2020-05-27 03:08:07 +03:00
|
|
|
Left exn -> Left (tag, exn)
|
|
|
|
Right () -> Right tag
|
2019-07-21 22:56:18 +03:00
|
|
|
|
2019-09-10 23:31:18 +03:00
|
|
|
saveSignalThread :: TMVar () -> RAcquire e (Async ())
|
|
|
|
saveSignalThread tm = mkRAcquire start cancel
|
2020-05-27 03:08:07 +03:00
|
|
|
where
|
|
|
|
start = async $ forever $ do
|
|
|
|
threadDelay (120 * 1000000) -- 120 seconds
|
|
|
|
atomically $ putTMVar tm ()
|
2019-09-06 22:59:56 +03:00
|
|
|
|
2020-05-27 02:01:03 +03:00
|
|
|
|
2019-08-01 05:34:14 +03:00
|
|
|
-- Start All Drivers -----------------------------------------------------------
|
2019-07-21 22:56:18 +03:00
|
|
|
|
2019-08-29 03:26:59 +03:00
|
|
|
data Drivers e = Drivers
|
|
|
|
{ dAmes :: EffCb e AmesEf
|
|
|
|
, dBehn :: EffCb e BehnEf
|
|
|
|
, dHttpClient :: EffCb e HttpClientEf
|
|
|
|
, dHttpServer :: EffCb e HttpServerEf
|
|
|
|
, dNewt :: EffCb e NewtEf
|
|
|
|
, dSync :: EffCb e SyncEf
|
|
|
|
, dTerm :: EffCb e TermEf
|
2019-08-01 05:34:14 +03:00
|
|
|
}
|
2019-07-21 22:56:18 +03:00
|
|
|
|
2020-05-11 23:42:30 +03:00
|
|
|
drivers
|
2020-05-22 21:12:28 +03:00
|
|
|
:: HasPierEnv e
|
2020-05-13 22:35:57 +03:00
|
|
|
=> e
|
2020-05-11 23:42:30 +03:00
|
|
|
-> MultiEyreApi
|
|
|
|
-> Ship
|
|
|
|
-> Bool
|
|
|
|
-> (Ev -> STM ())
|
|
|
|
-> STM ()
|
|
|
|
-> (Term.TSize, Term.Client)
|
|
|
|
-> (Text -> RIO e ())
|
|
|
|
-> ([Ev], RAcquire e (Drivers e))
|
2020-05-13 22:35:57 +03:00
|
|
|
drivers env multi who isFake plan shutdownSTM termSys stderr =
|
2019-08-01 05:34:14 +03:00
|
|
|
(initialEvents, runDrivers)
|
|
|
|
where
|
2020-05-13 22:35:57 +03:00
|
|
|
(behnBorn, runBehn) = behn env plan
|
|
|
|
(amesBorn, runAmes) = ames env who isFake plan stderr
|
|
|
|
(httpBorn, runHttp) = eyre env multi who plan isFake
|
|
|
|
(clayBorn, runClay) = clay env plan
|
|
|
|
(irisBorn, runIris) = client env plan
|
|
|
|
(termBorn, runTerm) = Term.term env termSys shutdownSTM plan
|
2019-09-10 23:14:43 +03:00
|
|
|
initialEvents = mconcat [behnBorn, clayBorn, amesBorn, httpBorn,
|
|
|
|
termBorn, irisBorn]
|
2019-08-01 05:34:14 +03:00
|
|
|
runDrivers = do
|
2019-10-09 01:01:16 +03:00
|
|
|
dNewt <- runAmes
|
2019-08-29 03:26:59 +03:00
|
|
|
dBehn <- liftAcquire $ runBehn
|
2019-08-01 08:16:02 +03:00
|
|
|
dAmes <- pure $ const $ pure ()
|
2019-09-05 23:09:45 +03:00
|
|
|
dHttpClient <- runIris
|
2019-08-08 01:24:02 +03:00
|
|
|
dHttpServer <- runHttp
|
2019-09-10 23:14:43 +03:00
|
|
|
dSync <- runClay
|
2019-09-03 21:02:54 +03:00
|
|
|
dTerm <- runTerm
|
2019-08-01 05:34:14 +03:00
|
|
|
pure (Drivers{..})
|
|
|
|
|
|
|
|
|
|
|
|
-- Route Effects to Drivers ----------------------------------------------------
|
|
|
|
|
2020-05-28 21:21:43 +03:00
|
|
|
router :: HasLogFunc e => STM FX -> Drivers e -> RIO e ()
|
|
|
|
router waitFx Drivers {..} = forever $ do
|
|
|
|
fx <- atomically waitFx
|
|
|
|
for_ fx $ \ef -> do
|
|
|
|
logEffect ef
|
|
|
|
case ef of
|
|
|
|
GoodParse (EfVega _ _ ) -> error "TODO"
|
|
|
|
GoodParse (EfExit _ _ ) -> error "TODO"
|
|
|
|
GoodParse (EfVane (VEAmes ef)) -> dAmes ef
|
|
|
|
GoodParse (EfVane (VEBehn ef)) -> dBehn ef
|
|
|
|
GoodParse (EfVane (VEBoat ef)) -> dSync ef
|
|
|
|
GoodParse (EfVane (VEClay ef)) -> dSync ef
|
|
|
|
GoodParse (EfVane (VEHttpClient ef)) -> dHttpClient ef
|
|
|
|
GoodParse (EfVane (VEHttpServer ef)) -> dHttpServer ef
|
|
|
|
GoodParse (EfVane (VENewt ef)) -> dNewt ef
|
|
|
|
GoodParse (EfVane (VESync ef)) -> dSync ef
|
|
|
|
GoodParse (EfVane (VETerm ef)) -> dTerm ef
|
|
|
|
FailParse n -> logError $ display $ pack @Text (ppShow n)
|
2019-07-21 22:56:18 +03:00
|
|
|
|
2019-08-01 05:34:14 +03:00
|
|
|
|
|
|
|
-- Compute Thread --------------------------------------------------------------
|
|
|
|
|
2019-08-28 14:45:49 +03:00
|
|
|
logEvent :: HasLogFunc e => Ev -> RIO e ()
|
2020-05-28 21:56:51 +03:00
|
|
|
logEvent ev = logDebug $ display $ "[EVENT]\n" <> pretty
|
|
|
|
where
|
|
|
|
pretty :: Text
|
|
|
|
pretty = pack $ unlines $ fmap ("\t" <>) $ lines $ ppShow ev
|
2019-08-28 14:45:49 +03:00
|
|
|
|
|
|
|
logEffect :: HasLogFunc e => Lenient Ef -> RIO e ()
|
2020-05-28 21:56:51 +03:00
|
|
|
logEffect ef = logDebug $ display $ "[EFFECT]\n" <> pretty ef
|
|
|
|
where
|
|
|
|
pretty :: Lenient Ef -> Text
|
|
|
|
pretty = \case
|
|
|
|
GoodParse e -> pack $ unlines $ fmap ("\t" <>) $ lines $ ppShow e
|
|
|
|
FailParse n -> pack $ unlines $ fmap ("\t" <>) $ lines $ ppShow n
|
2019-08-28 14:45:49 +03:00
|
|
|
|
2020-05-27 02:01:03 +03:00
|
|
|
data ComputeConfig = ComputeConfig
|
2020-05-29 05:14:25 +03:00
|
|
|
{ ccOnWork :: STM EvErr
|
2020-05-27 02:01:03 +03:00
|
|
|
, ccOnKill :: STM ()
|
|
|
|
, ccOnSave :: STM ()
|
2020-05-27 03:08:07 +03:00
|
|
|
, ccPutResult :: (Fact, FX) -> STM ()
|
2020-05-27 02:01:03 +03:00
|
|
|
, ccShowSpinner :: Maybe Text -> STM ()
|
|
|
|
, ccHideSpinner :: STM ()
|
|
|
|
}
|
|
|
|
|
2020-05-30 03:15:16 +03:00
|
|
|
runCompute :: forall e . HasKingEnv e => Serf.Serf -> ComputeConfig -> RIO e ()
|
2020-05-28 21:21:43 +03:00
|
|
|
runCompute serf ComputeConfig {..} = do
|
|
|
|
logTrace "runCompute"
|
2020-05-29 05:14:25 +03:00
|
|
|
|
|
|
|
let onCR = asum [ CRKill <$> ccOnKill
|
|
|
|
, CRSave <$> ccOnSave
|
|
|
|
, CRWork <$> ccOnWork
|
|
|
|
]
|
|
|
|
|
|
|
|
let onSpin :: SpinState -> STM ()
|
|
|
|
onSpin Nothing = ccHideSpinner
|
|
|
|
onSpin (Just ev) = ccShowSpinner (getSpinnerNameForEvent ev)
|
|
|
|
|
2020-06-01 01:37:27 +03:00
|
|
|
let maxBatchSize = 10
|
|
|
|
|
|
|
|
io (Serf.running serf maxBatchSize onCR ccPutResult onSpin)
|
2020-05-27 02:01:03 +03:00
|
|
|
|
|
|
|
|
2019-07-20 06:00:23 +03:00
|
|
|
-- Persist Thread --------------------------------------------------------------
|
|
|
|
|
|
|
|
data PersistExn = BadEventId EventId EventId
|
|
|
|
deriving Show
|
|
|
|
|
|
|
|
instance Exception PersistExn where
|
|
|
|
displayException (BadEventId expected got) =
|
|
|
|
unlines [ "Out-of-order event id send to persist thread."
|
|
|
|
, "\tExpected " <> show expected <> " but got " <> show got
|
|
|
|
]
|
|
|
|
|
2020-05-27 03:08:07 +03:00
|
|
|
runPersist
|
|
|
|
:: forall e
|
2020-05-30 03:15:16 +03:00
|
|
|
. HasPierEnv e
|
2020-05-27 03:08:07 +03:00
|
|
|
=> EventLog
|
|
|
|
-> TQueue (Fact, FX)
|
|
|
|
-> (FX -> STM ())
|
2020-05-28 21:21:43 +03:00
|
|
|
-> RIO e ()
|
|
|
|
runPersist log inpQ out = do
|
|
|
|
dryRun <- view dryRunL
|
|
|
|
forever $ do
|
|
|
|
writs <- atomically getBatchFromQueue
|
|
|
|
events <- validateFactsAndGetBytes (fst <$> toNullable writs)
|
|
|
|
unless dryRun (Log.appendEvents log events)
|
|
|
|
atomically $ for_ writs $ \(_, fx) -> do
|
|
|
|
out fx
|
2020-05-27 03:08:07 +03:00
|
|
|
|
2020-05-28 21:21:43 +03:00
|
|
|
where
|
2020-05-27 03:08:07 +03:00
|
|
|
validateFactsAndGetBytes :: [Fact] -> RIO e (Vector ByteString)
|
|
|
|
validateFactsAndGetBytes facts = do
|
|
|
|
expect <- Log.nextEv log
|
|
|
|
lis <- for (zip [expect ..] facts) $ \(expectedId, Fact eve mug wen non) ->
|
|
|
|
do
|
|
|
|
unless (expectedId == eve) $ do
|
|
|
|
throwIO (BadEventId expectedId eve)
|
|
|
|
pure $ jamBS $ toNoun (mug, wen, non)
|
|
|
|
pure (fromList lis)
|
|
|
|
|
|
|
|
getBatchFromQueue :: STM (NonNull [(Fact, FX)])
|
|
|
|
getBatchFromQueue = readTQueue inpQ >>= go . singleton
|
|
|
|
where
|
|
|
|
go acc = tryReadTQueue inpQ >>= \case
|
|
|
|
Nothing -> pure (reverse acc)
|
|
|
|
Just item -> go (item <| acc)
|