{-# LANGUAGE CPP #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE BangPatterns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE ScopedTypeVariables #-}
module Network.Wai.Handler.Warp.HTTP2 (
http2
, http2server
) where
import qualified Data.ByteString as BS
import Data.IORef (IORef, newIORef, writeIORef, readIORef)
import qualified Data.IORef as I
import qualified Network.HTTP2.Frame as H2
import qualified Network.HTTP2.Server as H2
import Network.Socket (SockAddr)
import Network.Socket.BufferPool
import Network.Wai
import Network.Wai.Internal (ResponseReceived(..))
import qualified System.TimeManager as T
import qualified UnliftIO
import Network.Wai.Handler.Warp.HTTP2.File
import Network.Wai.Handler.Warp.HTTP2.PushPromise
import Network.Wai.Handler.Warp.HTTP2.Request
import Network.Wai.Handler.Warp.HTTP2.Response
import Network.Wai.Handler.Warp.Imports
import qualified Network.Wai.Handler.Warp.Settings as S
import Network.Wai.Handler.Warp.Types
http2 :: S.Settings -> InternalInfo -> Connection -> Transport -> Application -> SockAddr -> T.Handle -> ByteString -> IO ()
http2 :: Settings
-> InternalInfo
-> Connection
-> Transport
-> Application
-> SockAddr
-> Handle
-> ByteString
-> IO ()
http2 Settings
settings InternalInfo
ii Connection
conn Transport
transport Application
app SockAddr
peersa Handle
th ByteString
bs = do
IORef Bool
istatus <- forall a. a -> IO (IORef a)
newIORef Bool
False
RecvN
rawRecvN <- ByteString -> Recv -> IO RecvN
makeRecvN ByteString
bs forall a b. (a -> b) -> a -> b
$ Connection -> Recv
connRecv Connection
conn
WriteBuffer
writeBuffer <- forall a. IORef a -> IO a
readIORef forall a b. (a -> b) -> a -> b
$ Connection -> IORef WriteBuffer
connWriteBuffer Connection
conn
let recvN :: RecvN
recvN = Handle -> IORef Bool -> Int -> RecvN -> RecvN
wrappedRecvN Handle
th IORef Bool
istatus (Settings -> Int
S.settingsSlowlorisSize Settings
settings) RecvN
rawRecvN
sendBS :: ByteString -> IO ()
sendBS ByteString
x = Connection -> ByteString -> IO ()
connSendAll Connection
conn ByteString
x forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> Handle -> IO ()
T.tickle Handle
th
conf :: Config
conf = H2.Config {
confWriteBuffer :: Buffer
confWriteBuffer = WriteBuffer -> Buffer
bufBuffer WriteBuffer
writeBuffer
, confBufferSize :: Int
confBufferSize = WriteBuffer -> Int
bufSize WriteBuffer
writeBuffer
, confSendAll :: ByteString -> IO ()
confSendAll = ByteString -> IO ()
sendBS
, confReadN :: RecvN
confReadN = RecvN
recvN
, confPositionReadMaker :: PositionReadMaker
confPositionReadMaker = InternalInfo -> PositionReadMaker
pReadMaker InternalInfo
ii
, confTimeoutManager :: Manager
confTimeoutManager = InternalInfo -> Manager
timeoutManager InternalInfo
ii
#if MIN_VERSION_http2(4,2,0)
, confMySockAddr :: SockAddr
confMySockAddr = Connection -> SockAddr
connMySockAddr Connection
conn
, confPeerSockAddr :: SockAddr
confPeerSockAddr = SockAddr
peersa
#endif
}
IO ()
checkTLS
Connection -> Bool -> IO ()
setConnHTTP2 Connection
conn Bool
True
Config -> Server -> IO ()
H2.run Config
conf forall a b. (a -> b) -> a -> b
$ Settings
-> InternalInfo -> Transport -> SockAddr -> Application -> Server
http2server Settings
settings InternalInfo
ii Transport
transport SockAddr
peersa Application
app
where
checkTLS :: IO ()
checkTLS = case Transport
transport of
Transport
TCP -> forall (m :: * -> *) a. Monad m => a -> m a
return ()
Transport
tls -> forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
unless (Transport -> Bool
tls12orLater Transport
tls) forall a b. (a -> b) -> a -> b
$ Connection -> ErrorCodeId -> ByteString -> IO ()
goaway Connection
conn ErrorCodeId
H2.InadequateSecurity ByteString
"Weak TLS"
tls12orLater :: Transport -> Bool
tls12orLater Transport
tls = Transport -> Int
tlsMajorVersion Transport
tls forall a. Eq a => a -> a -> Bool
== Int
3 Bool -> Bool -> Bool
&& Transport -> Int
tlsMinorVersion Transport
tls forall a. Ord a => a -> a -> Bool
>= Int
3
http2server :: S.Settings
-> InternalInfo
-> Transport
-> SockAddr
-> Application
-> H2.Server
http2server :: Settings
-> InternalInfo -> Transport -> SockAddr -> Application -> Server
http2server Settings
settings InternalInfo
ii Transport
transport SockAddr
addr Application
app Request
h2req0 Aux
aux0 Response -> [PushPromise] -> IO ()
response = do
Request
req <- Request -> Aux -> IO Request
toWAIRequest Request
h2req0 Aux
aux0
IORef (Maybe (Response, [PushPromise], Status))
ref <- forall a. a -> IO (IORef a)
I.newIORef forall a. Maybe a
Nothing
Either SomeException ResponseReceived
eResponseReceived <- forall (m :: * -> *) a.
MonadUnliftIO m =>
m a -> m (Either SomeException a)
UnliftIO.tryAny forall a b. (a -> b) -> a -> b
$ Application
app Request
req forall a b. (a -> b) -> a -> b
$ \Response
rsp -> do
(Response
h2rsp,Status
st,Bool
hasBody) <- Settings
-> InternalInfo
-> Request
-> Response
-> IO (Response, Status, Bool)
fromResponse Settings
settings InternalInfo
ii Request
req Response
rsp
[PushPromise]
pps <- if Bool
hasBody then InternalInfo -> Request -> IO [PushPromise]
fromPushPromises InternalInfo
ii Request
req else forall (m :: * -> *) a. Monad m => a -> m a
return []
forall a. IORef a -> a -> IO ()
I.writeIORef IORef (Maybe (Response, [PushPromise], Status))
ref forall a b. (a -> b) -> a -> b
$ forall a. a -> Maybe a
Just (Response
h2rsp, [PushPromise]
pps, Status
st)
()
_ <- Response -> [PushPromise] -> IO ()
response Response
h2rsp [PushPromise]
pps
forall (m :: * -> *) a. Monad m => a -> m a
return ResponseReceived
ResponseReceived
case Either SomeException ResponseReceived
eResponseReceived of
Right ResponseReceived
ResponseReceived -> do
Just (Response
h2rsp, [PushPromise]
pps, Status
st) <- forall a. IORef a -> IO a
I.readIORef IORef (Maybe (Response, [PushPromise], Status))
ref
let msiz :: Maybe Integer
msiz = forall a b. (Integral a, Num b) => a -> b
fromIntegral forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Response -> Maybe Int
H2.responseBodySize Response
h2rsp
Request -> Status -> Maybe Integer -> IO ()
logResponse Request
req Status
st Maybe Integer
msiz
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ (Request -> PushPromise -> IO ()
logPushPromise Request
req) [PushPromise]
pps
Left SomeException
e -> do
Settings -> Maybe Request -> SomeException -> IO ()
S.settingsOnException Settings
settings (forall a. a -> Maybe a
Just Request
req) SomeException
e
let ersp :: Response
ersp = Settings -> SomeException -> Response
S.settingsOnExceptionResponse Settings
settings SomeException
e
st :: Status
st = Response -> Status
responseStatus Response
ersp
(Response
h2rsp',Status
_,Bool
_) <- Settings
-> InternalInfo
-> Request
-> Response
-> IO (Response, Status, Bool)
fromResponse Settings
settings InternalInfo
ii Request
req Response
ersp
let msiz :: Maybe Integer
msiz = forall a b. (Integral a, Num b) => a -> b
fromIntegral forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Response -> Maybe Int
H2.responseBodySize Response
h2rsp'
()
_ <- Response -> [PushPromise] -> IO ()
response Response
h2rsp' []
Request -> Status -> Maybe Integer -> IO ()
logResponse Request
req Status
st Maybe Integer
msiz
forall (m :: * -> *) a. Monad m => a -> m a
return ()
where
toWAIRequest :: Request -> Aux -> IO Request
toWAIRequest Request
h2req Aux
aux = InternalInfo -> Settings -> SockAddr -> ToReq
toRequest InternalInfo
ii Settings
settings SockAddr
addr HeaderTable
hdr Maybe Int
bdylen Recv
bdy Handle
th Transport
transport
where
!hdr :: HeaderTable
hdr = Request -> HeaderTable
H2.requestHeaders Request
h2req
!bdy :: Recv
bdy = Request -> Recv
H2.getRequestBodyChunk Request
h2req
!bdylen :: Maybe Int
bdylen = Request -> Maybe Int
H2.requestBodySize Request
h2req
!th :: Handle
th = Aux -> Handle
H2.auxTimeHandle Aux
aux
logResponse :: Request -> Status -> Maybe Integer -> IO ()
logResponse = Settings -> Request -> Status -> Maybe Integer -> IO ()
S.settingsLogger Settings
settings
logPushPromise :: Request -> PushPromise -> IO ()
logPushPromise Request
req PushPromise
pp = Request -> ByteString -> Integer -> IO ()
logger Request
req ByteString
path Integer
siz
where
!logger :: Request -> ByteString -> Integer -> IO ()
logger = Settings -> Request -> ByteString -> Integer -> IO ()
S.settingsServerPushLogger Settings
settings
!path :: ByteString
path = PushPromise -> ByteString
H2.promiseRequestPath PushPromise
pp
!siz :: Integer
siz = case Response -> Maybe Int
H2.responseBodySize forall a b. (a -> b) -> a -> b
$ PushPromise -> Response
H2.promiseResponse PushPromise
pp of
Maybe Int
Nothing -> Integer
0
Just Int
s -> forall a b. (Integral a, Num b) => a -> b
fromIntegral Int
s
wrappedRecvN :: T.Handle -> IORef Bool -> Int -> (BufSize -> IO ByteString) -> (BufSize -> IO ByteString)
wrappedRecvN :: Handle -> IORef Bool -> Int -> RecvN -> RecvN
wrappedRecvN Handle
th IORef Bool
istatus Int
slowlorisSize RecvN
readN Int
bufsize = do
ByteString
bs <- forall (m :: * -> *) a.
MonadUnliftIO m =>
(SomeException -> m a) -> m a -> m a
UnliftIO.handleAny SomeException -> Recv
handler forall a b. (a -> b) -> a -> b
$ RecvN
readN Int
bufsize
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
unless (ByteString -> Bool
BS.null ByteString
bs) forall a b. (a -> b) -> a -> b
$ do
forall a. IORef a -> a -> IO ()
writeIORef IORef Bool
istatus Bool
True
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when (ByteString -> Int
BS.length ByteString
bs forall a. Ord a => a -> a -> Bool
>= Int
slowlorisSize Bool -> Bool -> Bool
|| Int
bufsize forall a. Ord a => a -> a -> Bool
<= Int
slowlorisSize) forall a b. (a -> b) -> a -> b
$ Handle -> IO ()
T.tickle Handle
th
forall (m :: * -> *) a. Monad m => a -> m a
return ByteString
bs
where
handler :: UnliftIO.SomeException -> IO ByteString
handler :: SomeException -> Recv
handler SomeException
_ = forall (m :: * -> *) a. Monad m => a -> m a
return ByteString
""
goaway :: Connection -> H2.ErrorCodeId -> ByteString -> IO ()
goaway :: Connection -> ErrorCodeId -> ByteString -> IO ()
goaway Connection{IO ()
Recv
IORef Bool
IORef WriteBuffer
SockAddr
[ByteString] -> IO ()
RecvBuf
ByteString -> IO ()
SendFile
connHTTP2 :: Connection -> IORef Bool
connRecvBuf :: Connection -> RecvBuf
connClose :: Connection -> IO ()
connSendFile :: Connection -> SendFile
connSendMany :: Connection -> [ByteString] -> IO ()
connMySockAddr :: SockAddr
connHTTP2 :: IORef Bool
connWriteBuffer :: IORef WriteBuffer
connRecvBuf :: RecvBuf
connRecv :: Recv
connClose :: IO ()
connSendFile :: SendFile
connSendAll :: ByteString -> IO ()
connSendMany :: [ByteString] -> IO ()
connMySockAddr :: Connection -> SockAddr
connSendAll :: Connection -> ByteString -> IO ()
connWriteBuffer :: Connection -> IORef WriteBuffer
connRecv :: Connection -> Recv
..} ErrorCodeId
etype ByteString
debugmsg = ByteString -> IO ()
connSendAll ByteString
bytestream
where
einfo :: EncodeInfo
einfo = (FrameFlags -> FrameFlags) -> Int -> EncodeInfo
H2.encodeInfo forall a. a -> a
id Int
0
frame :: FramePayload
frame = Int -> ErrorCodeId -> ByteString -> FramePayload
H2.GoAwayFrame Int
0 ErrorCodeId
etype ByteString
debugmsg
bytestream :: ByteString
bytestream = EncodeInfo -> FramePayload -> ByteString
H2.encodeFrame EncodeInfo
einfo FramePayload
frame