--
-- HTTP types for use with io-streams and pipes
--
-- Copyright © 2012-2014 Operational Dynamics Consulting, Pty Ltd
--
-- The code in this file, and the program it is a part of, is
-- made available to you by its authors as open source software:
-- you can redistribute it and/or modify it under the terms of
-- the BSD licence.
--

{-# LANGUAGE BangPatterns       #-}
{-# LANGUAGE CPP                #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE OverloadedStrings  #-}
{-# OPTIONS_HADDOCK hide, prune #-}

--
-- | If you're not http-streams or pipes-http and you're importing this,
-- you're Doing It Wrong.
--

module Network.Http.Internal (
    Hostname,
    Port,
    Request(..),
    EntityBody(..),
    ExpectMode(..),
    Response(..),
    StatusCode,
    TransferEncoding(..),
    ContentEncoding(..),
    getStatusCode,
    getStatusMessage,
    getHeader,
    getHeaderMap,
    Method(..),
    Headers,
    emptyHeaders,
    updateHeader,
    removeHeader,
    buildHeaders,
    lookupHeader,
    retrieveHeaders,
    HttpType (getHeaders),
    HttpParseException(..),

    hasBrotli,

    -- for testing
    composeRequestBytes,
    composeResponseBytes
) where

import Prelude hiding (lookup)

import Blaze.ByteString.Builder (Builder)
import qualified Blaze.ByteString.Builder as Builder (copyByteString,
                                                      copyByteString,
                                                      fromByteString,
                                                      fromByteString,
                                                      toByteString)
import qualified Blaze.ByteString.Builder.Char8 as Builder (fromChar,
                                                            fromShow,
                                                            fromString)
import Control.Exception (Exception)
import Data.ByteString (ByteString)
import qualified Data.ByteString.Char8 as S
import Data.CaseInsensitive (CI, mk, original)
-- import Data.HashMap.Strict (HashMap, delete, empty, foldrWithKey, insert,
--                             insertWith, lookup, toList)
import qualified Data.Map.Strict as Map
import Data.Map (Map)

import Data.Int (Int64)
import Data.List (foldl')
import Data.Monoid as Mon (mconcat, mempty)
import Data.Typeable (Typeable)
import Data.Word (Word16)

{-
    This is a String because that's what the uri package works in. There
    was a fairly detailed disucssion on haskell-cafe about this, with
    the conclusion that URLs are composed of characters, not octets.
-}

type Hostname = ByteString

type Port = Word16

{-# INLINE hasBrotli #-}
hasBrotli :: Bool
#if defined(MIN_VERSION_brotli_streams)
hasBrotli :: Bool
hasBrotli = Bool
True
#else
hasBrotli = False
#endif

--
-- | HTTP Methods, as per RFC 2616
--
data Method
    = GET
    | HEAD
    | POST
    | PUT
    | DELETE
    | TRACE
    | OPTIONS
    | CONNECT
    | PATCH
    | Method ByteString
        deriving (Int -> Method -> ShowS
[Method] -> ShowS
Method -> String
(Int -> Method -> ShowS)
-> (Method -> String) -> ([Method] -> ShowS) -> Show Method
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [Method] -> ShowS
$cshowList :: [Method] -> ShowS
show :: Method -> String
$cshow :: Method -> String
showsPrec :: Int -> Method -> ShowS
$cshowsPrec :: Int -> Method -> ShowS
Show, ReadPrec [Method]
ReadPrec Method
Int -> ReadS Method
ReadS [Method]
(Int -> ReadS Method)
-> ReadS [Method]
-> ReadPrec Method
-> ReadPrec [Method]
-> Read Method
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [Method]
$creadListPrec :: ReadPrec [Method]
readPrec :: ReadPrec Method
$creadPrec :: ReadPrec Method
readList :: ReadS [Method]
$creadList :: ReadS [Method]
readsPrec :: Int -> ReadS Method
$creadsPrec :: Int -> ReadS Method
Read, Eq Method
Eq Method
-> (Method -> Method -> Ordering)
-> (Method -> Method -> Bool)
-> (Method -> Method -> Bool)
-> (Method -> Method -> Bool)
-> (Method -> Method -> Bool)
-> (Method -> Method -> Method)
-> (Method -> Method -> Method)
-> Ord Method
Method -> Method -> Bool
Method -> Method -> Ordering
Method -> Method -> Method
forall a.
Eq a
-> (a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
min :: Method -> Method -> Method
$cmin :: Method -> Method -> Method
max :: Method -> Method -> Method
$cmax :: Method -> Method -> Method
>= :: Method -> Method -> Bool
$c>= :: Method -> Method -> Bool
> :: Method -> Method -> Bool
$c> :: Method -> Method -> Bool
<= :: Method -> Method -> Bool
$c<= :: Method -> Method -> Bool
< :: Method -> Method -> Bool
$c< :: Method -> Method -> Bool
compare :: Method -> Method -> Ordering
$ccompare :: Method -> Method -> Ordering
$cp1Ord :: Eq Method
Ord)


instance Eq Method where
    Method
GET          == :: Method -> Method -> Bool
== Method
GET              = Bool
True
    Method
HEAD         == Method
HEAD             = Bool
True
    Method
POST         == Method
POST             = Bool
True
    Method
PUT          == Method
PUT              = Bool
True
    Method
DELETE       == Method
DELETE           = Bool
True
    Method
TRACE        == Method
TRACE            = Bool
True
    Method
OPTIONS      == Method
OPTIONS          = Bool
True
    Method
CONNECT      == Method
CONNECT          = Bool
True
    Method
PATCH        == Method
PATCH            = Bool
True
    Method
GET          == Method ByteString
"GET"     = Bool
True
    Method
HEAD         == Method ByteString
"HEAD"    = Bool
True
    Method
POST         == Method ByteString
"POST"    = Bool
True
    Method
PUT          == Method ByteString
"PUT"     = Bool
True
    Method
DELETE       == Method ByteString
"DELETE"  = Bool
True
    Method
TRACE        == Method ByteString
"TRACE"   = Bool
True
    Method
OPTIONS      == Method ByteString
"OPTIONS" = Bool
True
    Method
CONNECT      == Method ByteString
"CONNECT" = Bool
True
    Method
PATCH        == Method ByteString
"PATCH"   = Bool
True
    Method ByteString
a     == Method ByteString
b         = ByteString
a ByteString -> ByteString -> Bool
forall a. Eq a => a -> a -> Bool
== ByteString
b
    m :: Method
m@(Method ByteString
_) == Method
other            = Method
other Method -> Method -> Bool
forall a. Eq a => a -> a -> Bool
== Method
m
    Method
_            == Method
_                = Bool
False

--
-- | A description of the request that will be sent to the server. Note
-- unlike other HTTP libraries, the request body is /not/ a part of this
-- object; that will be streamed out by you when actually sending the
-- request with 'sendRequest'.
--
-- 'Request' has a useful @Show@ instance that will output the request
-- line and headers (as it will be sent over the wire but with the @\\r@
-- characters stripped) which can be handy for debugging.
--
-- Note that the actual @Host:@ header is not set until the request is sent,
-- so you will not see it in the Show instance (unless you call 'setHostname'
-- to override the value inherited from the @Connection@).
--
data Request
    = Request {
        Request -> Method
qMethod  :: !Method,
        Request -> Maybe ByteString
qHost    :: !(Maybe ByteString),
        Request -> ByteString
qPath    :: !ByteString,
        Request -> EntityBody
qBody    :: !EntityBody,
        Request -> ExpectMode
qExpect  :: !ExpectMode,
        Request -> Headers
qHeaders :: !Headers
    } deriving (Request -> Request -> Bool
(Request -> Request -> Bool)
-> (Request -> Request -> Bool) -> Eq Request
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Request -> Request -> Bool
$c/= :: Request -> Request -> Bool
== :: Request -> Request -> Bool
$c== :: Request -> Request -> Bool
Eq)

instance Show Request where
    show :: Request -> String
show Request
q = {-# SCC "Request.show" #-}
        ByteString -> String
S.unpack (ByteString -> String) -> ByteString -> String
forall a b. (a -> b) -> a -> b
$ (Char -> Bool) -> ByteString -> ByteString
S.filter (Char -> Char -> Bool
forall a. Eq a => a -> a -> Bool
/= Char
'\r') (ByteString -> ByteString) -> ByteString -> ByteString
forall a b. (a -> b) -> a -> b
$ Builder -> ByteString
Builder.toByteString (Builder -> ByteString) -> Builder -> ByteString
forall a b. (a -> b) -> a -> b
$ Request -> ByteString -> Builder
composeRequestBytes Request
q ByteString
"<default>"


data EntityBody = Empty | Chunking | Static Int64 deriving (Int -> EntityBody -> ShowS
[EntityBody] -> ShowS
EntityBody -> String
(Int -> EntityBody -> ShowS)
-> (EntityBody -> String)
-> ([EntityBody] -> ShowS)
-> Show EntityBody
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [EntityBody] -> ShowS
$cshowList :: [EntityBody] -> ShowS
show :: EntityBody -> String
$cshow :: EntityBody -> String
showsPrec :: Int -> EntityBody -> ShowS
$cshowsPrec :: Int -> EntityBody -> ShowS
Show, EntityBody -> EntityBody -> Bool
(EntityBody -> EntityBody -> Bool)
-> (EntityBody -> EntityBody -> Bool) -> Eq EntityBody
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: EntityBody -> EntityBody -> Bool
$c/= :: EntityBody -> EntityBody -> Bool
== :: EntityBody -> EntityBody -> Bool
$c== :: EntityBody -> EntityBody -> Bool
Eq, Eq EntityBody
Eq EntityBody
-> (EntityBody -> EntityBody -> Ordering)
-> (EntityBody -> EntityBody -> Bool)
-> (EntityBody -> EntityBody -> Bool)
-> (EntityBody -> EntityBody -> Bool)
-> (EntityBody -> EntityBody -> Bool)
-> (EntityBody -> EntityBody -> EntityBody)
-> (EntityBody -> EntityBody -> EntityBody)
-> Ord EntityBody
EntityBody -> EntityBody -> Bool
EntityBody -> EntityBody -> Ordering
EntityBody -> EntityBody -> EntityBody
forall a.
Eq a
-> (a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
min :: EntityBody -> EntityBody -> EntityBody
$cmin :: EntityBody -> EntityBody -> EntityBody
max :: EntityBody -> EntityBody -> EntityBody
$cmax :: EntityBody -> EntityBody -> EntityBody
>= :: EntityBody -> EntityBody -> Bool
$c>= :: EntityBody -> EntityBody -> Bool
> :: EntityBody -> EntityBody -> Bool
$c> :: EntityBody -> EntityBody -> Bool
<= :: EntityBody -> EntityBody -> Bool
$c<= :: EntityBody -> EntityBody -> Bool
< :: EntityBody -> EntityBody -> Bool
$c< :: EntityBody -> EntityBody -> Bool
compare :: EntityBody -> EntityBody -> Ordering
$ccompare :: EntityBody -> EntityBody -> Ordering
$cp1Ord :: Eq EntityBody
Ord)

data ExpectMode = Normal | Continue deriving (Int -> ExpectMode -> ShowS
[ExpectMode] -> ShowS
ExpectMode -> String
(Int -> ExpectMode -> ShowS)
-> (ExpectMode -> String)
-> ([ExpectMode] -> ShowS)
-> Show ExpectMode
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ExpectMode] -> ShowS
$cshowList :: [ExpectMode] -> ShowS
show :: ExpectMode -> String
$cshow :: ExpectMode -> String
showsPrec :: Int -> ExpectMode -> ShowS
$cshowsPrec :: Int -> ExpectMode -> ShowS
Show, ExpectMode -> ExpectMode -> Bool
(ExpectMode -> ExpectMode -> Bool)
-> (ExpectMode -> ExpectMode -> Bool) -> Eq ExpectMode
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ExpectMode -> ExpectMode -> Bool
$c/= :: ExpectMode -> ExpectMode -> Bool
== :: ExpectMode -> ExpectMode -> Bool
$c== :: ExpectMode -> ExpectMode -> Bool
Eq, Eq ExpectMode
Eq ExpectMode
-> (ExpectMode -> ExpectMode -> Ordering)
-> (ExpectMode -> ExpectMode -> Bool)
-> (ExpectMode -> ExpectMode -> Bool)
-> (ExpectMode -> ExpectMode -> Bool)
-> (ExpectMode -> ExpectMode -> Bool)
-> (ExpectMode -> ExpectMode -> ExpectMode)
-> (ExpectMode -> ExpectMode -> ExpectMode)
-> Ord ExpectMode
ExpectMode -> ExpectMode -> Bool
ExpectMode -> ExpectMode -> Ordering
ExpectMode -> ExpectMode -> ExpectMode
forall a.
Eq a
-> (a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
min :: ExpectMode -> ExpectMode -> ExpectMode
$cmin :: ExpectMode -> ExpectMode -> ExpectMode
max :: ExpectMode -> ExpectMode -> ExpectMode
$cmax :: ExpectMode -> ExpectMode -> ExpectMode
>= :: ExpectMode -> ExpectMode -> Bool
$c>= :: ExpectMode -> ExpectMode -> Bool
> :: ExpectMode -> ExpectMode -> Bool
$c> :: ExpectMode -> ExpectMode -> Bool
<= :: ExpectMode -> ExpectMode -> Bool
$c<= :: ExpectMode -> ExpectMode -> Bool
< :: ExpectMode -> ExpectMode -> Bool
$c< :: ExpectMode -> ExpectMode -> Bool
compare :: ExpectMode -> ExpectMode -> Ordering
$ccompare :: ExpectMode -> ExpectMode -> Ordering
$cp1Ord :: Eq ExpectMode
Ord)

{-
    The bit that builds up the actual string to be transmitted. This
    is on the critical path for every request, so we'll want to revisit
    this to improve performance.

    - Rewrite rule for Method?
    - How can serializing the Headers be made efficient?

    This code includes the RFC compliant CR-LF sequences as line
    terminators, which is why the Show instance above has to bother
    with removing them.
-}

composeRequestBytes :: Request -> ByteString -> Builder
composeRequestBytes :: Request -> ByteString -> Builder
composeRequestBytes Request
q ByteString
h' =
    [Builder] -> Builder
forall a. Monoid a => [a] -> a
mconcat
       [Builder
requestline,
        Builder
hostLine,
        Builder
headerFields,
        Builder
crlf]
  where
    requestline :: Builder
requestline = [Builder] -> Builder
forall a. Monoid a => [a] -> a
Mon.mconcat
       [Builder
method,
        Builder
sp,
        Builder
uri,
        Builder
sp,
        Builder
version,
        Builder
crlf]

    method :: Builder
method = case Request -> Method
qMethod Request
q of
        Method
GET     -> String -> Builder
Builder.fromString String
"GET"
        Method
HEAD    -> String -> Builder
Builder.fromString String
"HEAD"
        Method
POST    -> String -> Builder
Builder.fromString String
"POST"
        Method
PUT     -> String -> Builder
Builder.fromString String
"PUT"
        Method
DELETE  -> String -> Builder
Builder.fromString String
"DELETE"
        Method
TRACE   -> String -> Builder
Builder.fromString String
"TRACE"
        Method
OPTIONS -> String -> Builder
Builder.fromString String
"OPTIONS"
        Method
CONNECT -> String -> Builder
Builder.fromString String
"CONNECT"
        Method
PATCH   -> String -> Builder
Builder.fromString String
"PATCH"
        (Method ByteString
x) -> ByteString -> Builder
Builder.fromByteString ByteString
x

    uri :: Builder
uri = case Request -> ByteString
qPath Request
q of
        ByteString
""   -> Char -> Builder
Builder.fromChar Char
'/'
        ByteString
path -> ByteString -> Builder
Builder.copyByteString ByteString
path

    version :: Builder
version = String -> Builder
Builder.fromString String
"HTTP/1.1"

    hostLine :: Builder
hostLine = [Builder] -> Builder
forall a. Monoid a => [a] -> a
mconcat
       [String -> Builder
Builder.fromString String
"Host: ",
        Builder
hostname,
        Builder
crlf]

    hostname :: Builder
hostname = case Request -> Maybe ByteString
qHost Request
q of
        Just ByteString
x' -> ByteString -> Builder
Builder.copyByteString ByteString
x'
        Maybe ByteString
Nothing -> ByteString -> Builder
Builder.copyByteString ByteString
h'

    headerFields :: Builder
headerFields = Map (CI ByteString) ByteString -> Builder
joinHeaders (Map (CI ByteString) ByteString -> Builder)
-> Map (CI ByteString) ByteString -> Builder
forall a b. (a -> b) -> a -> b
$ Headers -> Map (CI ByteString) ByteString
unWrap (Headers -> Map (CI ByteString) ByteString)
-> Headers -> Map (CI ByteString) ByteString
forall a b. (a -> b) -> a -> b
$ Request -> Headers
qHeaders Request
q


crlf :: Builder
crlf = String -> Builder
Builder.fromString String
"\r\n"

sp :: Builder
sp = Char -> Builder
Builder.fromChar Char
' '


type StatusCode = Int

--
-- | A description of the response received from the server. Note
-- unlike other HTTP libraries, the response body is /not/ a part
-- of this object; that will be streamed in by you when calling
-- 'receiveResponse'.
--
-- Like 'Request', 'Response' has a @Show@ instance that will output
-- the status line and response headers as they were received from the
-- server.
--
data Response
    = Response {
        Response -> Int
pStatusCode       :: !StatusCode,
        Response -> ByteString
pStatusMsg        :: !ByteString,
        Response -> TransferEncoding
pTransferEncoding :: !TransferEncoding,
        Response -> ContentEncoding
pContentEncoding  :: !ContentEncoding,
        Response -> Maybe Int64
pContentLength    :: !(Maybe Int64),
        Response -> Headers
pHeaders          :: !Headers
    }

instance Show Response where
    show :: Response -> String
show Response
p =     {-# SCC "Response.show" #-}
        ByteString -> String
S.unpack (ByteString -> String) -> ByteString -> String
forall a b. (a -> b) -> a -> b
$ (Char -> Bool) -> ByteString -> ByteString
S.filter (Char -> Char -> Bool
forall a. Eq a => a -> a -> Bool
/= Char
'\r') (ByteString -> ByteString) -> ByteString -> ByteString
forall a b. (a -> b) -> a -> b
$ Builder -> ByteString
Builder.toByteString (Builder -> ByteString) -> Builder -> ByteString
forall a b. (a -> b) -> a -> b
$ Response -> Builder
composeResponseBytes Response
p


data TransferEncoding = None | Chunked

data ContentEncoding = Identity | Gzip | Deflate | Br {- Brotli -} | UnknownCE !ByteString
    deriving (Int -> ContentEncoding -> ShowS
[ContentEncoding] -> ShowS
ContentEncoding -> String
(Int -> ContentEncoding -> ShowS)
-> (ContentEncoding -> String)
-> ([ContentEncoding] -> ShowS)
-> Show ContentEncoding
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ContentEncoding] -> ShowS
$cshowList :: [ContentEncoding] -> ShowS
show :: ContentEncoding -> String
$cshow :: ContentEncoding -> String
showsPrec :: Int -> ContentEncoding -> ShowS
$cshowsPrec :: Int -> ContentEncoding -> ShowS
Show)


--
-- | Get the HTTP response status code.
--
getStatusCode :: Response -> StatusCode
getStatusCode :: Response -> Int
getStatusCode = Response -> Int
pStatusCode
{-# INLINE getStatusCode #-}

--
-- | Get the HTTP response status message. Keep in mind that this is
-- /not/ normative; whereas 'getStatusCode' values are authoritative.
--
getStatusMessage :: Response -> ByteString
getStatusMessage :: Response -> ByteString
getStatusMessage = Response -> ByteString
pStatusMsg
{-# INLINE getStatusMessage #-}

--
-- | Lookup a header in the response. HTTP header field names are
-- case-insensitive, so you can specify the name to lookup however you
-- like. If the header is not present @Nothing@ will be returned.
--
-- >     let n = case getHeader p "Content-Length" of
-- >                Just x' -> read x' :: Int
-- >                Nothing -> 0
--
-- which of course is essentially what goes on inside the client library when
-- it receives a response from the server and has to figure out how many bytes
-- to read.
--
-- There is a fair bit of complexity in some of the other HTTP response
-- fields, so there are a number of specialized functions for reading
-- those values where we've found them useful.
--
getHeader :: Response -> ByteString -> Maybe ByteString
getHeader :: Response -> ByteString -> Maybe ByteString
getHeader Response
p ByteString
k =
    Headers -> ByteString -> Maybe ByteString
lookupHeader Headers
h ByteString
k
  where
    h :: Headers
h = Response -> Headers
pHeaders Response
p

-- | Expose all headers in the response as (case-insenstiive) key-value 'Map'ping.
--
-- @since 0.1.1.0
getHeaderMap :: Response -> Map (CI ByteString) ByteString
getHeaderMap :: Response -> Map (CI ByteString) ByteString
getHeaderMap = Headers -> Map (CI ByteString) ByteString
unWrap (Headers -> Map (CI ByteString) ByteString)
-> (Response -> Headers)
-> Response
-> Map (CI ByteString) ByteString
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Response -> Headers
pHeaders

--
-- | Accessors common to both the outbound and return sides of an HTTP
-- connection.
--
class HttpType τ where

    --
    -- | Get the Headers from a Request or Response. Most people do not need
    -- this; for most cases you just need to get a header or two from the
    -- response, for which you can use 'getHeader'. On the other hand, if you
    -- do need to poke around in the raw headers,
    --
    -- @ import Network.Http.Types @
    --
    -- will give you functions like 'lookupHeader' and 'updateHeader' to to
    -- work with.
    --
    getHeaders :: τ -> Headers

instance HttpType Request where
    getHeaders :: Request -> Headers
getHeaders Request
q = Request -> Headers
qHeaders Request
q

instance HttpType Response where
    getHeaders :: Response -> Headers
getHeaders Response
p = Response -> Headers
pHeaders Response
p


composeResponseBytes :: Response -> Builder
composeResponseBytes :: Response -> Builder
composeResponseBytes Response
p =
    [Builder] -> Builder
forall a. Monoid a => [a] -> a
mconcat
       [Builder
statusline,
        Builder
headerFields,
        Builder
crlf]
  where
    statusline :: Builder
statusline = [Builder] -> Builder
forall a. Monoid a => [a] -> a
mconcat
       [Builder
version,
        Builder
sp,
        Builder
code,
        Builder
sp,
        Builder
message,
        Builder
crlf]

    code :: Builder
code = Int -> Builder
forall a. Show a => a -> Builder
Builder.fromShow (Int -> Builder) -> Int -> Builder
forall a b. (a -> b) -> a -> b
$ Response -> Int
pStatusCode Response
p

    message :: Builder
message = ByteString -> Builder
Builder.copyByteString (ByteString -> Builder) -> ByteString -> Builder
forall a b. (a -> b) -> a -> b
$ Response -> ByteString
pStatusMsg Response
p

    version :: Builder
version = String -> Builder
Builder.fromString String
"HTTP/1.1"

    headerFields :: Builder
headerFields = Map (CI ByteString) ByteString -> Builder
joinHeaders (Map (CI ByteString) ByteString -> Builder)
-> Map (CI ByteString) ByteString -> Builder
forall a b. (a -> b) -> a -> b
$ Headers -> Map (CI ByteString) ByteString
unWrap (Headers -> Map (CI ByteString) ByteString)
-> Headers -> Map (CI ByteString) ByteString
forall a b. (a -> b) -> a -> b
$ Response -> Headers
pHeaders Response
p


--
-- | The map of headers in a 'Request' or 'Response'. Note that HTTP
-- header field names are case insensitive, so if you call 'setHeader'
-- on a field that's already defined but with a different capitalization
-- you will replace the existing value.
--
{-
    This is a fair bit of trouble just to avoid using a typedef here.
    Probably worth it, though; every other HTTP client library out there
    exposes the gory details of the underlying map implementation, and
    to use it you need to figure out all kinds of crazy imports. Indeed,
    this code used here in the Show instance for debugging has been
    copied & pasted around various projects of mine since I started
    writing Haskell. It's quite tedious, and very arcane! So, wrap it
    up.
-}
newtype Headers = Wrap {
    Headers -> Map (CI ByteString) ByteString
unWrap :: Map (CI ByteString) ByteString
} deriving (Headers -> Headers -> Bool
(Headers -> Headers -> Bool)
-> (Headers -> Headers -> Bool) -> Eq Headers
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Headers -> Headers -> Bool
$c/= :: Headers -> Headers -> Bool
== :: Headers -> Headers -> Bool
$c== :: Headers -> Headers -> Bool
Eq)

instance Show Headers where
    show :: Headers -> String
show Headers
x = ByteString -> String
S.unpack (ByteString -> String) -> ByteString -> String
forall a b. (a -> b) -> a -> b
$ (Char -> Bool) -> ByteString -> ByteString
S.filter (Char -> Char -> Bool
forall a. Eq a => a -> a -> Bool
/= Char
'\r') (ByteString -> ByteString) -> ByteString -> ByteString
forall a b. (a -> b) -> a -> b
$ Builder -> ByteString
Builder.toByteString (Builder -> ByteString) -> Builder -> ByteString
forall a b. (a -> b) -> a -> b
$ Map (CI ByteString) ByteString -> Builder
joinHeaders (Map (CI ByteString) ByteString -> Builder)
-> Map (CI ByteString) ByteString -> Builder
forall a b. (a -> b) -> a -> b
$ Headers -> Map (CI ByteString) ByteString
unWrap Headers
x

joinHeaders :: Map (CI ByteString) ByteString -> Builder
joinHeaders :: Map (CI ByteString) ByteString -> Builder
joinHeaders Map (CI ByteString) ByteString
m = (CI ByteString -> ByteString -> Builder -> Builder)
-> Builder -> Map (CI ByteString) ByteString -> Builder
forall k a b. (k -> a -> b -> b) -> b -> Map k a -> b
Map.foldrWithKey CI ByteString -> ByteString -> Builder -> Builder
combine Builder
forall a. Monoid a => a
Mon.mempty Map (CI ByteString) ByteString
m

combine :: CI ByteString -> ByteString -> Builder -> Builder
combine :: CI ByteString -> ByteString -> Builder -> Builder
combine CI ByteString
k ByteString
v Builder
acc =
    [Builder] -> Builder
forall a. Monoid a => [a] -> a
mconcat [Builder
acc, Builder
key, String -> Builder
Builder.fromString String
": ", Builder
value, Builder
crlf]
  where
    key :: Builder
key = ByteString -> Builder
Builder.copyByteString (ByteString -> Builder) -> ByteString -> Builder
forall a b. (a -> b) -> a -> b
$ CI ByteString -> ByteString
forall s. CI s -> s
original CI ByteString
k
    value :: Builder
value = ByteString -> Builder
Builder.fromByteString ByteString
v
{-# INLINE combine #-}

emptyHeaders :: Headers
emptyHeaders :: Headers
emptyHeaders =
    Map (CI ByteString) ByteString -> Headers
Wrap Map (CI ByteString) ByteString
forall k a. Map k a
Map.empty

--
-- | Set a header field to the specified value. This will overwrite
-- any existing value for the field. Remember that HTTP fields names
-- are case insensitive!
--
updateHeader :: Headers -> ByteString -> ByteString -> Headers
updateHeader :: Headers -> ByteString -> ByteString -> Headers
updateHeader Headers
x ByteString
k ByteString
v =
    Map (CI ByteString) ByteString -> Headers
Wrap Map (CI ByteString) ByteString
result
  where
    !result :: Map (CI ByteString) ByteString
result = CI ByteString
-> ByteString
-> Map (CI ByteString) ByteString
-> Map (CI ByteString) ByteString
forall k a. Ord k => k -> a -> Map k a -> Map k a
Map.insert (ByteString -> CI ByteString
forall s. FoldCase s => s -> CI s
mk ByteString
k) ByteString
v Map (CI ByteString) ByteString
m
    !m :: Map (CI ByteString) ByteString
m = Headers -> Map (CI ByteString) ByteString
unWrap Headers
x

--
-- | Remove a header from the map. If a field with that name is not present,
-- then this will have no effect.
--
removeHeader :: Headers -> ByteString -> Headers
removeHeader :: Headers -> ByteString -> Headers
removeHeader Headers
x ByteString
k =
    Map (CI ByteString) ByteString -> Headers
Wrap Map (CI ByteString) ByteString
result
  where
    !result :: Map (CI ByteString) ByteString
result = CI ByteString
-> Map (CI ByteString) ByteString -> Map (CI ByteString) ByteString
forall k a. Ord k => k -> Map k a -> Map k a
Map.delete (ByteString -> CI ByteString
forall s. FoldCase s => s -> CI s
mk ByteString
k) Map (CI ByteString) ByteString
m
    !m :: Map (CI ByteString) ByteString
m = Headers -> Map (CI ByteString) ByteString
unWrap Headers
x


--
-- | Given a list of field-name,field-value pairs, construct a Headers map.
--
{-
    This is only going to be used by RequestBuilder and ResponseParser,
    obviously. And yes, as usual, we go to a lot of trouble to splice out the
    function doing the work, in the name of type sanity.
-}
buildHeaders :: [(ByteString, ByteString)] -> Headers
buildHeaders :: [(ByteString, ByteString)] -> Headers
buildHeaders [(ByteString, ByteString)]
hs =
    Map (CI ByteString) ByteString -> Headers
Wrap Map (CI ByteString) ByteString
result
  where
    result :: Map (CI ByteString) ByteString
result = (Map (CI ByteString) ByteString
 -> (ByteString, ByteString) -> Map (CI ByteString) ByteString)
-> Map (CI ByteString) ByteString
-> [(ByteString, ByteString)]
-> Map (CI ByteString) ByteString
forall (t :: * -> *) b a.
Foldable t =>
(b -> a -> b) -> b -> t a -> b
foldl' Map (CI ByteString) ByteString
-> (ByteString, ByteString) -> Map (CI ByteString) ByteString
addHeader Map (CI ByteString) ByteString
forall k a. Map k a
Map.empty [(ByteString, ByteString)]
hs

{-
    insertWith is used here for the case where a header is repeated
    (for example, Set-Cookie) and the values need to be intercalated
    with ',' as per RFC 2616 §4.2.
-}
addHeader
    :: Map (CI ByteString) ByteString
    -> (ByteString,ByteString)
    -> Map (CI ByteString) ByteString
addHeader :: Map (CI ByteString) ByteString
-> (ByteString, ByteString) -> Map (CI ByteString) ByteString
addHeader Map (CI ByteString) ByteString
m (ByteString
k,ByteString
v) =
    (ByteString -> ByteString -> ByteString)
-> CI ByteString
-> ByteString
-> Map (CI ByteString) ByteString
-> Map (CI ByteString) ByteString
forall k a. Ord k => (a -> a -> a) -> k -> a -> Map k a -> Map k a
Map.insertWith ByteString -> ByteString -> ByteString
f (ByteString -> CI ByteString
forall s. FoldCase s => s -> CI s
mk ByteString
k) ByteString
v Map (CI ByteString) ByteString
m
  where
    f :: ByteString -> ByteString -> ByteString
f ByteString
new ByteString
old = [ByteString] -> ByteString
S.concat [ByteString
old, ByteString
",", ByteString
new]


lookupHeader :: Headers -> ByteString -> Maybe ByteString
lookupHeader :: Headers -> ByteString -> Maybe ByteString
lookupHeader Headers
x ByteString
k =
    CI ByteString -> Map (CI ByteString) ByteString -> Maybe ByteString
forall k a. Ord k => k -> Map k a -> Maybe a
Map.lookup (ByteString -> CI ByteString
forall s. FoldCase s => s -> CI s
mk ByteString
k) Map (CI ByteString) ByteString
m
  where
    !m :: Map (CI ByteString) ByteString
m = Headers -> Map (CI ByteString) ByteString
unWrap Headers
x


--
-- | Get the headers as a field-name,field-value association list.
--
retrieveHeaders :: Headers -> [(ByteString, ByteString)]
retrieveHeaders :: Headers -> [(ByteString, ByteString)]
retrieveHeaders Headers
x =
    ((CI ByteString, ByteString) -> (ByteString, ByteString))
-> [(CI ByteString, ByteString)] -> [(ByteString, ByteString)]
forall a b. (a -> b) -> [a] -> [b]
map (CI ByteString, ByteString) -> (ByteString, ByteString)
down ([(CI ByteString, ByteString)] -> [(ByteString, ByteString)])
-> [(CI ByteString, ByteString)] -> [(ByteString, ByteString)]
forall a b. (a -> b) -> a -> b
$ Map (CI ByteString) ByteString -> [(CI ByteString, ByteString)]
forall k a. Map k a -> [(k, a)]
Map.toList Map (CI ByteString) ByteString
m
  where
    !m :: Map (CI ByteString) ByteString
m = Headers -> Map (CI ByteString) ByteString
unWrap Headers
x

down :: (CI ByteString, ByteString) -> (ByteString, ByteString)
down :: (CI ByteString, ByteString) -> (ByteString, ByteString)
down (CI ByteString
k, ByteString
v) =
    (CI ByteString -> ByteString
forall s. CI s -> s
original CI ByteString
k, ByteString
v)

data HttpParseException = HttpParseException String
        deriving (Typeable, Int -> HttpParseException -> ShowS
[HttpParseException] -> ShowS
HttpParseException -> String
(Int -> HttpParseException -> ShowS)
-> (HttpParseException -> String)
-> ([HttpParseException] -> ShowS)
-> Show HttpParseException
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [HttpParseException] -> ShowS
$cshowList :: [HttpParseException] -> ShowS
show :: HttpParseException -> String
$cshow :: HttpParseException -> String
showsPrec :: Int -> HttpParseException -> ShowS
$cshowsPrec :: Int -> HttpParseException -> ShowS
Show)

instance Exception HttpParseException