{-# OPTIONS_GHC -fno-warn-orphans #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE UndecidableInstances #-}
module Dormouse.Client.Test.Class
  ( MonadDormouseTestClient(..)
  ) where
import Control.Monad.IO.Class ( MonadIO(..) )
import qualified Data.ByteString  as SB
import qualified Data.ByteString.Lazy  as LB
import Data.Word ( Word8 )
import Dormouse.Client.Class ( MonadDormouseClient(..) )
import Dormouse.Client.Payload ( RawRequestPayload(..) )
import Dormouse.Client.Types ( HttpRequest(..), HttpResponse(..) )
import Dormouse.Url ( IsUrl )
import Streamly ( SerialT )
import qualified Streamly.Prelude as S
import qualified Streamly.External.ByteString as SEB
import qualified Streamly.External.ByteString.Lazy as SEBL
class Monad m => MonadDormouseTestClient m where
  
  expectLbs :: IsUrl url => HttpRequest url method LB.ByteString contentTag acceptTag -> m (HttpResponse LB.ByteString)
  expectLbs HttpRequest url method ByteString contentTag acceptTag
req = do
    HttpResponse ByteString
resp <- HttpRequest url method ByteString Any Any
-> m (HttpResponse ByteString)
forall (m :: * -> *) url (method :: Symbol) contentTag acceptTag.
(MonadDormouseTestClient m, IsUrl url) =>
HttpRequest url method ByteString contentTag acceptTag
-> m (HttpResponse ByteString)
expectBs (HttpRequest url method ByteString Any Any
 -> m (HttpResponse ByteString))
-> HttpRequest url method ByteString Any Any
-> m (HttpResponse ByteString)
forall a b. (a -> b) -> a -> b
$ HttpRequest url method ByteString contentTag acceptTag
req {requestBody :: ByteString
requestBody = ByteString -> ByteString
LB.toStrict (ByteString -> ByteString) -> ByteString -> ByteString
forall a b. (a -> b) -> a -> b
$ HttpRequest url method ByteString contentTag acceptTag
-> ByteString
forall url (method :: Symbol) body contentTag acceptTag.
HttpRequest url method body contentTag acceptTag -> body
requestBody HttpRequest url method ByteString contentTag acceptTag
req}
    HttpResponse ByteString -> m (HttpResponse ByteString)
forall (m :: * -> *) a. Monad m => a -> m a
return (HttpResponse ByteString -> m (HttpResponse ByteString))
-> HttpResponse ByteString -> m (HttpResponse ByteString)
forall a b. (a -> b) -> a -> b
$ HttpResponse ByteString
resp {responseBody :: ByteString
responseBody = ByteString -> ByteString
LB.fromStrict (ByteString -> ByteString) -> ByteString -> ByteString
forall a b. (a -> b) -> a -> b
$ HttpResponse ByteString -> ByteString
forall body. HttpResponse body -> body
responseBody HttpResponse ByteString
resp}
  
  expectBs :: IsUrl url => HttpRequest url method SB.ByteString contentTag acceptTag -> m (HttpResponse SB.ByteString)
  expectBs HttpRequest url method ByteString contentTag acceptTag
req = do
    HttpResponse ByteString
resp <- HttpRequest url method ByteString Any Any
-> m (HttpResponse ByteString)
forall (m :: * -> *) url (method :: Symbol) contentTag acceptTag.
(MonadDormouseTestClient m, IsUrl url) =>
HttpRequest url method ByteString contentTag acceptTag
-> m (HttpResponse ByteString)
expectLbs (HttpRequest url method ByteString Any Any
 -> m (HttpResponse ByteString))
-> HttpRequest url method ByteString Any Any
-> m (HttpResponse ByteString)
forall a b. (a -> b) -> a -> b
$ HttpRequest url method ByteString contentTag acceptTag
req {requestBody :: ByteString
requestBody = ByteString -> ByteString
LB.fromStrict (ByteString -> ByteString) -> ByteString -> ByteString
forall a b. (a -> b) -> a -> b
$ HttpRequest url method ByteString contentTag acceptTag
-> ByteString
forall url (method :: Symbol) body contentTag acceptTag.
HttpRequest url method body contentTag acceptTag -> body
requestBody HttpRequest url method ByteString contentTag acceptTag
req}
    HttpResponse ByteString -> m (HttpResponse ByteString)
forall (m :: * -> *) a. Monad m => a -> m a
return (HttpResponse ByteString -> m (HttpResponse ByteString))
-> HttpResponse ByteString -> m (HttpResponse ByteString)
forall a b. (a -> b) -> a -> b
$ HttpResponse ByteString
resp {responseBody :: ByteString
responseBody = ByteString -> ByteString
LB.toStrict (ByteString -> ByteString) -> ByteString -> ByteString
forall a b. (a -> b) -> a -> b
$ HttpResponse ByteString -> ByteString
forall body. HttpResponse body -> body
responseBody HttpResponse ByteString
resp}
  {-# MINIMAL expectLbs | expectBs #-}
instance (Monad m, MonadIO m, MonadDormouseTestClient m) => MonadDormouseClient m where
  send :: HttpRequest url method RawRequestPayload contentTag acceptTag
-> (HttpResponse (SerialT IO Word8) -> IO (HttpResponse b))
-> m (HttpResponse b)
send HttpRequest url method RawRequestPayload contentTag acceptTag
req HttpResponse (SerialT IO Word8) -> IO (HttpResponse b)
deserialiseResp = do
    ByteString
reqBody <- IO ByteString -> m ByteString
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO ByteString -> m ByteString)
-> (HttpRequest url method RawRequestPayload contentTag acceptTag
    -> IO ByteString)
-> HttpRequest url method RawRequestPayload contentTag acceptTag
-> m ByteString
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Fold IO Word8 ByteString -> SerialT IO Word8 -> IO ByteString
forall (m :: * -> *) a b.
Monad m =>
Fold m a b -> SerialT m a -> m b
S.fold Fold IO Word8 ByteString
forall (m :: * -> *). MonadIO m => Fold m Word8 ByteString
SEB.write (SerialT IO Word8 -> IO ByteString)
-> (HttpRequest url method RawRequestPayload contentTag acceptTag
    -> SerialT IO Word8)
-> HttpRequest url method RawRequestPayload contentTag acceptTag
-> IO ByteString
forall b c a. (b -> c) -> (a -> b) -> a -> c
. RawRequestPayload -> SerialT IO Word8
extricateRequestStream (RawRequestPayload -> SerialT IO Word8)
-> (HttpRequest url method RawRequestPayload contentTag acceptTag
    -> RawRequestPayload)
-> HttpRequest url method RawRequestPayload contentTag acceptTag
-> SerialT IO Word8
forall b c a. (b -> c) -> (a -> b) -> a -> c
. HttpRequest url method RawRequestPayload contentTag acceptTag
-> RawRequestPayload
forall url (method :: Symbol) body contentTag acceptTag.
HttpRequest url method body contentTag acceptTag -> body
requestBody (HttpRequest url method RawRequestPayload contentTag acceptTag
 -> m ByteString)
-> HttpRequest url method RawRequestPayload contentTag acceptTag
-> m ByteString
forall a b. (a -> b) -> a -> b
$ HttpRequest url method RawRequestPayload contentTag acceptTag
req
    let reqBs :: HttpRequest url method ByteString contentTag acceptTag
reqBs = HttpRequest url method RawRequestPayload contentTag acceptTag
req {requestBody :: ByteString
requestBody = ByteString
reqBody}
    HttpResponse ByteString
respBs <- HttpRequest url method ByteString Any Any
-> m (HttpResponse ByteString)
forall (m :: * -> *) url (method :: Symbol) contentTag acceptTag.
(MonadDormouseTestClient m, IsUrl url) =>
HttpRequest url method ByteString contentTag acceptTag
-> m (HttpResponse ByteString)
expectBs HttpRequest url method ByteString Any Any
forall contentTag acceptTag.
HttpRequest url method ByteString contentTag acceptTag
reqBs
    let respStream :: SerialT IO Word8
respStream = Unfold IO ByteString Word8 -> ByteString -> SerialT IO Word8
forall (t :: (* -> *) -> * -> *) (m :: * -> *) a b.
(IsStream t, Monad m) =>
Unfold m a b -> a -> t m b
S.unfold Unfold IO ByteString Word8
forall (m :: * -> *). Monad m => Unfold m ByteString Word8
SEBL.read (ByteString -> SerialT IO Word8)
-> (ByteString -> ByteString) -> ByteString -> SerialT IO Word8
forall b c a. (b -> c) -> (a -> b) -> a -> c
. ByteString -> ByteString
LB.fromStrict (ByteString -> SerialT IO Word8) -> ByteString -> SerialT IO Word8
forall a b. (a -> b) -> a -> b
$ HttpResponse ByteString -> ByteString
forall body. HttpResponse body -> body
responseBody HttpResponse ByteString
respBs
    IO (HttpResponse b) -> m (HttpResponse b)
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO (HttpResponse b) -> m (HttpResponse b))
-> IO (HttpResponse b) -> m (HttpResponse b)
forall a b. (a -> b) -> a -> b
$ HttpResponse (SerialT IO Word8) -> IO (HttpResponse b)
deserialiseResp (HttpResponse (SerialT IO Word8) -> IO (HttpResponse b))
-> HttpResponse (SerialT IO Word8) -> IO (HttpResponse b)
forall a b. (a -> b) -> a -> b
$ HttpResponse ByteString
respBs { responseBody :: SerialT IO Word8
responseBody = SerialT IO Word8
respStream }
    where 
      extricateRequestStream :: RawRequestPayload -> SerialT IO Word8
      extricateRequestStream :: RawRequestPayload -> SerialT IO Word8
extricateRequestStream (DefinedContentLength Word64
_ SerialT IO Word8
s) = SerialT IO Word8
s
      extricateRequestStream (ChunkedTransfer SerialT IO Word8
s) = SerialT IO Word8
s