urbit/pkg/hs/urbit-king/lib/Urbit/Vere/Eyre/KingSubsite.hs

86 lines
2.6 KiB
Haskell
Raw Normal View History

{-|
KingSubsite: runtime-exclusive HTTP request handling, for /~_~
-}
module Urbit.Vere.Eyre.KingSubsite
( KingSubsite
, kingSubsite
, runKingSubsite
, fourOhFourSubsite
) where
import Urbit.Prelude hiding (Builder)
import Data.ByteString.Builder
import Data.Conduit (ConduitT, Flush(..), yield)
import Data.Text.Encoding (encodeUtf8Builder)
import Urbit.Noun.Tank (wash)
import qualified Network.HTTP.Types as H
import qualified Network.Wai as W
import qualified Network.Wai.Conduit as W
newtype KingSubsite = KS { runKingSubsite :: W.Application }
data SlogAction
= KeepAlive
| Slog (Atom, Tank)
2020-10-21 02:42:20 +03:00
streamSlog :: Monad m => SlogAction -> ConduitT () (Flush Builder) m ()
streamSlog a = do
case a of
KeepAlive -> pure ()
Slog (_, t) -> for_ (wash (WashCfg 0 80) (tankTree t)) $ \l -> do
yield $ Chunk "data:"
yield $ Chunk $ encodeUtf8Builder $ unTape l
yield $ Chunk "\n"
yield $ Chunk "\n"
yield $ Flush
kingSubsite :: HasLogFunc e
=> TVar ((Atom, Tank) -> IO ())
-> RAcquire e KingSubsite
kingSubsite func = do
2020-10-21 02:42:20 +03:00
clients <- newTVarIO (mempty :: Map Word (SlogAction -> IO ()))
nextId <- newTVarIO (0 :: Word)
baton <- newTMVarIO ()
atomically $ writeTVar func $ \s -> readTVarIO clients >>= traverse_ ($ Slog s)
acquireWorker "Runtime subsite keep-alive" $ forever $ do
threadDelay 20_000_000
2020-10-21 02:42:20 +03:00
io $ readTVarIO clients >>= traverse_ ($ KeepAlive)
2020-10-21 02:42:20 +03:00
--TODO scry to verify cookie authentication
pure $ KS $ \req respond -> case W.pathInfo req of
("~_~":"slog":_) -> bracket
(do
id <- atomically $ do
id <- readTVar nextId
modifyTVar' nextId (+ 1)
pure id
slogQ <- newTQueueIO
atomically $
modifyTVar' clients (insertMap id (atomically . writeTQueue slogQ))
pure (id, slogQ))
(\(id, _) -> atomically $ modifyTVar' clients (deleteMap id))
(\(_, q) ->
let loop = yield Flush >> forever (atomically (readTQueue q) >>= streamSlog)
in respond $ W.responseSource (H.mkStatus 200 "OK") heads loop)
2020-10-21 02:42:20 +03:00
_ -> respond $ W.responseLBS (H.mkStatus 404 "Not Found") [] ""
2020-10-21 02:42:20 +03:00
where
heads = [ ("Content-Type" , "text/event-stream")
, ("Cache-Control", "no-cache")
, ("Connection" , "keep-alive")
]
fourOhFourSubsite :: Ship -> KingSubsite
fourOhFourSubsite who = KS $ \req respond ->
respond $ W.responseLBS (H.mkStatus 404 "Not Found") [] body
where
body = toLazyByteString $ foldMap charUtf8 $ msg
msg = "Ship " <> (show who) <> " not docked."