mirror of
https://github.com/urbit/shrub.git
synced 2024-12-26 05:23:35 +03:00
king: Event prioritization and error handling for born events.
This commit is contained in:
parent
cc772da03c
commit
c57c3023f9
@ -20,6 +20,8 @@ Bugs:
|
|||||||
|
|
||||||
- [x] `king new` should reject pier directories that already exist.
|
- [x] `king new` should reject pier directories that already exist.
|
||||||
- [x] In non-daemon-mode, ^D doesn't bring down Urbit properly.
|
- [x] In non-daemon-mode, ^D doesn't bring down Urbit properly.
|
||||||
|
- [ ] Spinner updated multiple times with the same event, and this causes
|
||||||
|
logging of events to contain duplicates.
|
||||||
|
|
||||||
King-Haskell specific features:
|
King-Haskell specific features:
|
||||||
|
|
||||||
@ -32,6 +34,10 @@ Performance:
|
|||||||
- [x] Batching during replay.
|
- [x] Batching during replay.
|
||||||
- [x] Batching during normal operation.
|
- [x] Batching during normal operation.
|
||||||
|
|
||||||
|
Optimization:
|
||||||
|
|
||||||
|
- [x] IO Driver Event Prioritization
|
||||||
|
|
||||||
Polish:
|
Polish:
|
||||||
|
|
||||||
- [x] Cleanup batching flow.
|
- [x] Cleanup batching flow.
|
||||||
@ -67,55 +73,14 @@ Polish:
|
|||||||
- [ ] Spin off per-pier logic into it's own package.
|
- [ ] Spin off per-pier logic into it's own package.
|
||||||
- Probably `urbit-pier`
|
- Probably `urbit-pier`
|
||||||
|
|
||||||
# Event Prioritization
|
|
||||||
|
|
||||||
- Instead of each IO driver being passed a TQueue EvErr, each IO driver
|
|
||||||
produces a (STM (Maybe RunReq)).
|
|
||||||
|
|
||||||
- Each driver has it's own event queue that feeds this action.
|
|
||||||
|
|
||||||
- Pier has a thread that pulls from these actions with prioritization.
|
|
||||||
|
|
||||||
- Priority:
|
|
||||||
- If any terminal events are available, send it.
|
|
||||||
- If serf queue is full, abort transaction and retry.
|
|
||||||
- If no terminal events are available, do the same thing with sync driver.
|
|
||||||
- Next, same thing for behn.
|
|
||||||
- Next, same thing for iris.
|
|
||||||
- Next, same thing for ames.
|
|
||||||
- Next, same thing for eyre.
|
|
||||||
|
|
||||||
|
|
||||||
# Better IO Driver Startup Flow Separation
|
|
||||||
|
|
||||||
Should have a io-driver-boot stage.
|
|
||||||
|
|
||||||
- IO drivers do their boot flows.
|
|
||||||
- When they're done, they signal that they're running.
|
|
||||||
- No semantically important communication without outside world can
|
|
||||||
happen until all drivers are up.
|
|
||||||
|
|
||||||
Current IO Driver interface is something like:
|
|
||||||
|
|
||||||
```
|
|
||||||
behn :: KingId -> (EvErr -> STM ()) -> ([EvErr], Acquire (BehnEf -> IO ()))
|
|
||||||
```
|
|
||||||
|
|
||||||
New Interface should be something like:
|
|
||||||
|
|
||||||
```
|
|
||||||
data DriverApi = DriverApi
|
|
||||||
{ eventQueue :: STM (Maybe RunReq)
|
|
||||||
, effectSink :: Effect -> STM ()
|
|
||||||
, blockUntilBorn :: STM ()
|
|
||||||
}
|
|
||||||
|
|
||||||
behn :: HasPierEnv e => RAcquire e DriverApi
|
|
||||||
```
|
|
||||||
|
|
||||||
where `PierEnv` contains `blockUntilAllDriversBorn :: STM ()`.
|
|
||||||
|
|
||||||
# Finding the Serf Executable
|
# Finding the Serf Executable
|
||||||
|
|
||||||
Right now, `urbit-worker` is found by looking it up in the PATH. This
|
Right now, `urbit-worker` is found by looking it up in the PATH. This
|
||||||
is wrong, but what is right?
|
is wrong, but what is right?
|
||||||
|
|
||||||
|
# Further IO Driver Startup Flow Betterment
|
||||||
|
|
||||||
|
- Implement Pier-wide process start events
|
||||||
|
- [ ] Entropy injection.
|
||||||
|
- [ ] Verbose flag.
|
||||||
|
- [ ] CLI event injection.
|
||||||
|
@ -82,22 +82,6 @@ data SyncEf
|
|||||||
deriveNoun ''SyncEf
|
deriveNoun ''SyncEf
|
||||||
|
|
||||||
|
|
||||||
-- UDP Effects -----------------------------------------------------------------
|
|
||||||
|
|
||||||
{-|
|
|
||||||
%init -- "I don't think that's something that can happen"
|
|
||||||
%west -- "Those also shouldn't happen"
|
|
||||||
%woot -- "Those also shouldn't happen"
|
|
||||||
-}
|
|
||||||
data AmesEf
|
|
||||||
= AmesEfInit Path ()
|
|
||||||
| AmesEfWest Path Ship Path Noun
|
|
||||||
| AmesEfWoot Path Ship (Maybe (Maybe (Term, [Tank])))
|
|
||||||
deriving (Eq, Ord, Show)
|
|
||||||
|
|
||||||
deriveNoun ''AmesEf
|
|
||||||
|
|
||||||
|
|
||||||
-- Timer Effects ---------------------------------------------------------------
|
-- Timer Effects ---------------------------------------------------------------
|
||||||
|
|
||||||
{-|
|
{-|
|
||||||
@ -171,7 +155,6 @@ data VaneEf
|
|||||||
| VEHttpClient HttpClientEf
|
| VEHttpClient HttpClientEf
|
||||||
| VEHttpServer HttpServerEf
|
| VEHttpServer HttpServerEf
|
||||||
| VEBehn BehnEf
|
| VEBehn BehnEf
|
||||||
| VEAmes AmesEf
|
|
||||||
| VETerm TermEf
|
| VETerm TermEf
|
||||||
| VEClay SyncEf
|
| VEClay SyncEf
|
||||||
| VESync SyncEf
|
| VESync SyncEf
|
||||||
|
@ -350,6 +350,7 @@ instance FromNoun Ev where
|
|||||||
ReOrg "vane" s t p v -> fmap EvVane $ parseNoun $ toNoun (s,t,p,v)
|
ReOrg "vane" s t p v -> fmap EvVane $ parseNoun $ toNoun (s,t,p,v)
|
||||||
ReOrg _ _ _ _ _ -> fail "First path-elem must be ?($ %vane)"
|
ReOrg _ _ _ _ _ -> fail "First path-elem must be ?($ %vane)"
|
||||||
|
|
||||||
|
|
||||||
-- Short Event Names -----------------------------------------------------------
|
-- Short Event Names -----------------------------------------------------------
|
||||||
|
|
||||||
{-
|
{-
|
||||||
|
@ -2,7 +2,7 @@
|
|||||||
Ames IO Driver
|
Ames IO Driver
|
||||||
-}
|
-}
|
||||||
|
|
||||||
module Urbit.Vere.Ames (ames) where
|
module Urbit.Vere.Ames (ames, ames') where
|
||||||
|
|
||||||
import Urbit.Prelude
|
import Urbit.Prelude
|
||||||
|
|
||||||
@ -11,7 +11,7 @@ import Urbit.Arvo hiding (Fake)
|
|||||||
import Urbit.King.Config
|
import Urbit.King.Config
|
||||||
import Urbit.Vere.Pier.Types
|
import Urbit.Vere.Pier.Types
|
||||||
|
|
||||||
import Urbit.King.App (HasKingId(..))
|
import Urbit.King.App (HasKingId(..), HasPierEnv(..))
|
||||||
import Urbit.Vere.Ames.DNS (NetworkMode(..), ResolvServ(..))
|
import Urbit.Vere.Ames.DNS (NetworkMode(..), ResolvServ(..))
|
||||||
import Urbit.Vere.Ames.DNS (galaxyPort, resolvServ)
|
import Urbit.Vere.Ames.DNS (galaxyPort, resolvServ)
|
||||||
import Urbit.Vere.Ames.UDP (UdpServ(..), fakeUdpServ, realUdpServ)
|
import Urbit.Vere.Ames.UDP (UdpServ(..), fakeUdpServ, realUdpServ)
|
||||||
@ -31,7 +31,7 @@ data AmesDrv = AmesDrv
|
|||||||
|
|
||||||
listenPort :: NetworkMode -> Ship -> PortNumber
|
listenPort :: NetworkMode -> Ship -> PortNumber
|
||||||
listenPort m s | s < 256 = galaxyPort m (fromIntegral s)
|
listenPort m s | s < 256 = galaxyPort m (fromIntegral s)
|
||||||
listenPort m _ = 0
|
listenPort m _ = 0 -- I don't care, just give me any port.
|
||||||
|
|
||||||
localhost :: HostAddress
|
localhost :: HostAddress
|
||||||
localhost = tupleToHostAddress (127, 0, 0, 1)
|
localhost = tupleToHostAddress (127, 0, 0, 1)
|
||||||
@ -95,10 +95,29 @@ udpServ isFake who = do
|
|||||||
Nothing -> fakeUdpServ
|
Nothing -> fakeUdpServ
|
||||||
Just host -> realUdpServ port host
|
Just host -> realUdpServ port host
|
||||||
|
|
||||||
bornFailed :: e -> WorkError -> IO ()
|
_bornFailed :: e -> WorkError -> IO ()
|
||||||
bornFailed env _ = runRIO env $ do
|
_bornFailed env _ = runRIO env $ do
|
||||||
pure () -- TODO What can we do?
|
pure () -- TODO What can we do?
|
||||||
|
|
||||||
|
ames'
|
||||||
|
:: HasPierEnv e
|
||||||
|
=> Ship
|
||||||
|
-> Bool
|
||||||
|
-> (Text -> RIO e ())
|
||||||
|
-> RIO e ([Ev], RAcquire e (DriverApi NewtEf))
|
||||||
|
ames' who isFake stderr = do
|
||||||
|
ventQ :: TQueue EvErr <- newTQueueIO
|
||||||
|
env <- ask
|
||||||
|
let (bornEvs, startDriver) = ames env who isFake (writeTQueue ventQ) stderr
|
||||||
|
|
||||||
|
let runDriver = do
|
||||||
|
diOnEffect <- startDriver
|
||||||
|
let diEventSource = fmap RRWork <$> tryReadTQueue ventQ
|
||||||
|
pure (DriverApi {..})
|
||||||
|
|
||||||
|
pure (bornEvs, runDriver)
|
||||||
|
|
||||||
|
|
||||||
{-|
|
{-|
|
||||||
inst -- Process instance number.
|
inst -- Process instance number.
|
||||||
who -- Which ship are we?
|
who -- Which ship are we?
|
||||||
@ -118,13 +137,13 @@ ames
|
|||||||
-> Bool
|
-> Bool
|
||||||
-> (EvErr -> STM ())
|
-> (EvErr -> STM ())
|
||||||
-> (Text -> RIO e ())
|
-> (Text -> RIO e ())
|
||||||
-> ([EvErr], RAcquire e (NewtEf -> IO ()))
|
-> ([Ev], RAcquire e (NewtEf -> IO ()))
|
||||||
ames env who isFake enqueueEv stderr = (initialEvents, runAmes)
|
ames env who isFake enqueueEv stderr = (initialEvents, runAmes)
|
||||||
where
|
where
|
||||||
king = fromIntegral (env ^. kingIdL)
|
king = fromIntegral (env ^. kingIdL)
|
||||||
|
|
||||||
initialEvents :: [EvErr]
|
initialEvents :: [Ev]
|
||||||
initialEvents = [EvErr (bornEv king) (bornFailed env)]
|
initialEvents = [bornEv king]
|
||||||
|
|
||||||
runAmes :: RAcquire e (NewtEf -> IO ())
|
runAmes :: RAcquire e (NewtEf -> IO ())
|
||||||
runAmes = do
|
runAmes = do
|
||||||
|
@ -18,25 +18,15 @@ import qualified Urbit.Timer as Timer
|
|||||||
|
|
||||||
-- Behn Stuff ------------------------------------------------------------------
|
-- Behn Stuff ------------------------------------------------------------------
|
||||||
|
|
||||||
behn' :: HasPierEnv e => RAcquire e DriverApi
|
behn' :: HasPierEnv e => RIO e ([Ev], RAcquire e (DriverApi BehnEf))
|
||||||
behn' = do
|
behn' = do
|
||||||
ventQ <- newTQueueIO
|
|
||||||
bornM <- newEmptyTMVarIO
|
|
||||||
fectM <- newEmptyTMVarIO
|
|
||||||
|
|
||||||
env <- ask
|
env <- ask
|
||||||
let (bootEvs, start) = behn env (writeTQueue ventQ)
|
pure ([bornEv (fromIntegral (env ^. kingIdL))], runDriver env)
|
||||||
for_ bootEvs (atomically . writeTQueue ventQ)
|
where
|
||||||
|
runDriver env = do
|
||||||
diOnEffect <- liftAcquire start
|
ventQ :: TQueue EvErr <- newTQueueIO
|
||||||
|
diOnEffect <- liftAcquire (behn env (writeTQueue ventQ))
|
||||||
let diEventSource = fmap RRWork <$> tryReadTQueue ventQ
|
let diEventSource = fmap RRWork <$> tryReadTQueue ventQ
|
||||||
|
|
||||||
let diBlockUntilBorn = readTMVar bornM
|
|
||||||
|
|
||||||
-- TODO Do this after successful born event.
|
|
||||||
atomically $ putTMVar bornM ()
|
|
||||||
|
|
||||||
pure (DriverApi {..})
|
pure (DriverApi {..})
|
||||||
|
|
||||||
bornEv :: KingId -> Ev
|
bornEv :: KingId -> Ev
|
||||||
@ -47,10 +37,6 @@ wakeEv = EvBlip $ BlipEvBehn $ BehnEvWake () ()
|
|||||||
|
|
||||||
sysTime = view Time.systemTime
|
sysTime = view Time.systemTime
|
||||||
|
|
||||||
bornFailed :: e -> WorkError -> IO ()
|
|
||||||
bornFailed env _ = runRIO env $ do
|
|
||||||
pure () -- TODO Ship is fucked. Kill it?
|
|
||||||
|
|
||||||
wakeErr :: WorkError -> IO ()
|
wakeErr :: WorkError -> IO ()
|
||||||
wakeErr _ = pure ()
|
wakeErr _ = pure ()
|
||||||
|
|
||||||
@ -58,14 +44,11 @@ behn
|
|||||||
:: HasKingId e
|
:: HasKingId e
|
||||||
=> e
|
=> e
|
||||||
-> (EvErr -> STM ())
|
-> (EvErr -> STM ())
|
||||||
-> ([EvErr], Acquire (BehnEf -> IO ()))
|
-> Acquire (BehnEf -> IO ())
|
||||||
behn env enqueueEv =
|
behn env enqueueEv = runBehn
|
||||||
(initialEvents, runBehn)
|
|
||||||
where
|
where
|
||||||
king = fromIntegral (env ^. kingIdL)
|
king = fromIntegral (env ^. kingIdL)
|
||||||
|
|
||||||
initialEvents = [EvErr (bornEv king) (bornFailed env)]
|
|
||||||
|
|
||||||
runBehn :: Acquire (BehnEf -> IO ())
|
runBehn :: Acquire (BehnEf -> IO ())
|
||||||
runBehn = do
|
runBehn = do
|
||||||
tim <- mkAcquire Timer.init Timer.stop
|
tim <- mkAcquire Timer.init Timer.stop
|
||||||
|
@ -2,11 +2,14 @@
|
|||||||
UNIX Filesystem Driver
|
UNIX Filesystem Driver
|
||||||
-}
|
-}
|
||||||
|
|
||||||
module Urbit.Vere.Clay (clay) where
|
module Urbit.Vere.Clay
|
||||||
|
( clay
|
||||||
|
, clay'
|
||||||
|
)
|
||||||
|
where
|
||||||
|
|
||||||
import Urbit.Arvo hiding (Term)
|
import Urbit.Arvo hiding (Term)
|
||||||
import Urbit.King.App (HasKingId(..))
|
import Urbit.King.App
|
||||||
import Urbit.King.Config
|
|
||||||
import Urbit.Prelude
|
import Urbit.Prelude
|
||||||
import Urbit.Vere.Pier.Types
|
import Urbit.Vere.Pier.Types
|
||||||
|
|
||||||
@ -113,16 +116,32 @@ buildActionListFromDifferences fp snapshot = do
|
|||||||
|
|
||||||
--------------------------------------------------------------------------------
|
--------------------------------------------------------------------------------
|
||||||
|
|
||||||
boatFailed :: e -> WorkError -> IO ()
|
_boatFailed :: e -> WorkError -> IO ()
|
||||||
boatFailed env _ = runRIO env $ do
|
_boatFailed env _ = runRIO env $ do
|
||||||
pure () -- TODO What can we do?
|
pure () -- TODO What can we do?
|
||||||
|
|
||||||
|
clay'
|
||||||
|
:: HasPierEnv e
|
||||||
|
=> RIO e ([Ev], RAcquire e (DriverApi SyncEf))
|
||||||
|
clay' = do
|
||||||
|
ventQ :: TQueue EvErr <- newTQueueIO
|
||||||
|
env <- ask
|
||||||
|
|
||||||
|
let (bornEvs, startDriver) = clay env (writeTQueue ventQ)
|
||||||
|
|
||||||
|
let runDriver = do
|
||||||
|
diOnEffect <- startDriver
|
||||||
|
let diEventSource = fmap RRWork <$> tryReadTQueue ventQ
|
||||||
|
pure (DriverApi {..})
|
||||||
|
|
||||||
|
pure (bornEvs, runDriver)
|
||||||
|
|
||||||
clay
|
clay
|
||||||
:: forall e
|
:: forall e
|
||||||
. (HasPierConfig e, HasLogFunc e, HasKingId e)
|
. (HasPierConfig e, HasLogFunc e, HasKingId e)
|
||||||
=> e
|
=> e
|
||||||
-> (EvErr -> STM ())
|
-> (EvErr -> STM ())
|
||||||
-> ([EvErr], RAcquire e (SyncEf -> IO ()))
|
-> ([Ev], RAcquire e (SyncEf -> IO ()))
|
||||||
clay env plan =
|
clay env plan =
|
||||||
(initialEvents, runSync)
|
(initialEvents, runSync)
|
||||||
where
|
where
|
||||||
@ -132,7 +151,7 @@ clay env plan =
|
|||||||
|
|
||||||
-- TODO: In the case of -A, we need to read all the data from the
|
-- TODO: In the case of -A, we need to read all the data from the
|
||||||
-- specified directory and shove it into an %into event.
|
-- specified directory and shove it into an %into event.
|
||||||
initialEvents = [EvErr boatEv (boatFailed env)]
|
initialEvents = [boatEv]
|
||||||
|
|
||||||
runSync :: RAcquire e (SyncEf -> IO ())
|
runSync :: RAcquire e (SyncEf -> IO ())
|
||||||
runSync = handleEffect <$> mkRAcquire start stop
|
runSync = handleEffect <$> mkRAcquire start stop
|
||||||
|
@ -4,13 +4,14 @@
|
|||||||
|
|
||||||
module Urbit.Vere.Eyre
|
module Urbit.Vere.Eyre
|
||||||
( eyre
|
( eyre
|
||||||
|
, eyre'
|
||||||
)
|
)
|
||||||
where
|
where
|
||||||
|
|
||||||
import Urbit.Prelude hiding (Builder)
|
import Urbit.Prelude hiding (Builder)
|
||||||
|
|
||||||
import Urbit.Arvo hiding (ServerId, reqUrl, secure)
|
import Urbit.Arvo hiding (ServerId, reqUrl, secure)
|
||||||
import Urbit.King.App (HasKingId(..))
|
import Urbit.King.App (HasKingId(..), HasPierEnv(..))
|
||||||
import Urbit.King.Config
|
import Urbit.King.Config
|
||||||
import Urbit.Vere.Eyre.Multi
|
import Urbit.Vere.Eyre.Multi
|
||||||
import Urbit.Vere.Eyre.PortsFile
|
import Urbit.Vere.Eyre.PortsFile
|
||||||
@ -275,25 +276,56 @@ startServ multi who isFake conf plan = do
|
|||||||
|
|
||||||
-- Eyre Driver -----------------------------------------------------------------
|
-- Eyre Driver -----------------------------------------------------------------
|
||||||
|
|
||||||
bornFailed :: e -> WorkError -> IO ()
|
_bornFailed :: e -> WorkError -> IO ()
|
||||||
bornFailed env _ = runRIO env $ do
|
_bornFailed env _ = runRIO env $ do
|
||||||
pure () -- TODO What should this do?
|
pure () -- TODO What should this do?
|
||||||
|
|
||||||
|
eyre'
|
||||||
|
:: HasPierEnv e
|
||||||
|
=> MultiEyreApi
|
||||||
|
-> Ship
|
||||||
|
-> Bool
|
||||||
|
-> RIO e ([Ev], RAcquire e (DriverApi HttpServerEf))
|
||||||
|
eyre' multi who isFake = do
|
||||||
|
ventQ :: TQueue EvErr <- newTQueueIO
|
||||||
|
env <- ask
|
||||||
|
|
||||||
|
let (bornEvs, startDriver) = eyre env multi who (writeTQueue ventQ) isFake
|
||||||
|
|
||||||
|
let runDriver = do
|
||||||
|
diOnEffect <- startDriver
|
||||||
|
let diEventSource = fmap RRWork <$> tryReadTQueue ventQ
|
||||||
|
pure (DriverApi {..})
|
||||||
|
|
||||||
|
pure (bornEvs, runDriver)
|
||||||
|
|
||||||
|
{-|
|
||||||
|
Eyre -- HTTP Server Driver
|
||||||
|
|
||||||
|
Inject born events.
|
||||||
|
Until born events succeeds, ignore effects.
|
||||||
|
Wait until born event callbacks invoked.
|
||||||
|
If success, signal success.
|
||||||
|
If failure, try again several times.
|
||||||
|
If still failure, bring down ship.
|
||||||
|
Once born event succeeds:
|
||||||
|
- Begin normal operation (start accepting requests)
|
||||||
|
-}
|
||||||
eyre
|
eyre
|
||||||
:: forall e
|
:: forall e
|
||||||
. (HasShipEnv e, HasKingId e)
|
. (HasPierEnv e)
|
||||||
=> e
|
=> e
|
||||||
-> MultiEyreApi
|
-> MultiEyreApi
|
||||||
-> Ship
|
-> Ship
|
||||||
-> (EvErr -> STM ())
|
-> (EvErr -> STM ())
|
||||||
-> Bool
|
-> Bool
|
||||||
-> ([EvErr], RAcquire e (HttpServerEf -> IO ()))
|
-> ([Ev], RAcquire e (HttpServerEf -> IO ()))
|
||||||
eyre env multi who plan isFake = (initialEvents, runHttpServer)
|
eyre env multi who plan isFake = (initialEvents, runHttpServer)
|
||||||
where
|
where
|
||||||
king = fromIntegral (env ^. kingIdL)
|
king = fromIntegral (env ^. kingIdL)
|
||||||
|
|
||||||
initialEvents :: [EvErr]
|
initialEvents :: [Ev]
|
||||||
initialEvents = [EvErr (bornEv king) (bornFailed env)]
|
initialEvents = [bornEv king]
|
||||||
|
|
||||||
runHttpServer :: RAcquire e (HttpServerEf -> IO ())
|
runHttpServer :: RAcquire e (HttpServerEf -> IO ())
|
||||||
runHttpServer = handleEf <$> mkRAcquire
|
runHttpServer = handleEf <$> mkRAcquire
|
||||||
|
@ -11,11 +11,11 @@ import Urbit.Prelude hiding (Builder)
|
|||||||
|
|
||||||
import Urbit.Vere.Http
|
import Urbit.Vere.Http
|
||||||
import Urbit.Vere.Pier.Types
|
import Urbit.Vere.Pier.Types
|
||||||
|
import Urbit.King.App
|
||||||
|
|
||||||
import Urbit.Arvo (BlipEv(..), Ev(..), HttpClientEf(..), HttpClientEv(..),
|
import Urbit.Arvo (BlipEv(..), Ev(..), HttpClientEf(..), HttpClientEv(..),
|
||||||
HttpClientReq(..), HttpEvent(..), KingId, ResponseHeader(..))
|
HttpClientReq(..), HttpEvent(..), KingId, ResponseHeader(..))
|
||||||
|
|
||||||
import Urbit.King.App (HasKingId(..))
|
|
||||||
|
|
||||||
import qualified Data.Map as M
|
import qualified Data.Map as M
|
||||||
import qualified Network.HTTP.Client as H
|
import qualified Network.HTTP.Client as H
|
||||||
@ -57,22 +57,52 @@ bornEv king =
|
|||||||
|
|
||||||
--------------------------------------------------------------------------------
|
--------------------------------------------------------------------------------
|
||||||
|
|
||||||
bornFailed :: e -> WorkError -> IO ()
|
_bornFailed :: e -> WorkError -> IO ()
|
||||||
bornFailed env _ = runRIO env $ do
|
_bornFailed env _ = runRIO env $ do
|
||||||
pure () -- TODO What to do in this case?
|
pure () -- TODO What to do in this case?
|
||||||
|
|
||||||
|
client'
|
||||||
|
:: HasPierEnv e
|
||||||
|
=> RIO e ([Ev], RAcquire e (DriverApi HttpClientEf))
|
||||||
|
client' = do
|
||||||
|
ventQ :: TQueue EvErr <- newTQueueIO
|
||||||
|
env <- ask
|
||||||
|
|
||||||
|
let (bornEvs, startDriver) = client env (writeTQueue ventQ)
|
||||||
|
|
||||||
|
let runDriver = do
|
||||||
|
diOnEffect <- startDriver
|
||||||
|
let diEventSource = fmap RRWork <$> tryReadTQueue ventQ
|
||||||
|
pure (DriverApi {..})
|
||||||
|
|
||||||
|
pure (bornEvs, runDriver)
|
||||||
|
|
||||||
|
|
||||||
|
{-|
|
||||||
|
Iris -- HTTP Client Driver
|
||||||
|
|
||||||
|
Until born events succeeds, ignore effects.
|
||||||
|
Wait until born event callbacks invoked.
|
||||||
|
If success, signal success.
|
||||||
|
If failure, try again several times.
|
||||||
|
If still failure, bring down ship.
|
||||||
|
Once born event succeeds, hold on to effects.
|
||||||
|
Once all other drivers have booted:
|
||||||
|
- Execute stashed effects.
|
||||||
|
- Begin normal operation (start accepting requests)
|
||||||
|
-}
|
||||||
client
|
client
|
||||||
:: forall e
|
:: forall e
|
||||||
. (HasLogFunc e, HasKingId e)
|
. (HasLogFunc e, HasKingId e)
|
||||||
=> e
|
=> e
|
||||||
-> (EvErr -> STM ())
|
-> (EvErr -> STM ())
|
||||||
-> ([EvErr], RAcquire e (HttpClientEf -> IO ()))
|
-> ([Ev], RAcquire e (HttpClientEf -> IO ()))
|
||||||
client env plan = (initialEvents, runHttpClient)
|
client env plan = (initialEvents, runHttpClient)
|
||||||
where
|
where
|
||||||
kingId = view (kingIdL . to fromIntegral) env
|
kingId = view (kingIdL . to fromIntegral) env
|
||||||
|
|
||||||
initialEvents :: [EvErr]
|
initialEvents :: [Ev]
|
||||||
initialEvents = [EvErr (bornEv kingId) (bornFailed env)]
|
initialEvents = [bornEv kingId]
|
||||||
|
|
||||||
runHttpClient :: RAcquire e (HttpClientEf -> IO ())
|
runHttpClient :: RAcquire e (HttpClientEf -> IO ())
|
||||||
runHttpClient = handleEffect <$> mkRAcquire start stop
|
runHttpClient = handleEffect <$> mkRAcquire start stop
|
||||||
|
@ -24,24 +24,25 @@ import Urbit.Arvo
|
|||||||
import Urbit.King.Config
|
import Urbit.King.Config
|
||||||
import Urbit.Vere.Pier.Types
|
import Urbit.Vere.Pier.Types
|
||||||
|
|
||||||
|
import Control.Monad.STM (retry)
|
||||||
import System.Posix.Files (ownerModes, setFileMode)
|
import System.Posix.Files (ownerModes, setFileMode)
|
||||||
import Urbit.EventLog.LMDB (EventLog)
|
import Urbit.EventLog.LMDB (EventLog)
|
||||||
import Urbit.King.API (TermConn)
|
import Urbit.King.API (TermConn)
|
||||||
import Urbit.King.App (HasKingEnv, HasPierEnv(..), PierEnv)
|
import Urbit.King.App (HasKingEnv, HasPierEnv(..), PierEnv)
|
||||||
import Urbit.King.App (onKillPierSigL)
|
import Urbit.King.App (onKillPierSigL)
|
||||||
import Urbit.Noun.Time (Wen)
|
import Urbit.Noun.Time (Wen)
|
||||||
import Urbit.Vere.Ames (ames)
|
import Urbit.Vere.Behn (behn')
|
||||||
import Urbit.Vere.Behn (behn)
|
|
||||||
import Urbit.Vere.Clay (clay)
|
|
||||||
import Urbit.Vere.Eyre (eyre)
|
|
||||||
import Urbit.Vere.Eyre.Multi (MultiEyreApi)
|
import Urbit.Vere.Eyre.Multi (MultiEyreApi)
|
||||||
import Urbit.Vere.Http.Client (client)
|
|
||||||
import Urbit.Vere.Serf (Serf)
|
import Urbit.Vere.Serf (Serf)
|
||||||
|
|
||||||
import qualified System.Entropy as Ent
|
import qualified System.Entropy as Ent
|
||||||
import qualified Urbit.EventLog.LMDB as Log
|
import qualified Urbit.EventLog.LMDB as Log
|
||||||
import qualified Urbit.King.API as King
|
import qualified Urbit.King.API as King
|
||||||
import qualified Urbit.Noun.Time as Time
|
import qualified Urbit.Noun.Time as Time
|
||||||
|
import qualified Urbit.Vere.Ames as Ames
|
||||||
|
import qualified Urbit.Vere.Clay as Clay
|
||||||
|
import qualified Urbit.Vere.Eyre as Eyre
|
||||||
|
import qualified Urbit.Vere.Http.Client as Iris
|
||||||
import qualified Urbit.Vere.Serf as Serf
|
import qualified Urbit.Vere.Serf as Serf
|
||||||
import qualified Urbit.Vere.Term as Term
|
import qualified Urbit.Vere.Term as Term
|
||||||
import qualified Urbit.Vere.Term.API as Term
|
import qualified Urbit.Vere.Term.API as Term
|
||||||
@ -88,8 +89,9 @@ genBootSeq ship Pill {..} lite boot = io $ do
|
|||||||
_ -> False
|
_ -> False
|
||||||
|
|
||||||
|
|
||||||
-- Write a batch of jobs into the event log ------------------------------------
|
-- Write to the log. -----------------------------------------------------------
|
||||||
|
|
||||||
|
-- | Write a batch of jobs to the event log.
|
||||||
writeJobs :: EventLog -> Vector Job -> RIO e ()
|
writeJobs :: EventLog -> Vector Job -> RIO e ()
|
||||||
writeJobs log !jobs = do
|
writeJobs log !jobs = do
|
||||||
expect <- atomically (Log.nextEv log)
|
expect <- atomically (Log.nextEv log)
|
||||||
@ -110,7 +112,7 @@ writeJobs log !jobs = do
|
|||||||
-- Acquire a running serf. -----------------------------------------------------
|
-- Acquire a running serf. -----------------------------------------------------
|
||||||
|
|
||||||
printTank :: (Text -> IO ()) -> Atom -> Tank -> IO ()
|
printTank :: (Text -> IO ()) -> Atom -> Tank -> IO ()
|
||||||
printTank f _ = io . f . unlines . fmap unTape . wash (WashCfg 0 80)
|
printTank f _priority = f . unlines . fmap unTape . wash (WashCfg 0 80)
|
||||||
|
|
||||||
runSerf
|
runSerf
|
||||||
:: HasLogFunc e
|
:: HasLogFunc e
|
||||||
@ -122,7 +124,7 @@ runSerf vSlog pax fax = do
|
|||||||
env <- ask
|
env <- ask
|
||||||
Serf.withSerf (config env)
|
Serf.withSerf (config env)
|
||||||
where
|
where
|
||||||
slog txt = join $ atomically (readTVar vSlog >>= pure . ($ txt))
|
slog txt = atomically (readTVar vSlog) >>= (\f -> f txt)
|
||||||
config env = Serf.Config
|
config env = Serf.Config
|
||||||
{ scSerf = "urbit-worker" -- TODO Find the executable in some proper way.
|
{ scSerf = "urbit-worker" -- TODO Find the executable in some proper way.
|
||||||
, scPier = pax
|
, scPier = pax
|
||||||
@ -154,10 +156,10 @@ bootSeqJobs now (BootSeq ident nocks ovums) = zipWith ($) bootSeqFns [1 ..]
|
|||||||
wen off = Time.addGap now ((fromIntegral off - 1) ^. from Time.microSecs)
|
wen off = Time.addGap now ((fromIntegral off - 1) ^. from Time.microSecs)
|
||||||
|
|
||||||
bootSeqFns :: [EventId -> Job]
|
bootSeqFns :: [EventId -> Job]
|
||||||
bootSeqFns = fmap muckNock nocks <> fmap muckOvum ovums
|
bootSeqFns = fmap nockJob nocks <> fmap ovumJob ovums
|
||||||
where
|
where
|
||||||
muckNock nok eId = RunNok $ LifeCyc eId 0 nok
|
nockJob nok eId = RunNok $ LifeCyc eId 0 nok
|
||||||
muckOvum ov eId = DoWork $ Work eId 0 (wen eId) ov
|
ovumJob ov eId = DoWork $ Work eId 0 (wen eId) ov
|
||||||
|
|
||||||
bootNewShip
|
bootNewShip
|
||||||
:: HasPierEnv e
|
:: HasPierEnv e
|
||||||
@ -173,10 +175,12 @@ bootNewShip pill lite flags ship bootEv = do
|
|||||||
|
|
||||||
pierPath <- view pierPathL
|
pierPath <- view pierPathL
|
||||||
|
|
||||||
liftRIO (setupPierDirectory pierPath)
|
rio (setupPierDirectory pierPath)
|
||||||
logDebug "Directory setup."
|
logDebug "Directory setup."
|
||||||
|
|
||||||
rwith (Log.new (pierPath <> "/.urb/log") ident) $ \log -> do
|
let logPath = (pierPath </> ".urb/log")
|
||||||
|
|
||||||
|
rwith (Log.new logPath ident) $ \log -> do
|
||||||
logDebug "Event log initialized."
|
logDebug "Event log initialized."
|
||||||
jobs <- (\now -> bootSeqJobs now seq) <$> io Time.now
|
jobs <- (\now -> bootSeqJobs now seq) <$> io Time.now
|
||||||
writeJobs log (fromList jobs)
|
writeJobs log (fromList jobs)
|
||||||
@ -198,10 +202,11 @@ resumed vSlog replayUntil flags = do
|
|||||||
ev <- MaybeT (pure replayUntil)
|
ev <- MaybeT (pure replayUntil)
|
||||||
MaybeT (getSnapshot top ev)
|
MaybeT (getSnapshot top ev)
|
||||||
|
|
||||||
rio $ logTrace $ display @Text ("pier: " <> pack top)
|
rio $ do
|
||||||
rio $ logTrace $ display @Text ("running serf in: " <> pack tap)
|
logTrace $ display @Text ("pier: " <> pack top)
|
||||||
|
logTrace $ display @Text ("running serf in: " <> pack tap)
|
||||||
|
|
||||||
log <- Log.existing (top <> "/.urb/log")
|
log <- Log.existing (top </> ".urb/log")
|
||||||
serf <- runSerf vSlog tap flags
|
serf <- runSerf vSlog tap flags
|
||||||
|
|
||||||
rio $ do
|
rio $ do
|
||||||
@ -217,6 +222,7 @@ resumed vSlog replayUntil flags = do
|
|||||||
|
|
||||||
pure (serf, log)
|
pure (serf, log)
|
||||||
|
|
||||||
|
-- | Get a fake pier directory for partial snapshots.
|
||||||
getSnapshot :: forall e . FilePath -> Word64 -> RIO e (Maybe FilePath)
|
getSnapshot :: forall e . FilePath -> Word64 -> RIO e (Maybe FilePath)
|
||||||
getSnapshot top last = do
|
getSnapshot top last = do
|
||||||
lastSnapshot <- lastMay <$> listReplays
|
lastSnapshot <- lastMay <$> listReplays
|
||||||
@ -261,7 +267,10 @@ pier (serf, log) vSlog startedSig multi = do
|
|||||||
let logId = Log.identity log :: LogIdentity
|
let logId = Log.identity log :: LogIdentity
|
||||||
let ship = who logId :: Ship
|
let ship = who logId :: Ship
|
||||||
|
|
||||||
computeQ :: TQueue Serf.EvErr <- newTQueueIO
|
-- TODO Instead of using a TMVar, pull directly from the IO driver
|
||||||
|
-- event sources.
|
||||||
|
computeQ :: TMVar RunReq <- newEmptyTMVarIO
|
||||||
|
|
||||||
persistQ :: TQueue (Fact, FX) <- newTQueueIO
|
persistQ :: TQueue (Fact, FX) <- newTQueueIO
|
||||||
executeQ :: TQueue FX <- newTQueueIO
|
executeQ :: TQueue FX <- newTQueueIO
|
||||||
saveSig :: TMVar () <- newEmptyTMVarIO
|
saveSig :: TMVar () <- newEmptyTMVarIO
|
||||||
@ -294,7 +303,7 @@ pier (serf, log) vSlog startedSig multi = do
|
|||||||
-- Serf doesn't have the appended \r\n because those \r\n s are added in
|
-- 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
|
-- the c serf code. Logging output from our haskell process must manually
|
||||||
-- add them.
|
-- add them.
|
||||||
let compute = writeTQueue computeQ
|
let compute = putTMVar computeQ
|
||||||
let execute = writeTQueue executeQ
|
let execute = writeTQueue executeQ
|
||||||
let persist = writeTQueue persistQ
|
let persist = writeTQueue persistQ
|
||||||
|
|
||||||
@ -303,15 +312,12 @@ pier (serf, log) vSlog startedSig multi = do
|
|||||||
let err = atomically . Term.trace muxed . (<> "\r\n")
|
let err = atomically . Term.trace muxed . (<> "\r\n")
|
||||||
let siz = Term.TSize { tsWide = 80, tsTall = 24 }
|
let siz = Term.TSize { tsWide = 80, tsTall = 24 }
|
||||||
let fak = isFake logId
|
let fak = isFake logId
|
||||||
pure $ drivers env multi ship fak compute (siz, muxed) err
|
drivers env multi ship fak compute (siz, muxed) err
|
||||||
|
|
||||||
-- Fill event queue with initial events.
|
|
||||||
io $ atomically $ for_ bootEvents compute
|
|
||||||
|
|
||||||
scrySig <- newEmptyTMVarIO
|
scrySig <- newEmptyTMVarIO
|
||||||
onKill <- view onKillPierSigL
|
onKill <- view onKillPierSigL
|
||||||
|
|
||||||
let computeConfig = ComputeConfig { ccOnWork = readTQueue computeQ
|
let computeConfig = ComputeConfig { ccOnWork = takeTMVar computeQ
|
||||||
, ccOnKill = onKill
|
, ccOnKill = onKill
|
||||||
, ccOnSave = takeTMVar saveSig
|
, ccOnSave = takeTMVar saveSig
|
||||||
, ccOnScry = takeTMVar scrySig
|
, ccOnScry = takeTMVar scrySig
|
||||||
@ -321,10 +327,28 @@ pier (serf, log) vSlog startedSig multi = do
|
|||||||
, ccLastEvInLog = Log.lastEv log
|
, ccLastEvInLog = Log.lastEv log
|
||||||
}
|
}
|
||||||
|
|
||||||
|
tSerf <- acquireWorker "Serf" (runCompute serf computeConfig)
|
||||||
|
|
||||||
|
-- Run all born events and retry them until they succeed.
|
||||||
|
rio $ for_ bootEvents $ \ev -> do
|
||||||
|
okaySig <- newEmptyMVar
|
||||||
|
|
||||||
|
let inject n = atomically $ compute $ RRWork $ EvErr ev $ cb n
|
||||||
|
|
||||||
|
-- TODO Make sure this dies cleanly.
|
||||||
|
cb :: Int -> WorkError -> IO ()
|
||||||
|
cb n | n >= 3 = error ("boot event failed: " <> show ev)
|
||||||
|
cb n = \case
|
||||||
|
RunOkay _ -> putMVar okaySig ()
|
||||||
|
RunSwap _ _ _ _ _ -> putMVar okaySig ()
|
||||||
|
RunBail _ -> inject (n + 1)
|
||||||
|
|
||||||
|
logTrace ("Boot Event" <> displayShow ev)
|
||||||
|
io (inject 0)
|
||||||
|
|
||||||
drivz <- startDrivers
|
drivz <- startDrivers
|
||||||
tExec <- acquireWorker "Effects" (router (readTQueue executeQ) drivz)
|
tExec <- acquireWorker "Effects" (router (readTQueue executeQ) drivz)
|
||||||
tDisk <- acquireWorkerBound "Persist" (runPersist log persistQ execute)
|
tDisk <- acquireWorkerBound "Persist" (runPersist log persistQ execute)
|
||||||
tSerf <- acquireWorker "Serf" (runCompute serf computeConfig)
|
|
||||||
|
|
||||||
let snapshotEverySecs = 120
|
let snapshotEverySecs = 120
|
||||||
|
|
||||||
@ -333,8 +357,9 @@ pier (serf, log) vSlog startedSig multi = do
|
|||||||
void $ atomically $ tryPutTMVar saveSig ()
|
void $ atomically $ tryPutTMVar saveSig ()
|
||||||
|
|
||||||
-- TODO bullshit scry tester
|
-- TODO bullshit scry tester
|
||||||
void $ acquireWorker "bullshit scry tester" $ forever $ do
|
void $ acquireWorker "bullshit scry tester" $ do
|
||||||
env <- ask
|
env <- ask
|
||||||
|
forever $ do
|
||||||
threadDelay 15_000_000
|
threadDelay 15_000_000
|
||||||
wen <- io Time.now
|
wen <- io Time.now
|
||||||
let kal = \mTermNoun -> runRIO env $ do
|
let kal = \mTermNoun -> runRIO env $ do
|
||||||
@ -354,8 +379,9 @@ pier (serf, log) vSlog startedSig multi = do
|
|||||||
]
|
]
|
||||||
|
|
||||||
atomically ded >>= \case
|
atomically ded >>= \case
|
||||||
Left (txt, exn) -> logError $ displayShow ("Somthing died", txt, exn)
|
Left (tag, exn) -> logError $ displayShow (tag, "crashed", exn)
|
||||||
Right tag -> logError $ displayShow ("Something simply exited", tag)
|
Right "compute thread" -> pure ()
|
||||||
|
Right tag -> logError $ displayShow (tag, "exited unexpectly")
|
||||||
|
|
||||||
atomically $ (Term.spin muxed) (Just "shutdown")
|
atomically $ (Term.spin muxed) (Just "shutdown")
|
||||||
|
|
||||||
@ -368,9 +394,8 @@ death tag tid = do
|
|||||||
|
|
||||||
-- Start All Drivers -----------------------------------------------------------
|
-- Start All Drivers -----------------------------------------------------------
|
||||||
|
|
||||||
data Drivers e = Drivers
|
data Drivers = Drivers
|
||||||
{ dAmes :: AmesEf -> IO ()
|
{ dBehn :: BehnEf -> IO ()
|
||||||
, dBehn :: BehnEf -> IO ()
|
|
||||||
, dIris :: HttpClientEf -> IO ()
|
, dIris :: HttpClientEf -> IO ()
|
||||||
, dEyre :: HttpServerEf -> IO ()
|
, dEyre :: HttpServerEf -> IO ()
|
||||||
, dNewt :: NewtEf -> IO ()
|
, dNewt :: NewtEf -> IO ()
|
||||||
@ -384,36 +409,58 @@ drivers
|
|||||||
-> MultiEyreApi
|
-> MultiEyreApi
|
||||||
-> Ship
|
-> Ship
|
||||||
-> Bool
|
-> Bool
|
||||||
-> (EvErr -> STM ())
|
-> (RunReq -> STM ())
|
||||||
-> (Term.TSize, Term.Client)
|
-> (Term.TSize, Term.Client)
|
||||||
-> (Text -> RIO e ())
|
-> (Text -> RIO e ())
|
||||||
-> ([EvErr], RAcquire e (Drivers e))
|
-> RAcquire e ([Ev], RAcquire e Drivers)
|
||||||
drivers env multi who isFake plan termSys stderr =
|
drivers env multi who isFake plan termSys stderr = do
|
||||||
(initialEvents, runDrivers)
|
(behnBorn, runBehn) <- rio behn'
|
||||||
where
|
(termBorn, runTerm) <- rio (Term.term' termSys)
|
||||||
(behnBorn, runBehn) = behn env plan
|
(amesBorn, runAmes) <- rio (Ames.ames' who isFake stderr)
|
||||||
(amesBorn, runAmes) = ames env who isFake plan stderr
|
(httpBorn, runEyre) <- rio (Eyre.eyre' multi who isFake)
|
||||||
(httpBorn, runEyre) = eyre env multi who plan isFake
|
(clayBorn, runClay) <- rio Clay.clay'
|
||||||
(clayBorn, runClay) = clay env plan
|
(irisBorn, runIris) <- rio Iris.client'
|
||||||
(irisBorn, runIris) = client env plan
|
|
||||||
(termBorn, runTerm) = Term.term env termSys plan
|
|
||||||
initialEvents = mconcat [behnBorn, clayBorn, amesBorn, httpBorn,
|
|
||||||
termBorn, irisBorn]
|
|
||||||
|
|
||||||
runDrivers = do
|
let initialEvents = mconcat [behnBorn,clayBorn,amesBorn,httpBorn,irisBorn,termBorn]
|
||||||
dNewt <- runAmes
|
|
||||||
dBehn <- liftAcquire $ runBehn
|
let runDrivers = do
|
||||||
dAmes <- pure $ const $ pure ()
|
behn <- runBehn
|
||||||
dIris <- runIris
|
term <- runTerm
|
||||||
dEyre <- runEyre
|
ames <- runAmes
|
||||||
dSync <- runClay
|
iris <- runIris
|
||||||
dTerm <- runTerm
|
eyre <- runEyre
|
||||||
pure (Drivers{..})
|
clay <- runClay
|
||||||
|
|
||||||
|
-- Sources lower in the list are starved until sources above them
|
||||||
|
-- have no events to offer.
|
||||||
|
acquireWorker "Event Prioritization" $ forever $ atomically $ do
|
||||||
|
let x = diEventSource
|
||||||
|
let eventSources = [x term, x clay, x behn, x iris, x eyre, x ames]
|
||||||
|
pullEvent eventSources >>= \case
|
||||||
|
Nothing -> retry
|
||||||
|
Just rr -> plan rr
|
||||||
|
|
||||||
|
pure $ Drivers
|
||||||
|
{ dTerm = diOnEffect term
|
||||||
|
, dBehn = diOnEffect behn
|
||||||
|
, dNewt = diOnEffect ames
|
||||||
|
, dIris = diOnEffect iris
|
||||||
|
, dEyre = diOnEffect eyre
|
||||||
|
, dSync = diOnEffect clay
|
||||||
|
}
|
||||||
|
|
||||||
|
pure (initialEvents, runDrivers)
|
||||||
|
where
|
||||||
|
pullEvent :: [STM (Maybe a)] -> STM (Maybe a)
|
||||||
|
pullEvent [] = pure Nothing
|
||||||
|
pullEvent (d:ds) = d >>= \case
|
||||||
|
Just r -> pure (Just r)
|
||||||
|
Nothing -> pullEvent ds
|
||||||
|
|
||||||
|
|
||||||
-- Route Effects to Drivers ----------------------------------------------------
|
-- Route Effects to Drivers ----------------------------------------------------
|
||||||
|
|
||||||
router :: HasLogFunc e => STM FX -> Drivers e -> RIO e ()
|
router :: HasLogFunc e => STM FX -> Drivers -> RIO e ()
|
||||||
router waitFx Drivers {..} = forever $ do
|
router waitFx Drivers {..} = forever $ do
|
||||||
fx <- atomically waitFx
|
fx <- atomically waitFx
|
||||||
for_ fx $ \ef -> do
|
for_ fx $ \ef -> do
|
||||||
@ -421,7 +468,6 @@ router waitFx Drivers {..} = forever $ do
|
|||||||
case ef of
|
case ef of
|
||||||
GoodParse (EfVega _ _ ) -> error "TODO"
|
GoodParse (EfVega _ _ ) -> error "TODO"
|
||||||
GoodParse (EfExit _ _ ) -> error "TODO"
|
GoodParse (EfExit _ _ ) -> error "TODO"
|
||||||
GoodParse (EfVane (VEAmes ef)) -> io (dAmes ef)
|
|
||||||
GoodParse (EfVane (VEBehn ef)) -> io (dBehn ef)
|
GoodParse (EfVane (VEBehn ef)) -> io (dBehn ef)
|
||||||
GoodParse (EfVane (VEBoat ef)) -> io (dSync ef)
|
GoodParse (EfVane (VEBoat ef)) -> io (dSync ef)
|
||||||
GoodParse (EfVane (VEClay ef)) -> io (dSync ef)
|
GoodParse (EfVane (VEClay ef)) -> io (dSync ef)
|
||||||
@ -450,7 +496,7 @@ logEffect ef = logDebug $ display $ "[EFFECT]\n" <> pretty ef
|
|||||||
FailParse n -> pack $ unlines $ fmap ("\t" <>) $ lines $ ppShow n
|
FailParse n -> pack $ unlines $ fmap ("\t" <>) $ lines $ ppShow n
|
||||||
|
|
||||||
data ComputeConfig = ComputeConfig
|
data ComputeConfig = ComputeConfig
|
||||||
{ ccOnWork :: STM Serf.EvErr
|
{ ccOnWork :: STM RunReq
|
||||||
, ccOnKill :: STM ()
|
, ccOnKill :: STM ()
|
||||||
, ccOnSave :: STM ()
|
, ccOnSave :: STM ()
|
||||||
, ccOnScry :: STM (Wen, Gang, Path, Maybe (Term, Noun) -> IO ())
|
, ccOnScry :: STM (Wen, Gang, Path, Maybe (Term, Noun) -> IO ())
|
||||||
@ -464,9 +510,9 @@ runCompute :: forall e . HasKingEnv e => Serf.Serf -> ComputeConfig -> RIO e ()
|
|||||||
runCompute serf ComputeConfig {..} = do
|
runCompute serf ComputeConfig {..} = do
|
||||||
logDebug "runCompute"
|
logDebug "runCompute"
|
||||||
|
|
||||||
let onCR = asum [ ccOnKill <&> Serf.RRKill
|
let onRR = asum [ ccOnKill <&> Serf.RRKill
|
||||||
, ccOnSave <&> Serf.RRSave
|
, ccOnSave <&> Serf.RRSave
|
||||||
, ccOnWork <&> Serf.RRWork
|
, ccOnWork
|
||||||
, ccOnScry <&> \(w,g,p,k) -> Serf.RRScry w g p k
|
, ccOnScry <&> \(w,g,p,k) -> Serf.RRScry w g p k
|
||||||
]
|
]
|
||||||
|
|
||||||
@ -483,7 +529,7 @@ runCompute serf ComputeConfig {..} = do
|
|||||||
|
|
||||||
let maxBatchSize = 10
|
let maxBatchSize = 10
|
||||||
|
|
||||||
io (Serf.run serf maxBatchSize ccLastEvInLog onCR ccPutResult onSpin)
|
io (Serf.run serf maxBatchSize ccLastEvInLog onRR ccPutResult onSpin)
|
||||||
|
|
||||||
|
|
||||||
-- Event-Log Persistence Thread ------------------------------------------------
|
-- Event-Log Persistence Thread ------------------------------------------------
|
||||||
|
@ -81,10 +81,9 @@ jobMug (DoWork (Work _ mug _ _ )) = mug
|
|||||||
|
|
||||||
-- API To IO Drivers -----------------------------------------------------------
|
-- API To IO Drivers -----------------------------------------------------------
|
||||||
|
|
||||||
data DriverApi = DriverApi
|
data DriverApi ef = DriverApi
|
||||||
{ diEventSource :: STM (Maybe RunReq)
|
{ diEventSource :: STM (Maybe RunReq)
|
||||||
, diOnEffect :: BehnEf -> IO ()
|
, diOnEffect :: ef -> IO ()
|
||||||
, diBlockUntilBorn :: STM ()
|
|
||||||
}
|
}
|
||||||
|
|
||||||
|
|
||||||
|
@ -556,6 +556,7 @@ run serf maxBatchSize getLastEvInLog onInput sendOn spin = topLoop
|
|||||||
onWorkResp :: Wen -> EvErr -> Work -> IO ()
|
onWorkResp :: Wen -> EvErr -> Work -> IO ()
|
||||||
onWorkResp wen (EvErr evn err) = \case
|
onWorkResp wen (EvErr evn err) = \case
|
||||||
WDone eid hash fx -> do
|
WDone eid hash fx -> do
|
||||||
|
io $ err (RunOkay eid)
|
||||||
atomically $ sendOn ((Fact eid hash wen (toNoun evn)), fx)
|
atomically $ sendOn ((Fact eid hash wen (toNoun evn)), fx)
|
||||||
WSwap eid hash (wen, noun) fx -> do
|
WSwap eid hash (wen, noun) fx -> do
|
||||||
io $ err (RunSwap eid hash wen noun fx)
|
io $ err (RunSwap eid hash wen noun fx)
|
||||||
|
@ -79,9 +79,10 @@ data EvErr = EvErr Ev (WorkError -> IO ())
|
|||||||
- `RunBail`: Event processing failed and all attempt to replace it
|
- `RunBail`: Event processing failed and all attempt to replace it
|
||||||
with a failure-notice event also caused crashes. We are really fucked.
|
with a failure-notice event also caused crashes. We are really fucked.
|
||||||
-}
|
-}
|
||||||
data WorkError
|
data WorkError -- TODO Rename type and constructors
|
||||||
= RunSwap EventId Mug Wen Noun FX
|
= RunSwap EventId Mug Wen Noun FX -- TODO Maybe provide less info here?
|
||||||
| RunBail [Goof]
|
| RunBail [Goof]
|
||||||
|
| RunOkay EventId
|
||||||
|
|
||||||
{-
|
{-
|
||||||
- RRWork: Ask the serf to do work, will output (Fact, FX) if work
|
- RRWork: Ask the serf to do work, will output (Fact, FX) if work
|
||||||
|
Loading…
Reference in New Issue
Block a user