test suite: GetParam

This commit is contained in:
Sönke Hahn 2014-10-27 16:24:56 +08:00
parent c393afa08e
commit 207f398572
2 changed files with 39 additions and 2 deletions

View File

@ -1,6 +1,9 @@
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE OverloadedStrings #-} {-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE TypeSynonymInstances #-}
module Servant.Text where module Servant.Text where
import Data.String.Conversions
import Data.Text import Data.Text
class FromText a where class FromText a where
@ -15,6 +18,12 @@ instance FromText Text where
instance ToText Text where instance ToText Text where
toText = id toText = id
instance FromText String where
fromText = Just . cs
instance ToText String where
toText = cs
instance FromText Bool where instance FromText Bool where
fromText "true" = Just True fromText "true" = Just True
fromText "false" = Just False fromText "false" = Just False
@ -22,4 +31,4 @@ instance FromText Bool where
instance ToText Bool where instance ToText Bool where
toText True = "true" toText True = "true"
toText False = "false" toText False = "false"

View File

@ -11,11 +11,14 @@ module Servant.ServerSpec where
import Data.Aeson import Data.Aeson
import Data.Proxy import Data.Proxy
import GHC.Generics import GHC.Generics
import Network.HTTP.Types
import Network.Wai
import Network.Wai.Test import Network.Wai.Test
import Test.Hspec import Test.Hspec
import Test.Hspec.Wai as Wai import Test.Hspec.Wai
import Servant.API.Get import Servant.API.Get
import Servant.API.GetParam
import Servant.API.Post import Servant.API.Post
import Servant.API.RQBody import Servant.API.RQBody
import Servant.API.Sub import Servant.API.Sub
@ -55,6 +58,7 @@ jerry = Animal "Mouse" 4
spec :: Spec spec :: Spec
spec = do spec = do
getSpec getSpec
getParamSpec
postSpec postSpec
unionSpec unionSpec
@ -76,6 +80,30 @@ getSpec :: Spec = do
post "/" "" `shouldRespondWith` 404 post "/" "" `shouldRespondWith` 404
type GetParamApi = GetParam "name" String :> Get Person
getParamApi :: Proxy GetParamApi
getParamApi = Proxy
getParamServer :: Server GetParamApi
getParamServer (Just name) = return alice{name = name}
getParamServer Nothing = return alice
getParamSpec :: Spec
getParamSpec = do
describe "Servant.API.GetParam" $ do
it "allows to retrieve GET parameters" $ do
(flip runSession) (serve getParamApi getParamServer) $ do
let params = "?name=bob"
response <- Network.Wai.Test.request defaultRequest{
rawQueryString = params,
queryString = parseQuery params
}
liftIO $ do
decode' (simpleBody response) `shouldBe` Just alice{
name = "bob"
}
type PostApi = RQBody Person :> (Post Integer) type PostApi = RQBody Person :> (Post Integer)
postApi :: Proxy PostApi postApi :: Proxy PostApi
postApi = Proxy postApi = Proxy