module Signet.Unstable.Extra.Http where

import qualified Data.ByteString.Char8 as Ascii
import qualified Data.CaseInsensitive as CI
import qualified Network.HTTP.Types as Http

hWebhookId :: Http.HeaderName
hWebhookId :: HeaderName
hWebhookId = ByteString -> HeaderName
forall s. FoldCase s => s -> CI s
CI.mk (ByteString -> HeaderName) -> ByteString -> HeaderName
forall a b. (a -> b) -> a -> b
$ String -> ByteString
Ascii.pack String
"webhook-id"

hWebhookSignature :: Http.HeaderName
hWebhookSignature :: HeaderName
hWebhookSignature = ByteString -> HeaderName
forall s. FoldCase s => s -> CI s
CI.mk (ByteString -> HeaderName) -> ByteString -> HeaderName
forall a b. (a -> b) -> a -> b
$ String -> ByteString
Ascii.pack String
"webhook-signature"

hWebhookTimestamp :: Http.HeaderName
hWebhookTimestamp :: HeaderName
hWebhookTimestamp = ByteString -> HeaderName
forall s. FoldCase s => s -> CI s
CI.mk (ByteString -> HeaderName) -> ByteString -> HeaderName
forall a b. (a -> b) -> a -> b
$ String -> ByteString
Ascii.pack String
"webhook-timestamp"