shrub/pkg/hs/urbit-king/lib/Urbit/Vere/Http/Server.hs

713 lines
22 KiB
Haskell
Raw Normal View History

2020-01-23 07:16:09 +03:00
{-|
Http Server Driver
2020-01-23 07:16:09 +03:00
TODO Make sure that HTTP sockets get closed on shutdown.
TODO What is this about?
// if we don't explicitly set this field, h2o will send with
// transfer-encoding: chunked
//
if ( 1 == has_len_i ) {
rec_u->res.content_length = ( 0 == gen_u->bod_u ) ?
0 : gen_u->bod_u->len_w;
}
TODO Does this matter, is is using WAI's default behavior ok?
rec_u->res.reason = (status < 200) ? "weird" :
(status < 300) ? "ok" :
(status < 400) ? "moved" :
(status < 500) ? "missing" :
"hosed";
-}
module Urbit.Vere.Http.Server where
2019-05-16 03:00:10 +03:00
2019-08-03 22:26:45 +03:00
import Data.Conduit
import Urbit.Arvo hiding (ServerId, reqBody, reqUrl, secure)
import Urbit.King.Config
import Urbit.Noun
import Urbit.Prelude hiding (Builder)
import Urbit.Vere.Pier.Types
2019-05-16 03:00:10 +03:00
import Data.Binary.Builder (Builder, fromByteString)
import Data.Bits (shiftL, (.|.))
import Data.PEM (pemParseBS, pemWriteBS)
import Network.Socket (SockAddr(..))
import System.Directory (doesFileExist, removeFile)
import System.Random (randomIO)
import Urbit.Vere.Http (convertHeaders, unconvertHeaders)
2019-05-31 05:53:00 +03:00
import qualified Network.HTTP.Types as H
import qualified Network.Socket as Net
2019-05-31 05:53:00 +03:00
import qualified Network.Wai as W
2019-08-03 22:26:45 +03:00
import qualified Network.Wai.Conduit as W
2019-05-31 05:53:00 +03:00
import qualified Network.Wai.Handler.Warp as W
2019-05-25 02:03:46 +03:00
import qualified Network.Wai.Handler.WarpTLS as W
2019-05-24 02:58:18 +03:00
-- Internal Types --------------------------------------------------------------
type HasShipEnv e = (HasLogFunc e, HasNetworkConfig e, HasPierConfig e)
2019-12-19 22:30:09 +03:00
type ReqId = UD
type SeqId = UD -- Unused, always 1
2020-01-23 07:16:09 +03:00
{-|
2019-08-03 22:26:45 +03:00
The sequence of actions on a given request *should* be:
2019-08-03 22:26:45 +03:00
[%head .] [%bloc .]* %done
2019-08-03 22:26:45 +03:00
But we will actually accept anything, and mostly do the right
thing. There are two situations where we ignore ignore the data from
some actions.
2019-08-03 22:26:45 +03:00
- If you send something *after* a %done action, it will be ignored.
- If you send a %done before a %head, we will produce "444 No
Response" with an empty response body.
-}
data RespAction
= RAHead ResponseHeader File
| RAFull ResponseHeader File
2019-08-03 22:26:45 +03:00
| RABloc File
| RADone
deriving (Eq, Ord, Show)
data LiveReqs = LiveReqs
{ nextReqId :: ReqId
, activeReqs :: Map ReqId (TQueue RespAction)
}
data Ports = Ports
{ pHttps :: Maybe Port
, pHttp :: Port
, pLoop :: Port
}
deriving (Eq, Ord, Show)
newtype Drv = Drv { unDrv :: MVar (Maybe Serv) }
data Serv = Serv
{ sServId :: ServId
, sConfig :: HttpServerConf
, sLoopTid :: Async ()
, sHttpTid :: Async ()
, sHttpsTid :: Maybe (Async ())
, sLoopSock :: Net.Socket
, sHttpSock :: Net.Socket
, sHttpsSock :: Net.Socket
, sPorts :: Ports
, sPortsFile :: FilePath
, sLiveReqs :: TVar LiveReqs
}
-- RespAction -- Reorganized HttpEvent for Cleaner Processing ------------------
2019-08-03 22:26:45 +03:00
reorgHttpEvent :: HttpEvent -> [RespAction]
reorgHttpEvent = \case
Start head mBlk True -> [RAFull head (fromMaybe "" mBlk)]
Start head mBlk False -> [RAHead head (fromMaybe "" mBlk)]
2019-08-03 22:26:45 +03:00
Cancel () -> [RADone]
Continue mBlk isDone -> toList (RABloc <$> mBlk)
<> if isDone then [RADone] else []
2019-08-03 22:26:45 +03:00
-- Generic Service Stop/Restart -- Using an MVar for Atomicity -----------------
2020-01-23 07:16:09 +03:00
{-|
2019-08-02 08:07:20 +03:00
Restart a running service.
2019-05-16 03:00:10 +03:00
2019-08-02 08:07:20 +03:00
This can probably be made simpler, but it
2019-05-16 03:00:10 +03:00
2019-08-02 08:07:20 +03:00
- Sets the MVar to Nothing if there was an exception whil starting
or stopping the service.
2019-05-16 03:00:10 +03:00
2019-08-02 08:07:20 +03:00
- Keeps the MVar lock until the restart process finishes.
-}
2019-08-29 03:26:59 +03:00
restartService :: e s. HasLogFunc e
=> MVar (Maybe s)
-> RIO e s
-> (s -> RIO e ())
-> RIO e (Either SomeException s)
2019-08-02 08:07:20 +03:00
restartService vServ sstart kkill = do
2019-08-29 03:26:59 +03:00
logDebug "restartService"
2019-08-02 08:07:20 +03:00
modifyMVar vServ $ \case
Nothing -> doStart
Just sv -> doRestart sv
where
2019-08-29 03:26:59 +03:00
doRestart :: s -> RIO e (Maybe s, Either SomeException s)
doRestart serv = do
2019-08-29 03:26:59 +03:00
logDebug "doStart"
2019-08-02 08:07:20 +03:00
try (kkill serv) >>= \case
Left exn -> pure (Nothing, Left exn)
Right () -> doStart
2019-05-16 03:04:21 +03:00
2019-08-29 03:26:59 +03:00
doStart :: RIO e (Maybe s, Either SomeException s)
doStart = do
2019-08-29 03:26:59 +03:00
logDebug "doStart"
2019-08-02 08:07:20 +03:00
try sstart <&> \case
Right s -> (Just s, Right s)
Left exn -> (Nothing, Left exn)
2019-08-02 08:07:20 +03:00
2019-08-29 03:26:59 +03:00
stopService :: HasLogFunc e
=> MVar (Maybe s)
-> (s -> RIO e ())
-> RIO e (Either SomeException ())
2019-08-02 08:07:20 +03:00
stopService vServ kkill = do
2019-08-29 03:26:59 +03:00
logDebug "stopService"
2019-08-02 08:07:20 +03:00
modifyMVar vServ $ \case
Nothing -> pure (Nothing, Right ())
Just sv -> do res <- try (kkill sv)
pure (Nothing, res)
2019-05-16 03:00:10 +03:00
2019-05-24 02:58:18 +03:00
2019-08-03 22:26:45 +03:00
-- Live Requests Table -- All Requests Still Waiting for Responses -------------
emptyLiveReqs :: LiveReqs
emptyLiveReqs = LiveReqs 1 mempty
respondToLiveReq :: TVar LiveReqs -> ReqId -> RespAction -> STM ()
respondToLiveReq var req ev = do
mVar <- lookup req . activeReqs <$> readTVar var
case mVar of
Nothing -> pure ()
Just tv -> writeTQueue tv ev
2019-08-03 22:26:45 +03:00
rmLiveReq :: TVar LiveReqs -> ReqId -> STM ()
rmLiveReq var reqId = do
liv <- readTVar var
writeTVar var (liv { activeReqs = deleteMap reqId (activeReqs liv) })
newLiveReq :: TVar LiveReqs -> STM (ReqId, TQueue RespAction)
2019-08-03 22:26:45 +03:00
newLiveReq var = do
liv <- readTVar var
tmv <- newTQueue
2019-08-03 22:26:45 +03:00
let (nex, act) = (nextReqId liv, activeReqs liv)
writeTVar var (LiveReqs (nex+1) (insertMap nex tmv act))
pure (nex, tmv)
-- Ports File ------------------------------------------------------------------
2019-08-29 03:26:59 +03:00
removePortsFile :: FilePath -> RIO e ()
removePortsFile pax =
2019-08-29 03:26:59 +03:00
io (doesFileExist pax) >>= \case
True -> io $ removeFile pax
False -> pure ()
portsFileText :: Ports -> Text
portsFileText Ports{..} =
unlines $ catMaybes
[ pHttps <&> \p -> (tshow p <> " secure public")
, Just (tshow (unPort pHttp) <> " insecure public")
, Just (tshow (unPort pLoop) <> " insecure loopback")
]
2019-08-29 03:26:59 +03:00
writePortsFile :: FilePath -> Ports -> RIO e ()
writePortsFile f = writeFile f . encodeUtf8 . portsFileText
-- Random Helpers --------------------------------------------------------------
cordBytes :: Cord -> ByteString
cordBytes = encodeUtf8 . unCord
wainBytes :: Wain -> ByteString
wainBytes = encodeUtf8 . unWain
pass :: Monad m => m ()
pass = pure ()
2019-08-03 22:26:45 +03:00
whenJust :: Monad m => Maybe a -> (a -> m ()) -> m ()
whenJust Nothing act = pure ()
whenJust (Just a) act = act a
cookMeth :: W.Request -> Maybe Method
cookMeth = H.parseMethod . W.requestMethod >>> \case
Left _ -> Nothing
Right m -> Just m
reqIdCord :: ReqId -> Cord
reqIdCord = Cord . tshow
2019-08-29 03:26:59 +03:00
reqBody :: W.Request -> RIO e (Maybe File)
2019-08-03 22:26:45 +03:00
reqBody req = do
2019-08-29 03:26:59 +03:00
bodyLbs <- io $ W.strictRequestBody req
pure $ if length bodyLbs == 0
then Nothing
else Just $ File $ Octs (toStrict bodyLbs)
2019-08-03 22:26:45 +03:00
reqAddr :: W.Request -> Address
reqAddr = W.remoteHost >>> \case
SockAddrInet _ a -> AIpv4 (Ipv4 a)
SockAddrInet6 _ _ a _ -> AIpv6 (mkIpv6 a)
_ -> error "invalid sock addr"
mkIpv6 :: (Word32, Word32, Word32, Word32) -> Ipv6
mkIpv6 (p, q, r, s) = Ipv6 (pBits .|. qBits .|. rBits .|. sBits)
where
pBits = shiftL (fromIntegral p) 0
qBits = shiftL (fromIntegral q) 32
rBits = shiftL (fromIntegral r) 64
sBits = shiftL (fromIntegral s) 96
reqUrl :: W.Request -> Cord
reqUrl r = Cord $ decodeUtf8 $ W.rawPathInfo r <> W.rawQueryString r
2019-08-03 22:26:45 +03:00
-- Utilities for Constructing Events -------------------------------------------
2019-08-02 08:07:20 +03:00
data WhichServer = Secure | Insecure | Loopback
deriving (Eq)
2019-08-02 08:07:20 +03:00
servEv :: HttpServerEv -> Ev
servEv = EvBlip . BlipEvHttpServer
bornEv :: KingId -> Ev
bornEv king =
2019-08-03 22:26:45 +03:00
servEv $ HttpServerEvBorn (king, ()) ()
2019-08-02 08:07:20 +03:00
liveEv :: ServId -> Ports -> Ev
liveEv sId Ports{..} =
servEv $ HttpServerEvLive (sId, ()) pHttp pHttps
cancelEv :: ServId -> ReqId -> Ev
cancelEv sId reqId =
servEv $ HttpServerEvCancelRequest (sId, reqId, 1, ()) ()
reqEv :: ServId -> ReqId -> WhichServer -> Address -> HttpRequest -> Ev
reqEv sId reqId which addr req =
case which of
Loopback ->
servEv $ HttpServerEvRequestLocal (sId, reqId, 1, ())
$ HttpServerReq False addr req
_ ->
servEv $ HttpServerEvRequest (sId, reqId, 1, ())
$ HttpServerReq (which == Secure) addr req
2019-05-25 02:03:46 +03:00
2019-08-03 22:26:45 +03:00
-- Http Server Flows -----------------------------------------------------------
2019-08-02 08:07:20 +03:00
data Resp
= RHead ResponseHeader [File]
| RFull ResponseHeader [File]
| RNone
deriving (Show)
2020-01-23 07:16:09 +03:00
{-|
2019-08-03 22:26:45 +03:00
This accepts all action orderings so that there are no edge-cases
to be handled:
2019-08-02 08:07:20 +03:00
2019-08-03 22:26:45 +03:00
- If %bloc before %head, collect it and wait for %head.
- If %done before %head, ignore all chunks and produce Nothing.
TODO Be strict about this instead. Ignore invalid request streams.
2019-08-03 22:26:45 +03:00
-}
getResp :: TQueue RespAction -> RIO e Resp
getResp tmv = go []
2019-08-03 22:26:45 +03:00
where
go çunks = atomically (readTQueue tmv) >>= \case
RAHead head ç -> pure $ RHead head $ reverse (ç : çunks)
RAFull head ç -> pure $ RFull head $ reverse (ç : çunks)
RABloc ç -> go (ç : çunks)
RADone -> pure RNone
2019-08-02 08:07:20 +03:00
2020-01-23 07:16:09 +03:00
{-|
2019-08-03 22:26:45 +03:00
- Immediatly yield all of the initial chunks
- Yield the data from %bloc action.
- Close the stream when we hit a %done action.
-}
2019-08-29 03:26:59 +03:00
streamBlocks :: HasLogFunc e
=> e -> [File] -> TQueue RespAction
-> ConduitT () (Flush Builder) IO ()
streamBlocks env init tmv =
2019-08-03 22:26:45 +03:00
for_ init yieldÇunk >> go
where
yieldFlush = \x -> yield (Chunk x) >> yield Flush
2019-12-20 23:59:01 +03:00
logDupHead = runRIO env (logError "Multiple %head actions on one request")
2019-08-02 08:07:20 +03:00
yieldÇunk = \case
2019-12-20 23:59:01 +03:00
"" -> runRIO env (logTrace "sending empty chunk")
c -> do runRIO env (logTrace (display ("sending chunk " <> tshow c)))
(yieldFlush . fromByteString . unOcts . unFile) c
go = atomically (readTQueue tmv) >>= \case
2019-12-20 23:59:01 +03:00
RAHead head c -> logDupHead >> yieldÇunk c >> go
RAFull head c -> logDupHead >> yieldÇunk c >> go
RABloc c -> yieldÇunk c >> go
RADone -> pure ()
2019-08-02 08:07:20 +03:00
2019-08-29 03:26:59 +03:00
sendResponse :: HasLogFunc e
=> (W.Response -> IO W.ResponseReceived)
-> TQueue RespAction
-> RIO e W.ResponseReceived
2019-08-03 22:26:45 +03:00
sendResponse cb tmv = do
2019-08-29 03:26:59 +03:00
env <- ask
getResp tmv >>= \case
2019-08-29 03:26:59 +03:00
RNone -> io $ cb $ W.responseLBS (H.mkStatus 444 "No Response") []
$ ""
RFull h f -> io $ cb $ W.responseLBS (hdrStatus h) (hdrHeaders h)
$ fromStrict $ concat $ unOcts . unFile <$> f
RHead h i -> io $ cb $ W.responseSource (hdrStatus h) (hdrHeaders h)
$ streamBlocks env i tmv
2019-08-02 08:07:20 +03:00
where
2019-08-03 22:26:45 +03:00
hdrHeaders :: ResponseHeader -> [H.Header]
hdrHeaders = unconvertHeaders . headers
2019-08-02 08:07:20 +03:00
2019-08-03 22:26:45 +03:00
hdrStatus :: ResponseHeader -> H.Status
hdrStatus = toEnum . fromIntegral . statusCode
2019-08-02 08:07:20 +03:00
2019-08-29 03:26:59 +03:00
liveReq :: TVar LiveReqs -> RAcquire e (ReqId, TQueue RespAction)
liveReq vLiv = mkRAcquire ins del
where
ins = atomically (newLiveReq vLiv)
del = atomically . rmLiveReq vLiv . fst
2019-08-29 03:26:59 +03:00
app :: HasLogFunc e
=> e -> ServId -> TVar LiveReqs -> (Ev -> STM ()) -> WhichServer
-> W.Application
app env sId liv plan which req respond =
runRIO env $
rwith (liveReq liv) $ \(reqId, respVar) -> do
body <- reqBody req
meth <- maybe (error "bad method") pure (cookMeth req)
2019-08-03 22:26:45 +03:00
let addr = reqAddr req
hdrs = convertHeaders $ W.requestHeaders req
evReq = HttpRequest meth (reqUrl req) hdrs body
2019-08-03 22:26:45 +03:00
atomically $ plan (reqEv sId reqId which addr evReq)
2019-05-25 02:03:46 +03:00
try (sendResponse respond respVar) >>= \case
Right rr -> pure rr
2019-08-29 03:26:59 +03:00
Left exn -> do
io $ atomically $ plan (cancelEv sId reqId)
logError $ display ("Exception during request" <> tshow exn)
throwIO (exn :: SomeException)
2019-05-25 02:03:46 +03:00
2019-08-03 22:26:45 +03:00
-- Top-Level Driver Interface --------------------------------------------------
data CantOpenPort = CantOpenPort W.Port
deriving (Eq, Ord, Show, Exception)
data WhichPort
= WPSpecific W.Port
| WPChoices [W.Port]
data SockOpts = SockOpts
{ soLocalhost :: Bool
, soWhich :: WhichPort
}
data PortsToTry = PortsToTry
{ pttSec :: SockOpts
, pttIns :: SockOpts
, pttLop :: SockOpts
}
2020-01-23 07:16:09 +03:00
{-|
2019-12-20 23:58:16 +03:00
Opens a socket on some port, accepting connections from `127.0.0.1`
if fake and `0.0.0.0` if real.
2019-12-20 23:58:16 +03:00
It will attempt to open a socket on each of the supplied ports in
order. If they all fail, it will ask the operating system to give
us an open socket on *any* open port. If that fails, it will throw
an exception.
-}
openPort :: forall e . HasLogFunc e => SockOpts -> RIO e (W.Port, Net.Socket)
openPort SockOpts {..} = case soWhich of
WPSpecific x -> insist (fromIntegral x)
WPChoices xs -> loop (fromIntegral <$> xs)
where
loop :: [W.Port] -> RIO e (W.Port, Net.Socket)
loop = \case
[] -> do
logTrace "Fallback: asking the OS to give us some free port."
ps <- io W.openFreePort
logTrace (display ("Opened port " <> tshow (fst ps)))
pure ps
x : xs -> do
logTrace (display ("Trying to open port " <> tshow x))
io (tryOpen x) >>= \case
Left (err :: IOError) -> do
logWarn (display ("Failed to open port " <> tshow x))
logWarn (display (tshow err))
loop xs
Right ps -> do
logTrace (display ("Opened port " <> tshow (fst ps)))
pure ps
insist :: W.Port -> RIO e (W.Port, Net.Socket)
insist p = do
logTrace (display ("Opening configured port " <> tshow p))
io (tryOpen p) >>= \case
Left (err :: IOError) -> do
logWarn (display ("Failed to open port " <> tshow p))
logWarn (display (tshow err))
throwIO (CantOpenPort p)
Right ps -> do
logTrace (display ("Opened port " <> tshow (fst ps)))
pure ps
bindTo = if soLocalhost then "127.0.0.1" else "0.0.0.0"
getBindAddr :: W.Port -> IO SockAddr
getBindAddr por =
Net.getAddrInfo Nothing (Just bindTo) (Just (show por)) >>= \case
[] -> error "this should never happen."
x : _ -> pure (Net.addrAddress x)
bindListenPort :: W.Port -> Net.Socket -> IO Net.PortNumber
bindListenPort por sok = do
Net.bind sok =<< getBindAddr por
Net.listen sok 1
Net.socketPort sok
-- `inet_addr`, `bind`, and `listen` all throw `IOError` if they fail.
tryOpen :: W.Port -> IO (Either IOError (W.Port, Net.Socket))
tryOpen por = do
sok <- Net.socket Net.AF_INET Net.Stream Net.defaultProtocol
try (bindListenPort por sok) >>= \case
Left exn -> Net.close sok $> Left exn
Right por -> pure (Right (fromIntegral por, sok))
httpServerPorts :: HasShipEnv e => Bool -> RIO e PortsToTry
httpServerPorts fak = do
ins <- view (networkConfigL . ncHttpPort . to (fmap fromIntegral))
sec <- view (networkConfigL . ncHttpsPort . to (fmap fromIntegral))
lop <- view (networkConfigL . ncLocalPort . to (fmap fromIntegral))
localMode <- view (networkConfigL . ncNetMode . to (== NMLocalhost))
let local = localMode || fak
let pttSec = case (sec, fak) of
(Just p , _ ) -> SockOpts local (WPSpecific p)
(Nothing, False) -> SockOpts local (WPChoices (443 : [8443 .. 8448]))
(Nothing, True ) -> SockOpts local (WPChoices ([8443 .. 8448]))
let pttIns = case (ins, fak) of
(Just p , _ ) -> SockOpts local (WPSpecific p)
(Nothing, False) -> SockOpts local (WPChoices (80 : [8080 .. 8085]))
(Nothing, True ) -> SockOpts local (WPChoices [8080 .. 8085])
let pttLop = case (lop, fak) of
(Just p , _) -> SockOpts local (WPSpecific p)
(Nothing, _) -> SockOpts local (WPChoices [12321 .. 12326])
pure (PortsToTry { .. })
parseCerts :: ByteString -> Maybe (ByteString, [ByteString])
parseCerts bs = do
pems <- pemParseBS bs & either (const Nothing) Just
case pems of
[] -> Nothing
p:ps -> pure (pemWriteBS p, pemWriteBS <$> ps)
startServ :: (HasPierConfig e, HasLogFunc e, HasNetworkConfig e)
=> Bool -> HttpServerConf -> (Ev -> STM ())
2019-08-29 03:26:59 +03:00
-> RIO e Serv
startServ isFake conf plan = do
2019-08-29 03:26:59 +03:00
logDebug "startServ"
let tls = do (PEM key, PEM certs) <- hscSecure conf
(cert, chain) <- parseCerts (wainBytes certs)
pure $ W.tlsSettingsChainMemory cert chain $ wainBytes key
2019-08-02 08:07:20 +03:00
2019-08-29 03:26:59 +03:00
sId <- io $ ServId . UV . fromIntegral <$> (randomIO :: IO Word32)
liv <- newTVarIO emptyLiveReqs
2019-05-25 02:03:46 +03:00
ptt <- httpServerPorts isFake
(httpPortInt, httpSock) <- openPort (pttIns ptt)
(httpsPortInt, httpsSock) <- openPort (pttSec ptt)
(loopPortInt, loopSock) <- openPort (pttLop ptt)
2019-08-22 04:18:10 +03:00
let httpPort = Port (fromIntegral httpPortInt)
httpsPort = Port (fromIntegral httpsPortInt)
loopPort = Port (fromIntegral loopPortInt)
2019-08-22 04:18:10 +03:00
let loopOpts = W.defaultSettings & W.setPort (fromIntegral loopPort)
& W.setHost "127.0.0.1"
& W.setTimeout (5 * 60)
2019-12-20 01:20:04 +03:00
httpOpts = W.defaultSettings & W.setHost "*"
& W.setPort (fromIntegral httpPort)
httpsOpts = W.defaultSettings & W.setHost "*"
& W.setPort (fromIntegral httpsPort)
2019-05-25 02:03:46 +03:00
2019-08-29 03:26:59 +03:00
env <- ask
2019-08-29 03:26:59 +03:00
logDebug "Starting loopback server"
loopTid <- async $ io
$ W.runSettingsSocket loopOpts loopSock
$ app env sId liv plan Loopback
2019-05-25 02:03:46 +03:00
2019-08-29 03:26:59 +03:00
logDebug "Starting HTTP server"
httpTid <- async $ io
$ W.runSettingsSocket httpOpts httpSock
$ app env sId liv plan Insecure
logDebug "Starting HTTPS server"
httpsTid <- for tls $ \tlsOpts ->
2019-08-29 03:26:59 +03:00
async $ io
$ W.runTLSSocket tlsOpts httpsOpts httpsSock
$ app env sId liv plan Secure
pierPath <- view pierPathL
let por = Ports (tls <&> const httpsPort) httpPort loopPort
fil = pierPath <> "/.http.ports"
2019-08-29 03:26:59 +03:00
logDebug $ displayShow (sId, por, fil)
2019-07-22 21:10:27 +03:00
2019-08-29 03:26:59 +03:00
logDebug "Finished started HTTP Servers"
pure $ Serv sId conf
loopTid httpTid httpsTid
httpSock httpsSock loopSock
por fil liv
2019-08-29 03:26:59 +03:00
killServ :: HasLogFunc e => Serv -> RIO e ()
killServ Serv{..} = do
cancel sLoopTid
2019-08-03 22:26:45 +03:00
cancel sHttpTid
traverse_ cancel sHttpsTid
io $ Net.close sHttpSock
io $ Net.close sHttpsSock
io $ Net.close sLoopSock
removePortsFile sPortsFile
(void . waitCatch) sLoopTid
(void . waitCatch) sHttpTid
traverse_ (void . waitCatch) sHttpsTid
2019-08-29 03:26:59 +03:00
kill :: HasLogFunc e => Drv -> RIO e ()
2019-08-03 22:26:45 +03:00
kill (Drv v) = stopService v killServ >>= fromEither
2019-08-29 03:26:59 +03:00
respond :: HasLogFunc e
=> Drv -> ReqId -> HttpEvent -> RIO e ()
2019-08-03 22:26:45 +03:00
respond (Drv v) reqId ev = do
readMVar v >>= \case
Nothing -> logWarn "Got a response to a request that does not exist."
2019-08-29 03:26:59 +03:00
Just sv -> do logDebug $ displayShow $ reorgHttpEvent ev
for_ (reorgHttpEvent ev) $
atomically . respondToLiveReq (sLiveReqs sv) reqId
2019-05-25 02:03:46 +03:00
serv :: e. HasShipEnv e
=> KingId -> QueueEv -> Bool
2019-08-29 03:26:59 +03:00
-> ([Ev], RAcquire e (EffCb e HttpServerEf))
serv king plan isFake =
2019-08-03 22:26:45 +03:00
(initialEvents, runHttpServer)
where
2019-08-03 22:26:45 +03:00
initialEvents :: [Ev]
initialEvents = [bornEv king]
2019-05-25 02:03:46 +03:00
2019-08-29 03:26:59 +03:00
runHttpServer :: RAcquire e (EffCb e HttpServerEf)
runHttpServer = handleEf <$> mkRAcquire (Drv <$> newMVar Nothing) kill
2019-08-29 03:26:59 +03:00
restart :: Drv -> HttpServerConf -> RIO e Serv
2019-08-03 22:26:45 +03:00
restart (Drv var) conf = do
2019-08-29 03:26:59 +03:00
logDebug "Restarting http server"
res <- fromEither =<<
restartService var (startServ isFake conf plan) killServ
2019-08-29 03:26:59 +03:00
logDebug "Done restating http server"
pure res
2019-08-29 03:26:59 +03:00
handleEf :: Drv -> HttpServerEf -> RIO e ()
2019-08-03 22:26:45 +03:00
handleEf drv = \case
HSESetConfig (i, ()) conf -> do
-- print (i, king)
-- when (i == fromIntegral king) $ do
2019-08-29 03:26:59 +03:00
logDebug "restarting"
Serv{..} <- restart drv conf
2019-08-29 03:26:59 +03:00
logDebug "Enqueue %live"
atomically $ plan (liveEv sServId sPorts)
2019-08-29 03:26:59 +03:00
logDebug "Write ports file"
writePortsFile sPortsFile sPorts
HSEResponse (i, req, _seq, ()) ev -> do
-- print (i, king)
-- when (i == fromIntegral king) $ do
2019-08-29 03:26:59 +03:00
logDebug "respond"
2019-08-03 22:26:45 +03:00
respond drv (fromIntegral req) ev
-- Multi-Tenet HTTP ------------------------------------------------------------
{-
# Very First Phase: Shared HTTP, no SSL.
- Global configuration flag for shared HTTP port.
- Shared server starts before ships.
- Shared server is informed when ships go up and come down.
- Shared server delivers requests to existing HTTP driver.
- Existing HTTP driver can send responses to shared HTTP server.
-}
type ShareRequ = (ServId, ReqId, WhichServer, Address, HttpRequest)
type ShareResp = (ServId, UD, UD, HttpEvent)
data ShipAPI = ShipAPI
{ sapiReq :: ShareRequ -> STM ()
, sapiRes :: STM ShareResp
}
data MultiServ = MultiServ
{ msPort :: Maybe Word16
, msShip :: TVar (Map Ship ShipAPI)
, msBoot :: TMVar (Ship, ShipAPI)
, msDead :: TMVar Ship
, msKill :: STM ()
}
data Hap = Deþ Ship
| Lif (Ship, ShipAPI)
| Res ShareResp
| Kil ()
multiServ :: MultiServ -> IO ()
multiServ ms = do
case msPort ms of
Nothing -> doNothing ms
Just po -> doSomething ms po
{-
If the port is set, we do things for real. We run an HTTP server,
sends requests to the appropriate ship, respond to requests when
responses are given, and shuts down when the king shuts down.
-}
doSomething :: MultiServ -> Word16 -> IO ()
doSomething MultiServ{..} httpPort = do
error "TODO"
{-
If the port is not set, we still run a thread for the shared server. It
doesn't run an HTTP server, it ignores all responses, and it shuts
down when the king shuts down.
-}
doNothing :: MultiServ -> IO ()
doNothing MultiServ{..} = do
vShips :: TVar (Map Ship ShipAPI) <- newTVarIO mempty
let onHapn :: STM Hap
onHapn = asum [ Lif <$> takeTMVar msBoot
, Deþ <$> takeTMVar msDead
, Res <$> (readTVar vShips >>= asum . fmap sapiRes . toList)
, Kil <$> msKill
]
let loop = join $ atomically $ onHapn >>= \case
Deþ s -> modifyTVar' vShips (deleteMap s) >> pure loop
Lif (s,api) -> modifyTVar' vShips (insertMap s api) >> pure loop
Res _ -> pure loop
Kil _ -> pure (pure ())
loop