2020-11-18 19:57:20 +01:00
|
|
|
{-# LANGUAGE DataKinds #-}
|
|
|
|
{-# LANGUAGE DeriveGeneric #-}
|
|
|
|
{-# LANGUAGE FlexibleContexts #-}
|
|
|
|
{-# LANGUAGE FlexibleInstances #-}
|
|
|
|
{-# LANGUAGE OverloadedStrings #-}
|
|
|
|
{-# LANGUAGE PolyKinds #-}
|
|
|
|
{-# LANGUAGE ScopedTypeVariables #-}
|
|
|
|
{-# LANGUAGE TypeFamilies #-}
|
|
|
|
{-# LANGUAGE TypeOperators #-}
|
2021-07-13 17:10:30 +02:00
|
|
|
{-# LANGUAGE TypeApplications #-}
|
2017-06-19 17:58:25 +02:00
|
|
|
{-# OPTIONS_GHC -freduction-depth=100 #-}
|
2014-12-10 16:10:57 +01:00
|
|
|
|
|
|
|
module Servant.ServerSpec where
|
|
|
|
|
2018-11-09 20:49:53 +01:00
|
|
|
import Prelude ()
|
|
|
|
import Prelude.Compat
|
|
|
|
|
2018-06-09 08:31:39 +02:00
|
|
|
import Control.Monad
|
|
|
|
(forM_, unless, when)
|
|
|
|
import Control.Monad.Error.Class
|
|
|
|
(MonadError (..))
|
|
|
|
import Data.Aeson
|
|
|
|
(FromJSON, ToJSON, decode', encode)
|
2018-11-09 20:49:53 +01:00
|
|
|
import qualified Data.ByteString as BS
|
|
|
|
import qualified Data.ByteString.Base64 as Base64
|
2018-06-09 08:31:39 +02:00
|
|
|
import Data.Char
|
|
|
|
(toUpper)
|
2019-12-26 15:01:10 +01:00
|
|
|
import Data.Maybe
|
|
|
|
(fromMaybe)
|
2018-06-09 08:31:39 +02:00
|
|
|
import Data.Proxy
|
|
|
|
(Proxy (Proxy))
|
|
|
|
import Data.String
|
|
|
|
(fromString)
|
|
|
|
import Data.String.Conversions
|
|
|
|
(cs)
|
2018-11-09 20:49:53 +01:00
|
|
|
import qualified Data.Text as T
|
2018-06-09 08:31:39 +02:00
|
|
|
import GHC.Generics
|
|
|
|
(Generic)
|
|
|
|
import Network.HTTP.Types
|
2019-12-26 15:01:10 +01:00
|
|
|
(QueryItem, Status (..), hAccept, hContentType, imATeapot418,
|
2018-06-09 08:31:39 +02:00
|
|
|
methodDelete, methodGet, methodHead, methodPatch, methodPost,
|
|
|
|
methodPut, ok200, parseQuery)
|
|
|
|
import Network.Wai
|
2019-12-26 15:01:10 +01:00
|
|
|
(Application, Middleware, Request, pathInfo, queryString,
|
|
|
|
rawQueryString, requestHeaders, responseLBS)
|
2018-06-09 08:31:39 +02:00
|
|
|
import Network.Wai.Test
|
|
|
|
(defaultRequest, request, runSession, simpleBody,
|
|
|
|
simpleHeaders, simpleStatus)
|
|
|
|
import Servant.API
|
|
|
|
((:<|>) (..), (:>), AuthProtect, BasicAuth,
|
2019-12-26 15:01:10 +01:00
|
|
|
BasicAuthData (BasicAuthData), Capture, Capture', CaptureAll,
|
2020-11-18 19:57:20 +01:00
|
|
|
Delete, EmptyAPI, Fragment, Get, HasStatus (StatusOf), Header,
|
|
|
|
Headers, HttpVersion, IsSecure (..), JSON, Lenient,
|
|
|
|
NoContent (..), NoContentVerb, NoFraming, OctetStream, Patch,
|
|
|
|
PlainText, Post, Put, QueryFlag, QueryParam, QueryParams, Raw,
|
|
|
|
RemoteHost, ReqBody, SourceIO, StdMethod (..), Stream, Strict,
|
2021-06-10 17:10:50 +02:00
|
|
|
UVerb, Union, Verb, WithStatus (..), addHeader)
|
2018-06-09 08:31:39 +02:00
|
|
|
import Servant.Server
|
|
|
|
(Context ((:.), EmptyContext), Handler, Server, Tagged (..),
|
2020-10-31 20:45:46 +01:00
|
|
|
emptyServer, err401, err403, err404, respond, serve,
|
|
|
|
serveWithContext)
|
2018-11-09 20:49:53 +01:00
|
|
|
import Servant.Test.ComprehensiveAPI
|
|
|
|
import qualified Servant.Types.SourceT as S
|
2018-06-09 08:31:39 +02:00
|
|
|
import Test.Hspec
|
|
|
|
(Spec, context, describe, it, shouldBe, shouldContain)
|
|
|
|
import Test.Hspec.Wai
|
|
|
|
(get, liftIO, matchHeaders, matchStatus, shouldRespondWith,
|
|
|
|
with, (<:>))
|
2018-11-09 20:49:53 +01:00
|
|
|
import qualified Test.Hspec.Wai as THW
|
2018-06-09 08:31:39 +02:00
|
|
|
|
2016-03-06 22:23:55 +01:00
|
|
|
import Servant.Server.Experimental.Auth
|
2018-06-09 08:31:39 +02:00
|
|
|
(AuthHandler, AuthServerData, mkAuthHandler)
|
|
|
|
import Servant.Server.Internal.BasicAuth
|
|
|
|
(BasicAuthCheck (BasicAuthCheck),
|
|
|
|
BasicAuthResult (Authorized, Unauthorized))
|
2016-02-28 23:23:32 +01:00
|
|
|
import Servant.Server.Internal.Context
|
2018-06-09 08:31:39 +02:00
|
|
|
(NamedContext (..))
|
2014-12-10 16:10:57 +01:00
|
|
|
|
2016-01-16 19:17:46 +01:00
|
|
|
-- * comprehensive api test
|
|
|
|
|
2016-01-18 19:55:14 +01:00
|
|
|
-- This declaration simply checks that all instances are in place.
|
2016-02-28 23:23:32 +01:00
|
|
|
_ = serveWithContext comprehensiveAPI comprehensiveApiContext
|
2016-01-18 21:27:19 +01:00
|
|
|
|
2016-02-28 23:23:32 +01:00
|
|
|
comprehensiveApiContext :: Context '[NamedContext "foo" '[]]
|
|
|
|
comprehensiveApiContext = NamedContext EmptyContext :. EmptyContext
|
2014-12-10 16:10:57 +01:00
|
|
|
|
2016-01-08 17:43:10 +01:00
|
|
|
-- * Specs
|
2014-12-10 16:10:57 +01:00
|
|
|
|
|
|
|
spec :: Spec
|
|
|
|
spec = do
|
2016-01-08 17:43:10 +01:00
|
|
|
verbSpec
|
2020-10-31 20:45:46 +01:00
|
|
|
uverbSpec
|
2014-12-10 16:10:57 +01:00
|
|
|
captureSpec
|
2018-06-10 18:38:22 +02:00
|
|
|
captureAllSpec
|
2014-12-10 16:10:57 +01:00
|
|
|
queryParamSpec
|
2020-11-18 19:57:20 +01:00
|
|
|
fragmentSpec
|
2016-01-08 17:43:10 +01:00
|
|
|
reqBodySpec
|
2015-02-24 14:48:17 +01:00
|
|
|
headerSpec
|
2014-12-10 16:10:57 +01:00
|
|
|
rawSpec
|
2016-01-08 17:43:10 +01:00
|
|
|
alternativeSpec
|
2015-04-13 15:13:55 +02:00
|
|
|
responseHeadersSpec
|
2021-06-10 17:10:50 +02:00
|
|
|
uverbResponseHeadersSpec
|
2016-01-08 17:43:10 +01:00
|
|
|
miscCombinatorSpec
|
2016-02-17 19:56:15 +01:00
|
|
|
basicAuthSpec
|
2016-02-17 21:21:57 +01:00
|
|
|
genAuthSpec
|
2016-01-08 17:43:10 +01:00
|
|
|
|
|
|
|
------------------------------------------------------------------------------
|
|
|
|
-- * verbSpec {{{
|
|
|
|
------------------------------------------------------------------------------
|
|
|
|
|
|
|
|
type VerbApi method status
|
|
|
|
= Verb method status '[JSON] Person
|
2019-09-07 17:13:46 +02:00
|
|
|
:<|> "noContent" :> NoContentVerb method
|
2016-01-08 17:43:10 +01:00
|
|
|
:<|> "header" :> Verb method status '[JSON] (Headers '[Header "H" Int] Person)
|
|
|
|
:<|> "headerNC" :> Verb method status '[JSON] (Headers '[Header "H" Int] NoContent)
|
2016-04-12 10:35:07 +02:00
|
|
|
:<|> "accept" :> ( Verb method status '[JSON] Person
|
|
|
|
:<|> Verb method status '[PlainText] String
|
|
|
|
)
|
2018-06-26 19:11:28 +02:00
|
|
|
:<|> "stream" :> Stream method status NoFraming OctetStream (SourceIO BS.ByteString)
|
2016-01-08 17:43:10 +01:00
|
|
|
|
|
|
|
verbSpec :: Spec
|
|
|
|
verbSpec = describe "Servant.API.Verb" $ do
|
|
|
|
let server :: Server (VerbApi method status)
|
|
|
|
server = return alice
|
|
|
|
:<|> return NoContent
|
|
|
|
:<|> return (addHeader 5 alice)
|
|
|
|
:<|> return (addHeader 10 NoContent)
|
2016-04-12 10:35:07 +02:00
|
|
|
:<|> (return alice :<|> return "B")
|
2018-06-26 19:11:28 +02:00
|
|
|
:<|> return (S.source ["bytestring"])
|
2018-06-09 08:31:39 +02:00
|
|
|
|
2016-01-08 17:43:10 +01:00
|
|
|
get200 = Proxy :: Proxy (VerbApi 'GET 200)
|
|
|
|
post210 = Proxy :: Proxy (VerbApi 'POST 210)
|
|
|
|
put203 = Proxy :: Proxy (VerbApi 'PUT 203)
|
|
|
|
delete280 = Proxy :: Proxy (VerbApi 'DELETE 280)
|
|
|
|
patch214 = Proxy :: Proxy (VerbApi 'PATCH 214)
|
|
|
|
wrongMethod m = if m == methodPatch then methodPost else methodPatch
|
|
|
|
test desc api method (status :: Int) = context desc $
|
|
|
|
|
2016-02-18 16:36:24 +01:00
|
|
|
with (return $ serve api server) $ do
|
2016-01-08 17:43:10 +01:00
|
|
|
|
|
|
|
-- HEAD and 214/215 need not return bodies
|
|
|
|
unless (status `elem` [214, 215] || method == methodHead) $
|
|
|
|
it "returns the person" $ do
|
2016-02-17 19:56:15 +01:00
|
|
|
response <- THW.request method "/" [] ""
|
2016-01-08 17:43:10 +01:00
|
|
|
liftIO $ statusCode (simpleStatus response) `shouldBe` status
|
|
|
|
liftIO $ decode' (simpleBody response) `shouldBe` Just alice
|
|
|
|
|
|
|
|
it "returns no content on NoContent" $ do
|
2016-02-17 19:56:15 +01:00
|
|
|
response <- THW.request method "/noContent" [] ""
|
2019-09-07 17:13:46 +02:00
|
|
|
liftIO $ statusCode (simpleStatus response) `shouldBe` 204
|
2016-01-08 17:43:10 +01:00
|
|
|
liftIO $ simpleBody response `shouldBe` ""
|
|
|
|
|
|
|
|
-- HEAD should not return body
|
|
|
|
when (method == methodHead) $
|
|
|
|
it "HEAD returns no content body" $ do
|
2016-02-17 19:56:15 +01:00
|
|
|
response <- THW.request method "/" [] ""
|
2016-01-08 17:43:10 +01:00
|
|
|
liftIO $ simpleBody response `shouldBe` ""
|
|
|
|
|
|
|
|
it "throws 405 on wrong method " $ do
|
2016-02-17 19:56:15 +01:00
|
|
|
THW.request (wrongMethod method) "/" [] ""
|
2016-01-08 17:43:10 +01:00
|
|
|
`shouldRespondWith` 405
|
|
|
|
|
|
|
|
it "returns headers" $ do
|
2016-02-17 19:56:15 +01:00
|
|
|
response1 <- THW.request method "/header" [] ""
|
2016-01-08 17:43:10 +01:00
|
|
|
liftIO $ statusCode (simpleStatus response1) `shouldBe` status
|
|
|
|
liftIO $ simpleHeaders response1 `shouldContain` [("H", "5")]
|
|
|
|
|
2016-02-17 19:56:15 +01:00
|
|
|
response2 <- THW.request method "/header" [] ""
|
2016-01-08 17:43:10 +01:00
|
|
|
liftIO $ statusCode (simpleStatus response2) `shouldBe` status
|
|
|
|
liftIO $ simpleHeaders response2 `shouldContain` [("H", "5")]
|
|
|
|
|
|
|
|
it "handles trailing '/' gracefully" $ do
|
2016-02-17 19:56:15 +01:00
|
|
|
response <- THW.request method "/headerNC/" [] ""
|
2016-01-08 17:43:10 +01:00
|
|
|
liftIO $ statusCode (simpleStatus response) `shouldBe` status
|
|
|
|
|
|
|
|
it "returns 406 if the Accept header is not supported" $ do
|
2016-02-17 19:56:15 +01:00
|
|
|
THW.request method "" [(hAccept, "crazy/mime")] ""
|
2016-01-08 17:43:10 +01:00
|
|
|
`shouldRespondWith` 406
|
|
|
|
|
|
|
|
it "responds if the Accept header is supported" $ do
|
2016-02-17 19:56:15 +01:00
|
|
|
response <- THW.request method ""
|
2016-01-08 17:43:10 +01:00
|
|
|
[(hAccept, "application/json")] ""
|
|
|
|
liftIO $ statusCode (simpleStatus response) `shouldBe` status
|
|
|
|
|
2016-04-12 10:35:07 +02:00
|
|
|
unless (status `elem` [214, 215] || method == methodHead) $
|
|
|
|
it "allows modular specification of supported content types" $ do
|
|
|
|
response <- THW.request method "/accept" [(hAccept, "text/plain")] ""
|
|
|
|
liftIO $ statusCode (simpleStatus response) `shouldBe` status
|
|
|
|
liftIO $ simpleBody response `shouldBe` "B"
|
|
|
|
|
2016-01-08 17:43:10 +01:00
|
|
|
it "sets the Content-Type header" $ do
|
2016-02-17 19:56:15 +01:00
|
|
|
response <- THW.request method "" [] ""
|
2016-01-08 17:43:10 +01:00
|
|
|
liftIO $ simpleHeaders response `shouldContain`
|
2017-01-16 11:13:48 +01:00
|
|
|
[("Content-Type", "application/json;charset=utf-8")]
|
2016-01-08 17:43:10 +01:00
|
|
|
|
2018-06-09 08:31:39 +02:00
|
|
|
it "works for Stream as for Result" $ do
|
|
|
|
response <- THW.request method "/stream" [] ""
|
|
|
|
liftIO $ statusCode (simpleStatus response) `shouldBe` status
|
|
|
|
liftIO $ simpleBody response `shouldBe` "bytestring"
|
|
|
|
|
2016-01-08 17:43:10 +01:00
|
|
|
test "GET 200" get200 methodGet 200
|
|
|
|
test "POST 210" post210 methodPost 210
|
|
|
|
test "PUT 203" put203 methodPut 203
|
|
|
|
test "DELETE 280" delete280 methodDelete 280
|
|
|
|
test "PATCH 214" patch214 methodPatch 214
|
|
|
|
test "GET 200 with HEAD" get200 methodHead 200
|
|
|
|
|
|
|
|
-- }}}
|
|
|
|
------------------------------------------------------------------------------
|
|
|
|
-- * captureSpec {{{
|
|
|
|
------------------------------------------------------------------------------
|
2014-12-10 16:10:57 +01:00
|
|
|
|
2015-01-12 15:08:41 +01:00
|
|
|
type CaptureApi = Capture "legs" Integer :> Get '[JSON] Animal
|
2019-03-18 17:18:24 +01:00
|
|
|
:<|> "ears" :> Capture' '[Lenient] "ears" Integer :> Get '[JSON] Animal
|
|
|
|
:<|> "eyes" :> Capture' '[Strict] "eyes" Integer :> Get '[JSON] Animal
|
2014-12-10 16:10:57 +01:00
|
|
|
captureApi :: Proxy CaptureApi
|
|
|
|
captureApi = Proxy
|
2019-03-18 17:18:24 +01:00
|
|
|
|
|
|
|
captureServer :: Server CaptureApi
|
|
|
|
captureServer = getLegs :<|> getEars :<|> getEyes
|
|
|
|
where getLegs :: Integer -> Handler Animal
|
|
|
|
getLegs legs = case legs of
|
|
|
|
4 -> return jerry
|
|
|
|
2 -> return tweety
|
|
|
|
_ -> throwError err404
|
|
|
|
|
|
|
|
getEars :: Either String Integer -> Handler Animal
|
2019-12-26 15:01:10 +01:00
|
|
|
getEars (Left _) = return chimera -- ignore integer parse error, return weird animal
|
2019-03-18 17:18:24 +01:00
|
|
|
getEars (Right 2) = return jerry
|
|
|
|
getEars (Right _) = throwError err404
|
|
|
|
|
|
|
|
getEyes :: Integer -> Handler Animal
|
|
|
|
getEyes 2 = return jerry
|
|
|
|
getEyes _ = throwError err404
|
2014-12-10 16:10:57 +01:00
|
|
|
|
|
|
|
captureSpec :: Spec
|
|
|
|
captureSpec = do
|
|
|
|
describe "Servant.API.Capture" $ do
|
2016-02-18 16:36:24 +01:00
|
|
|
with (return (serve captureApi captureServer)) $ do
|
2015-04-06 16:43:36 +02:00
|
|
|
|
2014-12-10 16:10:57 +01:00
|
|
|
it "can capture parts of the 'pathInfo'" $ do
|
|
|
|
response <- get "/2"
|
2015-04-06 16:43:36 +02:00
|
|
|
liftIO $ decode' (simpleBody response) `shouldBe` Just tweety
|
|
|
|
|
2016-03-23 08:06:38 +01:00
|
|
|
it "returns 400 if the decoding fails" $ do
|
|
|
|
get "/notAnInt" `shouldRespondWith` 400
|
2014-12-10 16:10:57 +01:00
|
|
|
|
2019-03-18 17:18:24 +01:00
|
|
|
it "returns an animal if eyes or ears are 2" $ do
|
|
|
|
get "/ears/2" `shouldRespondWith` 200
|
|
|
|
get "/eyes/2" `shouldRespondWith` 200
|
|
|
|
|
|
|
|
it "returns a weird animal on Lenient Capture" $ do
|
|
|
|
response <- get "/ears/bla"
|
|
|
|
liftIO $ decode' (simpleBody response) `shouldBe` Just chimera
|
|
|
|
|
|
|
|
it "returns 400 if parsing integer fails on Strict Capture" $ do
|
|
|
|
get "/eyes/bla" `shouldRespondWith` 400
|
|
|
|
|
2014-12-10 16:10:57 +01:00
|
|
|
with (return (serve
|
|
|
|
(Proxy :: Proxy (Capture "captured" String :> Raw))
|
2020-10-31 20:45:46 +01:00
|
|
|
(\ "captured" -> Tagged $ \request_ sendResponse ->
|
|
|
|
sendResponse $ responseLBS ok200 [] (cs $ show $ pathInfo request_)))) $ do
|
2014-12-10 16:10:57 +01:00
|
|
|
it "strips the captured path snippet from pathInfo" $ do
|
|
|
|
get "/captured/foo" `shouldRespondWith` (fromString (show ["foo" :: String]))
|
|
|
|
|
2016-05-26 20:10:15 +02:00
|
|
|
-- }}}
|
|
|
|
------------------------------------------------------------------------------
|
|
|
|
-- * captureAllSpec {{{
|
|
|
|
------------------------------------------------------------------------------
|
|
|
|
|
|
|
|
type CaptureAllApi = CaptureAll "legs" Integer :> Get '[JSON] Animal
|
|
|
|
captureAllApi :: Proxy CaptureAllApi
|
|
|
|
captureAllApi = Proxy
|
|
|
|
captureAllServer :: [Integer] -> Handler Animal
|
|
|
|
captureAllServer legs = case sum legs of
|
|
|
|
4 -> return jerry
|
|
|
|
2 -> return tweety
|
|
|
|
0 -> return beholder
|
2017-01-16 10:44:25 +01:00
|
|
|
_ -> throwError err404
|
2016-05-26 20:10:15 +02:00
|
|
|
|
|
|
|
captureAllSpec :: Spec
|
|
|
|
captureAllSpec = do
|
|
|
|
describe "Servant.API.CaptureAll" $ do
|
|
|
|
with (return (serve captureAllApi captureAllServer)) $ do
|
|
|
|
|
|
|
|
it "can capture a single element of the 'pathInfo'" $ do
|
|
|
|
response <- get "/2"
|
|
|
|
liftIO $ decode' (simpleBody response) `shouldBe` Just tweety
|
|
|
|
|
|
|
|
it "can capture multiple elements of the 'pathInfo'" $ do
|
|
|
|
response <- get "/2/2"
|
|
|
|
liftIO $ decode' (simpleBody response) `shouldBe` Just jerry
|
|
|
|
|
|
|
|
it "can capture arbitrarily many elements of the 'pathInfo'" $ do
|
|
|
|
response <- get "/1/1/0/1/0/1"
|
|
|
|
liftIO $ decode' (simpleBody response) `shouldBe` Just jerry
|
|
|
|
|
|
|
|
it "can capture when there are no elements in 'pathInfo'" $ do
|
|
|
|
response <- get "/"
|
|
|
|
liftIO $ decode' (simpleBody response) `shouldBe` Just beholder
|
|
|
|
|
|
|
|
it "returns 400 if the decoding fails" $ do
|
|
|
|
get "/notAnInt" `shouldRespondWith` 400
|
|
|
|
|
|
|
|
it "returns 400 if the decoding fails, regardless of which element" $ do
|
|
|
|
get "/1/0/0/notAnInt/3/" `shouldRespondWith` 400
|
|
|
|
|
|
|
|
it "returns 400 if the decoding fails, even when it's multiple elements" $ do
|
|
|
|
get "/1/0/0/notAnInt/3/orange/" `shouldRespondWith` 400
|
|
|
|
|
|
|
|
with (return (serve
|
|
|
|
(Proxy :: Proxy (CaptureAll "segments" String :> Raw))
|
2020-10-31 20:45:46 +01:00
|
|
|
(\ _captured -> Tagged $ \request_ sendResponse ->
|
|
|
|
sendResponse $ responseLBS ok200 [] (cs $ show $ pathInfo request_)))) $ do
|
2016-05-26 20:10:15 +02:00
|
|
|
it "consumes everything from pathInfo" $ do
|
|
|
|
get "/captured/foo/bar/baz" `shouldRespondWith` (fromString (show ([] :: [Int])))
|
|
|
|
|
2016-01-08 17:43:10 +01:00
|
|
|
-- }}}
|
|
|
|
------------------------------------------------------------------------------
|
|
|
|
-- * queryParamSpec {{{
|
|
|
|
------------------------------------------------------------------------------
|
2014-12-10 16:10:57 +01:00
|
|
|
|
2015-01-12 15:08:41 +01:00
|
|
|
type QueryParamApi = QueryParam "name" String :> Get '[JSON] Person
|
|
|
|
:<|> "a" :> QueryParams "names" String :> Get '[JSON] Person
|
|
|
|
:<|> "b" :> QueryFlag "capitalize" :> Get '[JSON] Person
|
2016-12-12 15:17:06 +01:00
|
|
|
:<|> "param" :> QueryParam "age" Integer :> Get '[JSON] Person
|
|
|
|
:<|> "multiparam" :> QueryParams "ages" Integer :> Get '[JSON] Person
|
2014-12-10 16:10:57 +01:00
|
|
|
|
|
|
|
queryParamApi :: Proxy QueryParamApi
|
|
|
|
queryParamApi = Proxy
|
|
|
|
|
|
|
|
qpServer :: Server QueryParamApi
|
2016-12-12 15:17:06 +01:00
|
|
|
qpServer = queryParamServer :<|> qpNames :<|> qpCapitalize :<|> qpAge :<|> qpAges
|
2014-12-10 16:10:57 +01:00
|
|
|
|
|
|
|
where qpNames (_:name2:_) = return alice { name = name2 }
|
|
|
|
qpNames _ = return alice
|
|
|
|
|
|
|
|
qpCapitalize False = return alice
|
|
|
|
qpCapitalize True = return alice { name = map toUpper (name alice) }
|
|
|
|
|
2016-12-12 15:17:06 +01:00
|
|
|
qpAge Nothing = return alice
|
|
|
|
qpAge (Just age') = return alice{ age = age'}
|
|
|
|
|
|
|
|
qpAges ages = return alice{ age = sum ages}
|
|
|
|
|
2015-01-06 17:26:37 +01:00
|
|
|
queryParamServer (Just name_) = return alice{name = name_}
|
2014-12-10 16:10:57 +01:00
|
|
|
queryParamServer Nothing = return alice
|
|
|
|
|
2019-12-26 15:01:10 +01:00
|
|
|
|
|
|
|
|
2014-12-10 16:10:57 +01:00
|
|
|
queryParamSpec :: Spec
|
|
|
|
queryParamSpec = do
|
2019-12-26 15:01:10 +01:00
|
|
|
let mkRequest params pinfo = Network.Wai.Test.request defaultRequest
|
|
|
|
{ rawQueryString = params
|
|
|
|
, queryString = parseQuery params
|
|
|
|
, pathInfo = pinfo
|
|
|
|
}
|
|
|
|
|
2014-12-10 16:10:57 +01:00
|
|
|
describe "Servant.API.QueryParam" $ do
|
2016-01-14 23:43:48 +01:00
|
|
|
it "allows retrieving simple GET parameters" $
|
2019-12-26 15:01:10 +01:00
|
|
|
flip runSession (serve queryParamApi qpServer) $ do
|
|
|
|
response1 <- mkRequest "?name=bob" []
|
|
|
|
liftIO $ decode' (simpleBody response1) `shouldBe` Just alice
|
|
|
|
{ name = "bob"
|
|
|
|
}
|
2014-12-10 16:10:57 +01:00
|
|
|
|
2016-01-14 23:43:48 +01:00
|
|
|
it "allows retrieving lists in GET parameters" $
|
2019-12-26 15:01:10 +01:00
|
|
|
flip runSession (serve queryParamApi qpServer) $ do
|
|
|
|
response2 <- mkRequest "?names[]=bob&names[]=john" ["a"]
|
|
|
|
liftIO $ decode' (simpleBody response2) `shouldBe` Just alice
|
|
|
|
{ name = "john"
|
|
|
|
}
|
2014-12-10 16:10:57 +01:00
|
|
|
|
2016-12-12 15:17:06 +01:00
|
|
|
it "parses a query parameter" $
|
2019-12-26 15:01:10 +01:00
|
|
|
flip runSession (serve queryParamApi qpServer) $ do
|
|
|
|
response <- mkRequest "?age=55" ["param"]
|
|
|
|
liftIO $ decode' (simpleBody response) `shouldBe` Just alice
|
|
|
|
{ age = 55
|
|
|
|
}
|
2016-12-12 15:17:06 +01:00
|
|
|
|
|
|
|
it "generates an error on query parameter parse failure" $
|
2019-12-26 15:01:10 +01:00
|
|
|
flip runSession (serve queryParamApi qpServer) $ do
|
|
|
|
response <- mkRequest "?age=foo" ["param"]
|
2016-12-12 15:17:06 +01:00
|
|
|
liftIO $ statusCode (simpleStatus response) `shouldBe` 400
|
|
|
|
return ()
|
|
|
|
|
|
|
|
it "parses multiple query parameters" $
|
2019-12-26 15:01:10 +01:00
|
|
|
flip runSession (serve queryParamApi qpServer) $ do
|
|
|
|
response <- mkRequest "?ages=10&ages=22" ["multiparam"]
|
|
|
|
liftIO $ decode' (simpleBody response) `shouldBe` Just alice
|
|
|
|
{ age = 32
|
|
|
|
}
|
2016-12-12 15:17:06 +01:00
|
|
|
|
|
|
|
it "generates an error on parse failures of multiple parameters" $
|
2019-12-26 15:01:10 +01:00
|
|
|
flip runSession (serve queryParamApi qpServer) $ do
|
|
|
|
response <- mkRequest "?ages=2&ages=foo" ["multiparam"]
|
2016-12-12 15:17:06 +01:00
|
|
|
liftIO $ statusCode (simpleStatus response) `shouldBe` 400
|
|
|
|
return ()
|
|
|
|
|
2016-01-14 23:43:48 +01:00
|
|
|
it "allows retrieving value-less GET parameters" $
|
2019-12-26 15:01:10 +01:00
|
|
|
flip runSession (serve queryParamApi qpServer) $ do
|
|
|
|
response3 <- mkRequest "?capitalize" ["b"]
|
|
|
|
liftIO $ decode' (simpleBody response3) `shouldBe` Just alice
|
|
|
|
{ name = "ALICE"
|
|
|
|
}
|
|
|
|
|
|
|
|
response3' <- mkRequest "?capitalize=" ["b"]
|
|
|
|
liftIO $ decode' (simpleBody response3') `shouldBe` Just alice
|
|
|
|
{ name = "ALICE"
|
|
|
|
}
|
|
|
|
|
|
|
|
response3'' <- mkRequest "?unknown=" ["b"]
|
|
|
|
liftIO $ decode' (simpleBody response3'') `shouldBe` Just alice
|
|
|
|
{ name = "Alice"
|
|
|
|
}
|
|
|
|
|
|
|
|
describe "Uses queryString instead of rawQueryString" $ do
|
|
|
|
-- test query parameters rewriter
|
|
|
|
let queryRewriter :: Middleware
|
|
|
|
queryRewriter app req = app req
|
|
|
|
{ queryString = fmap rewrite $ queryString req
|
|
|
|
}
|
|
|
|
where
|
|
|
|
rewrite :: QueryItem -> QueryItem
|
|
|
|
rewrite (k, v) = (fromMaybe k (BS.stripPrefix "person_" k), v)
|
|
|
|
|
|
|
|
let app = queryRewriter $ serve queryParamApi qpServer
|
|
|
|
|
|
|
|
it "allows rewriting for simple GET/query parameters" $
|
|
|
|
flip runSession app $ do
|
|
|
|
response1 <- mkRequest "?person_name=bob" []
|
|
|
|
liftIO $ decode' (simpleBody response1) `shouldBe` Just alice
|
|
|
|
{ name = "bob"
|
|
|
|
}
|
|
|
|
|
|
|
|
it "allows rewriting for lists in GET parameters" $
|
|
|
|
flip runSession app $ do
|
|
|
|
response2 <- mkRequest "?person_names[]=bob&person_names[]=john" ["a"]
|
|
|
|
liftIO $ decode' (simpleBody response2) `shouldBe` Just alice
|
|
|
|
{ name = "john"
|
|
|
|
}
|
|
|
|
|
|
|
|
it "allows rewriting when parsing multiple query parameters" $
|
|
|
|
flip runSession app $ do
|
|
|
|
response <- mkRequest "?person_ages=10&person_ages=22" ["multiparam"]
|
|
|
|
liftIO $ decode' (simpleBody response) `shouldBe` Just alice
|
|
|
|
{ age = 32
|
|
|
|
}
|
|
|
|
|
|
|
|
it "allows retrieving value-less GET parameters" $
|
|
|
|
flip runSession app $ do
|
|
|
|
response3 <- mkRequest "?person_capitalize" ["b"]
|
|
|
|
liftIO $ decode' (simpleBody response3) `shouldBe` Just alice
|
|
|
|
{ name = "ALICE"
|
|
|
|
}
|
|
|
|
|
|
|
|
response3' <- mkRequest "?person_capitalize=" ["b"]
|
|
|
|
liftIO $ decode' (simpleBody response3') `shouldBe` Just alice
|
|
|
|
{ name = "ALICE"
|
|
|
|
}
|
|
|
|
|
|
|
|
response3'' <- mkRequest "?person_unknown=" ["b"]
|
|
|
|
liftIO $ decode' (simpleBody response3'') `shouldBe` Just alice
|
|
|
|
{ name = "Alice"
|
|
|
|
}
|
2014-12-28 23:07:14 +01:00
|
|
|
|
2020-11-18 19:57:20 +01:00
|
|
|
-- }}}
|
|
|
|
------------------------------------------------------------------------------
|
|
|
|
-- * fragmentSpec {{{
|
|
|
|
------------------------------------------------------------------------------
|
|
|
|
|
|
|
|
type FragmentApi = "name" :> Fragment String :> Get '[JSON] Person
|
|
|
|
:<|> "age" :> Fragment Integer :> Get '[JSON] Person
|
|
|
|
|
|
|
|
fragmentApi :: Proxy FragmentApi
|
|
|
|
fragmentApi = Proxy
|
|
|
|
|
|
|
|
fragServer :: Server FragmentApi
|
|
|
|
fragServer = fragmentServer :<|> fragAge
|
|
|
|
where
|
|
|
|
fragmentServer = return alice
|
|
|
|
fragAge = return alice
|
|
|
|
|
|
|
|
fragmentSpec :: Spec
|
|
|
|
fragmentSpec = do
|
|
|
|
let mkRequest params pinfo = Network.Wai.Test.request defaultRequest
|
|
|
|
{ rawQueryString = params
|
|
|
|
, queryString = parseQuery params
|
|
|
|
, pathInfo = pinfo
|
|
|
|
}
|
|
|
|
|
|
|
|
describe "Servant.API.Fragment" $ do
|
|
|
|
it "ignores fragment even if it is present in query" $ do
|
|
|
|
flip runSession (serve fragmentApi fragServer) $ do
|
|
|
|
response1 <- mkRequest "#Alice" ["name"]
|
|
|
|
liftIO $ decode' (simpleBody response1) `shouldBe` Just alice
|
|
|
|
|
2016-01-08 17:43:10 +01:00
|
|
|
-- }}}
|
|
|
|
------------------------------------------------------------------------------
|
|
|
|
-- * reqBodySpec {{{
|
|
|
|
------------------------------------------------------------------------------
|
|
|
|
type ReqBodyApi = ReqBody '[JSON] Person :> Post '[JSON] Person
|
|
|
|
:<|> "blah" :> ReqBody '[JSON] Person :> Put '[JSON] Integer
|
2015-01-05 14:27:06 +01:00
|
|
|
|
2016-01-08 17:43:10 +01:00
|
|
|
reqBodyApi :: Proxy ReqBodyApi
|
|
|
|
reqBodyApi = Proxy
|
2015-03-12 18:29:57 +01:00
|
|
|
|
2016-01-08 17:43:10 +01:00
|
|
|
reqBodySpec :: Spec
|
|
|
|
reqBodySpec = describe "Servant.API.ReqBody" $ do
|
2015-03-12 18:29:57 +01:00
|
|
|
|
2016-01-08 17:43:10 +01:00
|
|
|
let server :: Server ReqBodyApi
|
|
|
|
server = return :<|> return . age
|
2016-02-17 19:56:15 +01:00
|
|
|
mkReq method x = THW.request method x
|
2016-01-08 17:43:10 +01:00
|
|
|
[(hContentType, "application/json;charset=utf-8")]
|
2015-03-12 18:29:57 +01:00
|
|
|
|
2016-02-18 16:36:24 +01:00
|
|
|
with (return $ serve reqBodyApi server) $ do
|
2015-03-12 18:29:57 +01:00
|
|
|
|
2016-01-08 17:43:10 +01:00
|
|
|
it "passes the argument to the handler" $ do
|
|
|
|
response <- mkReq methodPost "" (encode alice)
|
|
|
|
liftIO $ decode' (simpleBody response) `shouldBe` Just alice
|
2015-03-12 18:29:57 +01:00
|
|
|
|
2016-01-08 17:43:10 +01:00
|
|
|
it "rejects invalid request bodies with status 400" $ do
|
|
|
|
mkReq methodPut "/blah" "some invalid body" `shouldRespondWith` 400
|
2015-03-12 18:29:57 +01:00
|
|
|
|
2016-01-08 17:43:10 +01:00
|
|
|
it "responds with 415 if the request body media type is unsupported" $ do
|
2016-02-17 19:56:15 +01:00
|
|
|
THW.request methodPost "/"
|
2016-01-08 17:43:10 +01:00
|
|
|
[(hContentType, "application/nonsense")] "" `shouldRespondWith` 415
|
2015-03-12 18:29:57 +01:00
|
|
|
|
2016-01-08 17:43:10 +01:00
|
|
|
-- }}}
|
|
|
|
------------------------------------------------------------------------------
|
|
|
|
-- * headerSpec {{{
|
|
|
|
------------------------------------------------------------------------------
|
2015-03-12 18:29:57 +01:00
|
|
|
|
2016-07-08 09:11:34 +02:00
|
|
|
type HeaderApi a = Header "MyHeader" a :> Delete '[JSON] NoContent
|
2017-12-10 13:25:14 +01:00
|
|
|
headerApi :: Proxy a -> Proxy (HeaderApi a)
|
|
|
|
headerApi _ = Proxy
|
2015-02-24 14:48:17 +01:00
|
|
|
|
|
|
|
headerSpec :: Spec
|
|
|
|
headerSpec = describe "Servant.API.Header" $ do
|
|
|
|
|
2016-07-08 09:11:34 +02:00
|
|
|
let expectsInt :: Maybe Int -> Handler NoContent
|
|
|
|
expectsInt (Just x) = do
|
|
|
|
when (x /= 5) $ error "Expected 5"
|
|
|
|
return NoContent
|
2015-02-24 14:48:17 +01:00
|
|
|
expectsInt Nothing = error "Expected an int"
|
|
|
|
|
2016-07-08 09:11:34 +02:00
|
|
|
let expectsString :: Maybe String -> Handler NoContent
|
|
|
|
expectsString (Just x) = do
|
|
|
|
when (x /= "more from you") $ error "Expected more from you"
|
|
|
|
return NoContent
|
2015-02-24 14:48:17 +01:00
|
|
|
expectsString Nothing = error "Expected a string"
|
|
|
|
|
2017-12-10 13:25:14 +01:00
|
|
|
with (return (serve (headerApi (Proxy :: Proxy Int)) expectsInt)) $ do
|
2016-03-06 21:16:28 +01:00
|
|
|
let delete' x = THW.request methodDelete x [("MyHeader", "5")]
|
2015-02-24 14:48:17 +01:00
|
|
|
|
|
|
|
it "passes the header to the handler (Int)" $
|
2015-12-27 02:05:36 +01:00
|
|
|
delete' "/" "" `shouldRespondWith` 200
|
2015-02-24 14:48:17 +01:00
|
|
|
|
2017-12-10 13:25:14 +01:00
|
|
|
with (return (serve (headerApi (Proxy :: Proxy String)) expectsString)) $ do
|
2016-03-06 21:16:28 +01:00
|
|
|
let delete' x = THW.request methodDelete x [("MyHeader", "more from you")]
|
2015-02-24 14:48:17 +01:00
|
|
|
|
|
|
|
it "passes the header to the handler (String)" $
|
2015-12-27 02:05:36 +01:00
|
|
|
delete' "/" "" `shouldRespondWith` 200
|
2015-02-24 14:48:17 +01:00
|
|
|
|
2017-12-10 13:25:14 +01:00
|
|
|
with (return (serve (headerApi (Proxy :: Proxy Int)) expectsInt)) $ do
|
2017-04-06 13:59:16 +02:00
|
|
|
let delete' x = THW.request methodDelete x [("MyHeader", "not a number")]
|
|
|
|
|
|
|
|
it "checks for parse errors" $
|
|
|
|
delete' "/" "" `shouldRespondWith` 400
|
|
|
|
|
|
|
|
|
2016-01-08 17:43:10 +01:00
|
|
|
-- }}}
|
|
|
|
------------------------------------------------------------------------------
|
|
|
|
-- * rawSpec {{{
|
|
|
|
------------------------------------------------------------------------------
|
2014-12-10 16:10:57 +01:00
|
|
|
|
|
|
|
type RawApi = "foo" :> Raw
|
2016-01-08 17:43:10 +01:00
|
|
|
|
2014-12-10 16:10:57 +01:00
|
|
|
rawApi :: Proxy RawApi
|
|
|
|
rawApi = Proxy
|
2016-01-08 17:43:10 +01:00
|
|
|
|
2015-12-02 21:48:12 +01:00
|
|
|
rawApplication :: Show a => (Request -> a) -> Tagged m Application
|
2020-10-31 20:45:46 +01:00
|
|
|
rawApplication f = Tagged $ \request_ sendResponse ->
|
|
|
|
sendResponse $ responseLBS ok200 []
|
2015-12-02 21:48:12 +01:00
|
|
|
(cs $ show $ f request_)
|
2014-12-10 16:10:57 +01:00
|
|
|
|
|
|
|
rawSpec :: Spec
|
|
|
|
rawSpec = do
|
|
|
|
describe "Servant.API.Raw" $ do
|
|
|
|
it "runs applications" $ do
|
2019-12-26 15:01:10 +01:00
|
|
|
flip runSession (serve rawApi (rawApplication (const (42 :: Integer)))) $ do
|
2014-12-10 16:10:57 +01:00
|
|
|
response <- Network.Wai.Test.request defaultRequest{
|
|
|
|
pathInfo = ["foo"]
|
|
|
|
}
|
|
|
|
liftIO $ do
|
|
|
|
simpleBody response `shouldBe` "42"
|
|
|
|
|
|
|
|
it "gets the pathInfo modified" $ do
|
2019-12-26 15:01:10 +01:00
|
|
|
flip runSession (serve rawApi (rawApplication pathInfo)) $ do
|
2014-12-10 16:10:57 +01:00
|
|
|
response <- Network.Wai.Test.request defaultRequest{
|
|
|
|
pathInfo = ["foo", "bar"]
|
|
|
|
}
|
|
|
|
liftIO $ do
|
|
|
|
simpleBody response `shouldBe` cs (show ["bar" :: String])
|
|
|
|
|
2016-01-08 17:43:10 +01:00
|
|
|
-- }}}
|
|
|
|
------------------------------------------------------------------------------
|
|
|
|
-- * alternativeSpec {{{
|
|
|
|
------------------------------------------------------------------------------
|
2014-12-10 16:10:57 +01:00
|
|
|
type AlternativeApi =
|
2015-01-12 15:08:41 +01:00
|
|
|
"foo" :> Get '[JSON] Person
|
|
|
|
:<|> "bar" :> Get '[JSON] Animal
|
2015-04-06 16:12:28 +02:00
|
|
|
:<|> "foo" :> Get '[PlainText] T.Text
|
2015-04-06 16:43:36 +02:00
|
|
|
:<|> "bar" :> Post '[JSON] Animal
|
|
|
|
:<|> "bar" :> Put '[JSON] Animal
|
2016-07-08 09:11:34 +02:00
|
|
|
:<|> "bar" :> Delete '[JSON] NoContent
|
2014-12-10 16:10:57 +01:00
|
|
|
|
2016-01-08 17:43:10 +01:00
|
|
|
alternativeApi :: Proxy AlternativeApi
|
|
|
|
alternativeApi = Proxy
|
|
|
|
|
|
|
|
alternativeServer :: Server AlternativeApi
|
|
|
|
alternativeServer =
|
2014-12-10 16:10:57 +01:00
|
|
|
return alice
|
|
|
|
:<|> return jerry
|
2015-04-06 16:12:28 +02:00
|
|
|
:<|> return "a string"
|
2015-04-06 16:43:36 +02:00
|
|
|
:<|> return jerry
|
|
|
|
:<|> return jerry
|
2016-07-08 09:11:34 +02:00
|
|
|
:<|> return NoContent
|
2014-12-10 16:10:57 +01:00
|
|
|
|
2016-01-08 17:43:10 +01:00
|
|
|
alternativeSpec :: Spec
|
|
|
|
alternativeSpec = do
|
2014-12-10 16:10:57 +01:00
|
|
|
describe "Servant.API.Alternative" $ do
|
2016-02-18 16:36:24 +01:00
|
|
|
with (return $ serve alternativeApi alternativeServer) $ do
|
2015-04-06 16:43:36 +02:00
|
|
|
|
2014-12-10 16:10:57 +01:00
|
|
|
it "unions endpoints" $ do
|
|
|
|
response <- get "/foo"
|
|
|
|
liftIO $ do
|
|
|
|
decode' (simpleBody response) `shouldBe`
|
|
|
|
Just alice
|
2015-01-06 17:26:37 +01:00
|
|
|
response_ <- get "/bar"
|
2014-12-10 16:10:57 +01:00
|
|
|
liftIO $ do
|
2015-01-06 17:26:37 +01:00
|
|
|
decode' (simpleBody response_) `shouldBe`
|
2014-12-10 16:10:57 +01:00
|
|
|
Just jerry
|
2015-04-06 16:43:36 +02:00
|
|
|
|
|
|
|
it "checks all endpoints before returning 415" $ do
|
2015-04-06 16:12:28 +02:00
|
|
|
get "/foo" `shouldRespondWith` 200
|
2015-01-30 01:36:01 +01:00
|
|
|
|
2015-04-06 16:43:36 +02:00
|
|
|
it "returns 404 if the path does not exist" $ do
|
|
|
|
get "/nonexistent" `shouldRespondWith` 404
|
2016-01-08 17:43:10 +01:00
|
|
|
-- }}}
|
|
|
|
------------------------------------------------------------------------------
|
|
|
|
-- * responseHeaderSpec {{{
|
|
|
|
------------------------------------------------------------------------------
|
2015-04-13 15:13:55 +02:00
|
|
|
type ResponseHeadersApi =
|
|
|
|
Get '[JSON] (Headers '[Header "H1" Int, Header "H2" String] String)
|
|
|
|
:<|> Post '[JSON] (Headers '[Header "H1" Int, Header "H2" String] String)
|
|
|
|
:<|> Put '[JSON] (Headers '[Header "H1" Int, Header "H2" String] String)
|
|
|
|
:<|> Patch '[JSON] (Headers '[Header "H1" Int, Header "H2" String] String)
|
|
|
|
|
|
|
|
|
|
|
|
responseHeadersServer :: Server ResponseHeadersApi
|
|
|
|
responseHeadersServer = let h = return $ addHeader 5 $ addHeader "kilroy" "hi"
|
|
|
|
in h :<|> h :<|> h :<|> h
|
|
|
|
|
|
|
|
|
|
|
|
responseHeadersSpec :: Spec
|
|
|
|
responseHeadersSpec = describe "ResponseHeaders" $ do
|
2016-02-18 16:36:24 +01:00
|
|
|
with (return $ serve (Proxy :: Proxy ResponseHeadersApi) responseHeadersServer) $ do
|
2015-04-13 15:13:55 +02:00
|
|
|
|
2016-01-08 17:43:10 +01:00
|
|
|
let methods = [methodGet, methodPost, methodPut, methodPatch]
|
2015-04-13 15:13:55 +02:00
|
|
|
|
|
|
|
it "includes the headers in the response" $
|
2016-01-08 17:43:10 +01:00
|
|
|
forM_ methods $ \method ->
|
2016-02-17 19:56:15 +01:00
|
|
|
THW.request method "/" [] ""
|
2015-04-13 15:13:55 +02:00
|
|
|
`shouldRespondWith` "\"hi\""{ matchHeaders = ["H1" <:> "5", "H2" <:> "kilroy"]
|
2016-01-08 17:43:10 +01:00
|
|
|
, matchStatus = 200
|
2015-04-13 15:13:55 +02:00
|
|
|
}
|
|
|
|
|
|
|
|
it "responds with not found for non-existent endpoints" $
|
2016-01-08 17:43:10 +01:00
|
|
|
forM_ methods $ \method ->
|
2016-02-17 19:56:15 +01:00
|
|
|
THW.request method "blahblah" [] ""
|
2015-04-13 15:13:55 +02:00
|
|
|
`shouldRespondWith` 404
|
|
|
|
|
2015-09-10 08:49:19 +02:00
|
|
|
it "returns 406 if the Accept header is not supported" $
|
2016-01-08 17:43:10 +01:00
|
|
|
forM_ methods $ \method ->
|
2016-02-17 19:56:15 +01:00
|
|
|
THW.request method "" [(hAccept, "crazy/mime")] ""
|
2015-09-10 08:49:19 +02:00
|
|
|
`shouldRespondWith` 406
|
2015-04-13 15:13:55 +02:00
|
|
|
|
2021-06-10 17:10:50 +02:00
|
|
|
-- }}}
|
|
|
|
------------------------------------------------------------------------------
|
|
|
|
-- * uverbResponseHeaderSpec {{{
|
|
|
|
------------------------------------------------------------------------------
|
|
|
|
type UVerbHeaderResponse = '[
|
|
|
|
WithStatus 200 (Headers '[Header "H1" Int] String),
|
|
|
|
WithStatus 404 String ]
|
|
|
|
|
|
|
|
type UVerbResponseHeadersApi =
|
|
|
|
Capture "ok" Bool :> UVerb 'GET '[JSON] UVerbHeaderResponse
|
|
|
|
|
|
|
|
uverbResponseHeadersServer :: Server UVerbResponseHeadersApi
|
2021-07-13 17:10:30 +02:00
|
|
|
uverbResponseHeadersServer True = respond . WithStatus @200 . addHeader @"H1" (5 :: Int) $ ("foo" :: String)
|
|
|
|
uverbResponseHeadersServer False = respond . WithStatus @404 $ ("bar" :: String)
|
2021-06-10 17:10:50 +02:00
|
|
|
|
|
|
|
uverbResponseHeadersSpec :: Spec
|
|
|
|
uverbResponseHeadersSpec = describe "UVerbResponseHeaders" $ do
|
|
|
|
with (return $ serve (Proxy :: Proxy UVerbResponseHeadersApi) uverbResponseHeadersServer) $ do
|
|
|
|
|
|
|
|
it "includes the headers in the response" $
|
|
|
|
THW.request methodGet "/true" [] ""
|
|
|
|
`shouldRespondWith` "\"foo\"" { matchHeaders = ["H1" <:> "5"]
|
|
|
|
, matchStatus = 200
|
|
|
|
}
|
|
|
|
|
2016-01-08 17:43:10 +01:00
|
|
|
-- }}}
|
|
|
|
------------------------------------------------------------------------------
|
|
|
|
-- * miscCombinatorSpec {{{
|
|
|
|
------------------------------------------------------------------------------
|
2015-06-23 10:34:20 +02:00
|
|
|
type MiscCombinatorsAPI
|
|
|
|
= "version" :> HttpVersion :> Get '[JSON] String
|
|
|
|
:<|> "secure" :> IsSecure :> Get '[JSON] String
|
|
|
|
:<|> "host" :> RemoteHost :> Get '[JSON] String
|
2017-05-16 12:18:57 +02:00
|
|
|
:<|> "empty" :> EmptyAPI
|
2015-06-23 10:34:20 +02:00
|
|
|
|
|
|
|
miscApi :: Proxy MiscCombinatorsAPI
|
|
|
|
miscApi = Proxy
|
|
|
|
|
|
|
|
miscServ :: Server MiscCombinatorsAPI
|
|
|
|
miscServ = versionHandler
|
|
|
|
:<|> secureHandler
|
|
|
|
:<|> hostHandler
|
2017-05-16 17:59:41 +02:00
|
|
|
:<|> emptyServer
|
2015-06-23 10:34:20 +02:00
|
|
|
|
|
|
|
where versionHandler = return . show
|
|
|
|
secureHandler Secure = return "secure"
|
|
|
|
secureHandler NotSecure = return "not secure"
|
|
|
|
hostHandler = return . show
|
|
|
|
|
2016-01-08 17:43:10 +01:00
|
|
|
miscCombinatorSpec :: Spec
|
2016-02-18 16:36:24 +01:00
|
|
|
miscCombinatorSpec = with (return $ serve miscApi miscServ) $
|
2015-06-23 10:34:20 +02:00
|
|
|
describe "Misc. combinators for request inspection" $ do
|
|
|
|
it "Successfully gets the HTTP version specified in the request" $
|
|
|
|
go "/version" "\"HTTP/1.0\""
|
|
|
|
|
|
|
|
it "Checks that hspec-wai uses HTTP, not HTTPS" $
|
|
|
|
go "/secure" "\"not secure\""
|
|
|
|
|
|
|
|
it "Checks that hspec-wai issues request from 0.0.0.0" $
|
|
|
|
go "/host" "\"0.0.0.0:0\""
|
|
|
|
|
2017-05-16 12:18:57 +02:00
|
|
|
it "Doesn't serve anything from the empty API" $
|
|
|
|
Test.Hspec.Wai.get "empty" `shouldRespondWith` 404
|
|
|
|
|
2015-06-23 10:34:20 +02:00
|
|
|
where go path res = Test.Hspec.Wai.get path `shouldRespondWith` res
|
2016-02-17 19:56:15 +01:00
|
|
|
|
|
|
|
-- }}}
|
|
|
|
------------------------------------------------------------------------------
|
2016-02-17 21:21:57 +01:00
|
|
|
-- * Basic Authentication {{{
|
2016-02-17 19:56:15 +01:00
|
|
|
------------------------------------------------------------------------------
|
|
|
|
|
2016-04-06 05:16:18 +02:00
|
|
|
type BasicAuthAPI =
|
|
|
|
BasicAuth "foo" () :> "basic" :> Get '[JSON] Animal
|
|
|
|
:<|> Raw
|
2016-02-17 19:56:15 +01:00
|
|
|
|
|
|
|
basicAuthApi :: Proxy BasicAuthAPI
|
|
|
|
basicAuthApi = Proxy
|
2016-04-06 04:59:49 +02:00
|
|
|
|
2016-02-17 19:56:15 +01:00
|
|
|
basicAuthServer :: Server BasicAuthAPI
|
2016-04-06 05:16:18 +02:00
|
|
|
basicAuthServer =
|
|
|
|
const (return jerry) :<|>
|
2020-10-31 20:45:46 +01:00
|
|
|
(Tagged $ \ _ sendResponse -> sendResponse $ responseLBS imATeapot418 [] "")
|
2016-02-17 19:56:15 +01:00
|
|
|
|
|
|
|
basicAuthContext :: Context '[ BasicAuthCheck () ]
|
|
|
|
basicAuthContext =
|
2016-04-06 04:59:49 +02:00
|
|
|
let basicHandler = BasicAuthCheck $ \(BasicAuthData usr pass) ->
|
2016-02-17 19:56:15 +01:00
|
|
|
if usr == "servant" && pass == "server"
|
2016-04-06 04:59:49 +02:00
|
|
|
then return (Authorized ())
|
|
|
|
else return Unauthorized
|
2016-02-17 19:56:15 +01:00
|
|
|
in basicHandler :. EmptyContext
|
|
|
|
|
|
|
|
basicAuthSpec :: Spec
|
|
|
|
basicAuthSpec = do
|
|
|
|
describe "Servant.API.BasicAuth" $ do
|
|
|
|
with (return (serveWithContext basicAuthApi basicAuthContext basicAuthServer)) $ do
|
|
|
|
|
|
|
|
context "Basic Authentication" $ do
|
2016-04-06 09:24:30 +02:00
|
|
|
let basicAuthHeaders user password =
|
|
|
|
[("Authorization", "Basic " <> Base64.encode (user <> ":" <> password))]
|
2016-04-06 05:16:18 +02:00
|
|
|
it "returns 401 when no credentials given" $ do
|
2016-02-17 19:56:15 +01:00
|
|
|
get "/basic" `shouldRespondWith` 401
|
2016-04-06 04:59:49 +02:00
|
|
|
|
2016-04-06 05:16:18 +02:00
|
|
|
it "returns 403 when invalid credentials given" $ do
|
2016-04-06 09:24:30 +02:00
|
|
|
THW.request methodGet "/basic" (basicAuthHeaders "servant" "wrong") ""
|
2016-04-06 05:16:18 +02:00
|
|
|
`shouldRespondWith` 403
|
|
|
|
|
2016-02-17 19:56:15 +01:00
|
|
|
it "returns 200 with the right password" $ do
|
2016-04-06 09:24:30 +02:00
|
|
|
THW.request methodGet "/basic" (basicAuthHeaders "servant" "server") ""
|
2016-04-06 04:59:49 +02:00
|
|
|
`shouldRespondWith` 200
|
2016-02-17 19:56:15 +01:00
|
|
|
|
2016-04-06 05:16:18 +02:00
|
|
|
it "plays nice with subsequent Raw endpoints" $ do
|
|
|
|
get "/foo" `shouldRespondWith` 418
|
|
|
|
|
2016-02-17 21:21:57 +01:00
|
|
|
-- }}}
|
|
|
|
------------------------------------------------------------------------------
|
|
|
|
-- * General Authentication {{{
|
|
|
|
------------------------------------------------------------------------------
|
|
|
|
|
|
|
|
type GenAuthAPI = AuthProtect "auth" :> "auth" :> Get '[JSON] Animal
|
2016-04-06 13:45:44 +02:00
|
|
|
:<|> Raw
|
2016-04-06 04:59:49 +02:00
|
|
|
|
2016-04-06 13:45:44 +02:00
|
|
|
genAuthApi :: Proxy GenAuthAPI
|
|
|
|
genAuthApi = Proxy
|
2016-04-06 04:59:49 +02:00
|
|
|
|
2016-04-06 13:45:44 +02:00
|
|
|
genAuthServer :: Server GenAuthAPI
|
|
|
|
genAuthServer = const (return tweety)
|
2020-10-31 20:45:46 +01:00
|
|
|
:<|> (Tagged $ \ _ sendResponse -> sendResponse $ responseLBS imATeapot418 [] "")
|
2016-02-17 21:21:57 +01:00
|
|
|
|
|
|
|
type instance AuthServerData (AuthProtect "auth") = ()
|
|
|
|
|
2016-04-06 04:59:49 +02:00
|
|
|
genAuthContext :: Context '[AuthHandler Request ()]
|
2016-02-17 21:21:57 +01:00
|
|
|
genAuthContext =
|
2016-04-07 12:04:36 +02:00
|
|
|
let authHandler = \req -> case lookup "Auth" (requestHeaders req) of
|
|
|
|
Just "secret" -> return ()
|
2017-01-16 10:44:25 +01:00
|
|
|
Just _ -> throwError err403
|
|
|
|
Nothing -> throwError err401
|
2016-02-17 21:21:57 +01:00
|
|
|
in mkAuthHandler authHandler :. EmptyContext
|
|
|
|
|
|
|
|
genAuthSpec :: Spec
|
|
|
|
genAuthSpec = do
|
|
|
|
describe "Servant.API.Auth" $ do
|
2016-04-06 13:45:44 +02:00
|
|
|
with (return (serveWithContext genAuthApi genAuthContext genAuthServer)) $ do
|
2016-02-17 21:21:57 +01:00
|
|
|
|
|
|
|
context "Custom Auth Protection" $ do
|
|
|
|
it "returns 401 when missing headers" $ do
|
|
|
|
get "/auth" `shouldRespondWith` 401
|
2016-04-06 04:59:49 +02:00
|
|
|
|
2016-04-07 12:04:36 +02:00
|
|
|
it "returns 403 on wrong passwords" $ do
|
|
|
|
THW.request methodGet "/auth" [("Auth","wrong")] "" `shouldRespondWith` 403
|
|
|
|
|
2016-02-17 21:21:57 +01:00
|
|
|
it "returns 200 with the right header" $ do
|
|
|
|
THW.request methodGet "/auth" [("Auth","secret")] "" `shouldRespondWith` 200
|
|
|
|
|
2016-04-06 13:45:44 +02:00
|
|
|
it "plays nice with subsequent Raw endpoints" $ do
|
|
|
|
get "/foo" `shouldRespondWith` 418
|
|
|
|
|
2020-10-31 20:45:46 +01:00
|
|
|
-- }}}
|
|
|
|
------------------------------------------------------------------------------
|
|
|
|
-- * UVerb {{{
|
|
|
|
------------------------------------------------------------------------------
|
|
|
|
|
|
|
|
newtype PersonResponse = PersonResponse Person
|
|
|
|
deriving Generic
|
|
|
|
instance ToJSON PersonResponse
|
|
|
|
instance HasStatus PersonResponse where
|
|
|
|
type StatusOf PersonResponse = 200
|
|
|
|
|
|
|
|
newtype RedirectResponse = RedirectResponse String
|
|
|
|
deriving Generic
|
|
|
|
instance ToJSON RedirectResponse
|
|
|
|
instance HasStatus RedirectResponse where
|
|
|
|
type StatusOf RedirectResponse = 301
|
|
|
|
|
|
|
|
newtype AnimalResponse = AnimalResponse Animal
|
|
|
|
deriving Generic
|
|
|
|
instance ToJSON AnimalResponse
|
|
|
|
instance HasStatus AnimalResponse where
|
|
|
|
type StatusOf AnimalResponse = 203
|
|
|
|
|
|
|
|
|
|
|
|
type UVerbApi
|
|
|
|
= "person" :> Capture "shouldRedirect" Bool :> UVerb 'GET '[JSON] '[PersonResponse, RedirectResponse]
|
|
|
|
:<|> "animal" :> UVerb 'GET '[JSON] '[AnimalResponse]
|
|
|
|
|
|
|
|
uverbSpec :: Spec
|
|
|
|
uverbSpec = describe "Servant.API.UVerb " $ do
|
|
|
|
let
|
|
|
|
joe = Person "joe" 42
|
|
|
|
mouse = Animal "Mouse" 7
|
|
|
|
|
|
|
|
personHandler
|
|
|
|
:: Bool
|
|
|
|
-> Handler (Union '[PersonResponse
|
|
|
|
,RedirectResponse])
|
|
|
|
personHandler True = respond $ RedirectResponse "over there!"
|
|
|
|
personHandler False = respond $ PersonResponse joe
|
|
|
|
|
|
|
|
animalHandler = respond $ AnimalResponse mouse
|
|
|
|
|
|
|
|
server :: Server UVerbApi
|
|
|
|
server = personHandler :<|> animalHandler
|
|
|
|
|
|
|
|
with (pure $ serve (Proxy :: Proxy UVerbApi) server) $ do
|
|
|
|
context "A route returning either 301/String or 200/Person" $ do
|
|
|
|
context "when requesting the person" $ do
|
|
|
|
let theRequest = THW.get "/person/false"
|
|
|
|
it "returns status 200" $
|
|
|
|
theRequest `shouldRespondWith` 200
|
|
|
|
it "returns a person" $ do
|
|
|
|
response <- theRequest
|
|
|
|
liftIO $ decode' (simpleBody response) `shouldBe` Just joe
|
|
|
|
context "requesting the redirect" $
|
|
|
|
it "returns a message and status 301" $
|
|
|
|
THW.get "/person/true"
|
|
|
|
`shouldRespondWith` "\"over there!\"" {matchStatus = 301}
|
|
|
|
context "a route with a single response type" $ do
|
|
|
|
let theRequest = THW.get "/animal"
|
|
|
|
it "should return the defined status code" $
|
|
|
|
theRequest `shouldRespondWith` 203
|
|
|
|
it "should return the expected response" $ do
|
|
|
|
response <- theRequest
|
|
|
|
liftIO $ decode' (simpleBody response) `shouldBe` Just mouse
|
|
|
|
|
2016-01-08 17:43:10 +01:00
|
|
|
-- }}}
|
|
|
|
------------------------------------------------------------------------------
|
|
|
|
-- * Test data types {{{
|
|
|
|
------------------------------------------------------------------------------
|
|
|
|
|
|
|
|
data Person = Person {
|
|
|
|
name :: String,
|
|
|
|
age :: Integer
|
|
|
|
}
|
|
|
|
deriving (Eq, Show, Generic)
|
|
|
|
|
|
|
|
instance ToJSON Person
|
|
|
|
instance FromJSON Person
|
|
|
|
|
|
|
|
alice :: Person
|
|
|
|
alice = Person "Alice" 42
|
|
|
|
|
|
|
|
data Animal = Animal {
|
|
|
|
species :: String,
|
|
|
|
numberOfLegs :: Integer
|
|
|
|
}
|
|
|
|
deriving (Eq, Show, Generic)
|
|
|
|
|
|
|
|
instance ToJSON Animal
|
|
|
|
instance FromJSON Animal
|
|
|
|
|
|
|
|
jerry :: Animal
|
|
|
|
jerry = Animal "Mouse" 4
|
|
|
|
|
|
|
|
tweety :: Animal
|
|
|
|
tweety = Animal "Bird" 2
|
2016-05-26 20:10:15 +02:00
|
|
|
|
2019-03-18 17:18:24 +01:00
|
|
|
-- weird animal with non-integer amount of ears
|
|
|
|
chimera :: Animal
|
|
|
|
chimera = Animal "Chimera" (-1)
|
|
|
|
|
2016-05-26 20:10:15 +02:00
|
|
|
beholder :: Animal
|
|
|
|
beholder = Animal "Beholder" 0
|
2016-01-08 17:43:10 +01:00
|
|
|
-- }}}
|