module Signet.Unstable.Extra.HttpTest where import qualified Data.ByteString.Char8 as Ascii import qualified Data.CaseInsensitive as CI import qualified Signet.Unstable.Extra.Http as Http import qualified Signet.Unstable.Type.Test as Test spec :: (Applicative io, Monad tree) => Test.Test io tree -> tree () spec :: forall (io :: * -> *) (tree :: * -> *). (Applicative io, Monad tree) => Test io tree -> tree () spec Test io tree test = Test io tree -> String -> tree () -> tree () forall (io :: * -> *) (tree :: * -> *). Test io tree -> String -> tree () -> tree () Test.describe Test io tree test String "Signet.Unstable.Extra.Http" (tree () -> tree ()) -> tree () -> tree () forall a b. (a -> b) -> a -> b $ do Test io tree -> String -> tree () -> tree () forall (io :: * -> *) (tree :: * -> *). Test io tree -> String -> tree () -> tree () Test.describe Test io tree test String "hWebhookId" (tree () -> tree ()) -> tree () -> tree () forall a b. (a -> b) -> a -> b $ do Test io tree -> String -> io () -> tree () forall (io :: * -> *) (tree :: * -> *). Test io tree -> String -> io () -> tree () Test.it Test io tree test String "creates the correct header name" (io () -> tree ()) -> io () -> tree () forall a b. (a -> b) -> a -> b $ do Test io tree -> HeaderName -> HeaderName -> io () forall (io :: * -> *) a (tree :: * -> *). (HasCallStack, Applicative io, Eq a, Show a) => Test io tree -> a -> a -> io () Test.assertEq Test io tree test HeaderName Http.hWebhookId (ByteString -> HeaderName forall s. FoldCase s => s -> CI s CI.mk (String -> ByteString Ascii.pack String "webhook-id")) Test io tree -> String -> tree () -> tree () forall (io :: * -> *) (tree :: * -> *). Test io tree -> String -> tree () -> tree () Test.describe Test io tree test String "hWebhookSignature" (tree () -> tree ()) -> tree () -> tree () forall a b. (a -> b) -> a -> b $ do Test io tree -> String -> io () -> tree () forall (io :: * -> *) (tree :: * -> *). Test io tree -> String -> io () -> tree () Test.it Test io tree test String "creates the correct header name" (io () -> tree ()) -> io () -> tree () forall a b. (a -> b) -> a -> b $ do Test io tree -> HeaderName -> HeaderName -> io () forall (io :: * -> *) a (tree :: * -> *). (HasCallStack, Applicative io, Eq a, Show a) => Test io tree -> a -> a -> io () Test.assertEq Test io tree test HeaderName Http.hWebhookSignature (ByteString -> HeaderName forall s. FoldCase s => s -> CI s CI.mk (String -> ByteString Ascii.pack String "webhook-signature")) Test io tree -> String -> tree () -> tree () forall (io :: * -> *) (tree :: * -> *). Test io tree -> String -> tree () -> tree () Test.describe Test io tree test String "hWebhookTimestamp" (tree () -> tree ()) -> tree () -> tree () forall a b. (a -> b) -> a -> b $ do Test io tree -> String -> io () -> tree () forall (io :: * -> *) (tree :: * -> *). Test io tree -> String -> io () -> tree () Test.it Test io tree test String "creates the correct header name" (io () -> tree ()) -> io () -> tree () forall a b. (a -> b) -> a -> b $ do Test io tree -> HeaderName -> HeaderName -> io () forall (io :: * -> *) a (tree :: * -> *). (HasCallStack, Applicative io, Eq a, Show a) => Test io tree -> a -> a -> io () Test.assertEq Test io tree test HeaderName Http.hWebhookTimestamp (ByteString -> HeaderName forall s. FoldCase s => s -> CI s CI.mk (String -> ByteString Ascii.pack String "webhook-timestamp"))