2019-08-04 00:38:30 +03:00
|
|
|
{-
|
2019-08-08 01:24:02 +03:00
|
|
|
TODO What is this about?
|
2019-08-04 00:38:30 +03:00
|
|
|
|
|
|
|
// 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;
|
|
|
|
}
|
|
|
|
|
2019-08-08 01:24:02 +03:00
|
|
|
TODO Does this matter, is is using WAI's default behavior ok?
|
2019-08-04 00:38:30 +03:00
|
|
|
|
|
|
|
rec_u->res.reason = (status < 200) ? "weird" :
|
|
|
|
(status < 300) ? "ok" :
|
|
|
|
(status < 400) ? "moved" :
|
|
|
|
(status < 500) ? "missing" :
|
|
|
|
"hosed";
|
2019-08-22 04:18:10 +03:00
|
|
|
|
|
|
|
TODO This uses `W.openFreePort` to find a free port, but I actually
|
|
|
|
want to mimick the old kings behavior and try 8080, then 8081,
|
|
|
|
etc. I think I'll have to reimplement a varianet of
|
|
|
|
`openFreePort` myself, but this will work for now.
|
2019-08-04 00:38:30 +03:00
|
|
|
-}
|
|
|
|
|
2019-05-16 03:00:10 +03:00
|
|
|
module Vere.Http.Server where
|
|
|
|
|
2019-08-03 22:26:45 +03:00
|
|
|
import Arvo hiding (ServerId, reqBody, reqUrl, secure)
|
2019-10-22 21:25:04 +03:00
|
|
|
import Config
|
2019-08-03 22:26:45 +03:00
|
|
|
import Data.Conduit
|
2019-07-12 22:18:14 +03:00
|
|
|
import Noun
|
2019-08-03 22:26:45 +03:00
|
|
|
import UrbitPrelude hiding (Builder)
|
2019-08-02 08:07:20 +03:00
|
|
|
import Vere.Pier.Types
|
2019-05-16 03:00:10 +03:00
|
|
|
|
2019-08-03 03:09:53 +03:00
|
|
|
import Data.Binary.Builder (Builder, fromByteString)
|
|
|
|
import Data.Bits (shiftL, (.|.))
|
|
|
|
import Network.Socket (SockAddr(..))
|
2019-08-08 01:24:02 +03:00
|
|
|
import System.Directory (doesFileExist, removeFile)
|
2019-08-03 03:09:53 +03:00
|
|
|
import System.Random (randomIO)
|
2019-08-03 22:26:45 +03:00
|
|
|
import Vere.Http (convertHeaders, unconvertHeaders)
|
2019-05-31 05:53:00 +03:00
|
|
|
|
|
|
|
import qualified Network.HTTP.Types as H
|
|
|
|
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
|
|
|
|
2019-08-02 09:56:42 +03:00
|
|
|
|
2019-08-08 01:24:02 +03:00
|
|
|
-- Internal Types --------------------------------------------------------------
|
|
|
|
|
2019-12-13 06:01:03 +03:00
|
|
|
type ReqId = Atom
|
2019-08-08 01:24:02 +03:00
|
|
|
type SeqId = UD -- Unused, always 1
|
2019-08-02 09:56:42 +03:00
|
|
|
|
2019-08-03 22:26:45 +03:00
|
|
|
{-
|
|
|
|
The sequence of actions on a given request *should* be:
|
2019-08-02 09:56:42 +03:00
|
|
|
|
2019-08-03 22:26:45 +03:00
|
|
|
[%head .] [%bloc .]* %done
|
2019-08-02 09:56:42 +03:00
|
|
|
|
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-02 09:56:42 +03:00
|
|
|
|
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
|
2019-08-08 01:24:02 +03:00
|
|
|
= RAHead ResponseHeader File
|
|
|
|
| RAFull ResponseHeader File
|
2019-08-03 22:26:45 +03:00
|
|
|
| RABloc File
|
|
|
|
| RADone
|
2019-08-08 01:24:02 +03:00
|
|
|
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 ())
|
|
|
|
, sPorts :: Ports
|
|
|
|
, sPortsFile :: FilePath
|
|
|
|
, sLiveReqs :: TVar LiveReqs
|
|
|
|
}
|
|
|
|
|
|
|
|
|
|
|
|
-- RespAction -- Reorganized HttpEvent for Cleaner Processing ------------------
|
2019-07-23 05:35:15 +03:00
|
|
|
|
2019-08-03 22:26:45 +03:00
|
|
|
reorgHttpEvent :: HttpEvent -> [RespAction]
|
|
|
|
reorgHttpEvent = \case
|
2019-08-08 01:24:02 +03:00
|
|
|
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-07-23 05:35:15 +03:00
|
|
|
|
|
|
|
|
2019-08-03 22:26:45 +03:00
|
|
|
-- Generic Service Stop/Restart -- Using an MVar for Atomicity -----------------
|
2019-06-26 03:15:49 +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)
|
2019-08-08 01:24:02 +03:00
|
|
|
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)
|
2019-08-08 01:24:02 +03:00
|
|
|
doStart = do
|
2019-08-29 03:26:59 +03:00
|
|
|
logDebug "doStart"
|
2019-08-02 08:07:20 +03:00
|
|
|
try sstart <&> \case
|
2019-08-08 01:24:02 +03:00
|
|
|
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 ()
|
2019-08-08 01:24:02 +03:00
|
|
|
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) })
|
|
|
|
|
2019-08-08 01:24:02 +03:00
|
|
|
newLiveReq :: TVar LiveReqs -> STM (ReqId, TQueue RespAction)
|
2019-08-03 22:26:45 +03:00
|
|
|
newLiveReq var = do
|
|
|
|
liv <- readTVar var
|
2019-08-08 01:24:02 +03:00
|
|
|
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)
|
|
|
|
|
|
|
|
|
2019-08-08 01:24:02 +03:00
|
|
|
-- Ports File ------------------------------------------------------------------
|
|
|
|
|
2019-08-29 03:26:59 +03:00
|
|
|
removePortsFile :: FilePath -> RIO e ()
|
2019-08-08 01:24:02 +03:00
|
|
|
removePortsFile pax =
|
2019-08-29 03:26:59 +03:00
|
|
|
io (doesFileExist pax) >>= \case
|
|
|
|
True -> io $ removeFile pax
|
2019-08-08 01:24:02 +03:00
|
|
|
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 ()
|
2019-08-08 01:24:02 +03:00
|
|
|
writePortsFile f = writeFile f . encodeUtf8 . portsFileText
|
|
|
|
|
|
|
|
|
2019-08-02 09:56:42 +03:00
|
|
|
-- Random Helpers --------------------------------------------------------------
|
|
|
|
|
|
|
|
cordBytes :: Cord -> ByteString
|
|
|
|
cordBytes = encodeUtf8 . unCord
|
|
|
|
|
2019-08-04 00:38:30 +03:00
|
|
|
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
|
2019-08-14 03:52:59 +03:00
|
|
|
reqUrl r = Cord $ decodeUtf8 $ W.rawPathInfo r <> W.rawQueryString r
|
2019-08-03 22:26:45 +03:00
|
|
|
|
2019-08-02 09:56:42 +03:00
|
|
|
|
|
|
|
-- Utilities for Constructing Events -------------------------------------------
|
2019-08-02 08:07:20 +03:00
|
|
|
|
2019-08-04 00:38:30 +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
|
2019-08-02 09:56:42 +03:00
|
|
|
bornEv king =
|
2019-08-03 22:26:45 +03:00
|
|
|
servEv $ HttpServerEvBorn (king, ()) ()
|
2019-08-02 08:07:20 +03:00
|
|
|
|
2019-08-08 01:24:02 +03:00
|
|
|
liveEv :: ServId -> Ports -> Ev
|
|
|
|
liveEv sId Ports{..} =
|
|
|
|
servEv $ HttpServerEvLive (sId, ()) pHttp pHttps
|
2019-08-02 09:56:42 +03:00
|
|
|
|
2019-08-07 03:46:47 +03:00
|
|
|
cancelEv :: ServId -> ReqId -> Ev
|
|
|
|
cancelEv sId reqId =
|
|
|
|
servEv $ HttpServerEvCancelRequest (sId, reqId, 1, ()) ()
|
|
|
|
|
2019-08-04 00:38:30 +03:00
|
|
|
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-07-12 22:18:14 +03:00
|
|
|
|
2019-08-03 22:26:45 +03:00
|
|
|
-- Http Server Flows -----------------------------------------------------------
|
2019-08-02 08:07:20 +03:00
|
|
|
|
2019-08-08 01:24:02 +03:00
|
|
|
data Req
|
|
|
|
= RHead ResponseHeader [File]
|
|
|
|
| RFull ResponseHeader [File]
|
|
|
|
| RNone
|
|
|
|
|
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.
|
|
|
|
-}
|
2019-08-29 03:26:59 +03:00
|
|
|
getReq :: TQueue RespAction -> RIO e Req
|
2019-08-08 01:24:02 +03:00
|
|
|
getReq tmv = go []
|
2019-08-03 22:26:45 +03:00
|
|
|
where
|
2019-08-08 01:24:02 +03:00
|
|
|
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
|
|
|
|
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-08-29 03:26:59 +03:00
|
|
|
logDupHead = runRIO env
|
|
|
|
$ logError "Multiple %head actions on one request"
|
2019-08-02 08:07:20 +03:00
|
|
|
|
2019-08-08 01:24:02 +03:00
|
|
|
yieldÇunk = \case
|
|
|
|
"" -> pure ()
|
|
|
|
c -> (yieldFlush . fromByteString . unOcts . unFile) c
|
|
|
|
|
|
|
|
go = atomically (readTQueue tmv) >>= \case
|
|
|
|
RAHead head c -> logDupHead >> yieldÇunk c >> go
|
|
|
|
RAFull head c -> logDupHead >> yieldÇunk c >> go
|
|
|
|
RABloc c -> yieldÇunk c
|
|
|
|
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
|
2019-08-08 01:24:02 +03:00
|
|
|
getReq 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
|
2019-08-07 03:46:47 +03:00
|
|
|
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
|
2019-08-04 00:38:30 +03:00
|
|
|
body <- reqBody req
|
|
|
|
meth <- maybe (error "bad method") pure (cookMeth req)
|
2019-08-03 22:26:45 +03:00
|
|
|
|
2019-08-04 00:38:30 +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
|
|
|
|
2019-08-04 00:38:30 +03:00
|
|
|
atomically $ plan (reqEv sId reqId which addr evReq)
|
2019-05-25 02:03:46 +03:00
|
|
|
|
2019-08-07 03:46:47 +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 --------------------------------------------------
|
|
|
|
|
2019-08-02 08:07:20 +03:00
|
|
|
{-
|
2019-08-02 09:56:42 +03:00
|
|
|
TODO Need to find an open port.
|
2019-08-02 08:07:20 +03:00
|
|
|
-}
|
2019-10-18 00:06:25 +03:00
|
|
|
startServ :: (HasPierConfig e, HasLogFunc e)
|
|
|
|
=> HttpServerConf -> (Ev -> STM ())
|
2019-08-29 03:26:59 +03:00
|
|
|
-> RIO e Serv
|
2019-10-18 00:06:25 +03:00
|
|
|
startServ conf plan = do
|
2019-08-29 03:26:59 +03:00
|
|
|
logDebug "startServ"
|
2019-08-08 01:24:02 +03:00
|
|
|
|
|
|
|
let tls = hscSecure conf <&> \(PEM key, PEM cert) ->
|
|
|
|
(W.tlsSettingsMemory (cordBytes cert) (cordBytes 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)
|
2019-08-02 09:56:42 +03:00
|
|
|
liv <- newTVarIO emptyLiveReqs
|
2019-05-25 02:03:46 +03:00
|
|
|
|
2019-08-29 03:26:59 +03:00
|
|
|
(httpPortInt, httpSock) <- io $ W.openFreePort -- 8080 -- 80 if real ship
|
|
|
|
(httpsPortInt, httpsSock) <- io $ W.openFreePort -- 8443 -- 443 if real ship
|
|
|
|
(loopPortInt, loopSock) <- io $ W.openFreePort -- 12321 -- ??? if real ship
|
2019-08-22 04:18:10 +03:00
|
|
|
|
|
|
|
let httpPort = Port (fromIntegral httpPortInt)
|
|
|
|
httpsPort = Port (fromIntegral httpsPortInt)
|
|
|
|
loopPort = Port (fromIntegral loopPortInt)
|
2019-08-04 00:38:30 +03:00
|
|
|
|
2019-08-22 04:18:10 +03:00
|
|
|
let loopOpts = W.defaultSettings & W.setPort (fromIntegral loopPort)
|
2019-08-04 00:38:30 +03:00
|
|
|
& W.setHost "127.0.0.1"
|
|
|
|
& W.setTimeout (5 * 60)
|
|
|
|
httpOpts = W.defaultSettings & W.setPort (fromIntegral httpPort)
|
|
|
|
httpsOpts = W.defaultSettings & W.setPort (fromIntegral httpsPort)
|
2019-05-25 02:03:46 +03:00
|
|
|
|
2019-08-29 03:26:59 +03:00
|
|
|
env <- ask
|
2019-08-08 01:24:02 +03:00
|
|
|
|
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"
|
2019-08-08 01:24:02 +03:00
|
|
|
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
|
2019-08-08 01:24:02 +03:00
|
|
|
|
2019-10-18 00:06:25 +03:00
|
|
|
pierPath <- getPierPath
|
2019-08-08 01:24:02 +03:00
|
|
|
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"
|
2019-08-02 09:56:42 +03:00
|
|
|
|
2019-08-08 01:24:02 +03:00
|
|
|
pure $ Serv sId conf loopTid httpTid httpsTid por fil liv
|
2019-08-03 03:09:53 +03:00
|
|
|
|
2019-08-29 03:26:59 +03:00
|
|
|
killServ :: HasLogFunc e => Serv -> RIO e ()
|
2019-08-08 01:24:02 +03:00
|
|
|
killServ Serv{..} = do
|
2019-08-04 00:38:30 +03:00
|
|
|
cancel sLoopTid
|
2019-08-03 22:26:45 +03:00
|
|
|
cancel sHttpTid
|
2019-08-08 01:24:02 +03:00
|
|
|
traverse_ cancel sHttpsTid
|
|
|
|
removePortsFile sPortsFile
|
|
|
|
(void . waitCatch) sLoopTid
|
|
|
|
(void . waitCatch) sHttpTid
|
|
|
|
traverse_ (void . waitCatch) sHttpsTid
|
2019-08-02 09:56:42 +03:00
|
|
|
|
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-03 03:09:53 +03:00
|
|
|
|
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 -> pure ()
|
2019-08-29 03:26:59 +03:00
|
|
|
Just sv -> do logDebug $ displayShow $ reorgHttpEvent ev
|
2019-08-08 01:24:02 +03:00
|
|
|
for_ (reorgHttpEvent ev) $
|
|
|
|
atomically . respondToLiveReq (sLiveReqs sv) reqId
|
2019-05-25 02:03:46 +03:00
|
|
|
|
2019-10-18 00:06:25 +03:00
|
|
|
serv :: ∀e. (HasPierConfig e, HasLogFunc e)
|
|
|
|
=> KingId -> QueueEv
|
2019-08-29 03:26:59 +03:00
|
|
|
-> ([Ev], RAcquire e (EffCb e HttpServerEf))
|
2019-10-18 00:06:25 +03:00
|
|
|
serv king plan =
|
2019-08-03 22:26:45 +03:00
|
|
|
(initialEvents, runHttpServer)
|
2019-08-03 03:09:53 +03:00
|
|
|
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-02 09:56:42 +03:00
|
|
|
|
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"
|
2019-10-18 00:06:25 +03:00
|
|
|
res <- fromEither =<< restartService var (startServ conf plan) killServ
|
2019-08-29 03:26:59 +03:00
|
|
|
logDebug "Done restating http server"
|
2019-08-08 01:24:02 +03:00
|
|
|
pure res
|
2019-08-02 09:56:42 +03:00
|
|
|
|
2019-08-29 03:26:59 +03:00
|
|
|
handleEf :: Drv -> HttpServerEf -> RIO e ()
|
2019-08-03 22:26:45 +03:00
|
|
|
handleEf drv = \case
|
2019-08-08 01:24:02 +03:00
|
|
|
HSESetConfig (i, ()) conf -> do
|
|
|
|
-- print (i, king)
|
|
|
|
-- when (i == fromIntegral king) $ do
|
2019-08-29 03:26:59 +03:00
|
|
|
logDebug "restarting"
|
2019-08-08 01:24:02 +03:00
|
|
|
Serv{..} <- restart drv conf
|
2019-08-29 03:26:59 +03:00
|
|
|
logDebug "Enqueue %live"
|
2019-08-08 01:24:02 +03:00
|
|
|
atomically $ plan (liveEv sServId sPorts)
|
2019-08-29 03:26:59 +03:00
|
|
|
logDebug "Write ports file"
|
2019-08-08 01:24:02 +03:00
|
|
|
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
|