Implement staticClient which supplies a static argument to Client a structure

This commit is contained in:
Amar 2016-04-22 22:00:13 +08:00
parent 4f4ca69672
commit d2f8e96012
2 changed files with 26 additions and 0 deletions

View file

@ -8,7 +8,9 @@
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE TypeOperators #-}
{-# LANGUAGE MultiParamTypeClasses#-}
{-# LANGUAGE UndecidableInstances #-}
{-# LANGUAGE FunctionalDependencies #-}
#include "overlapping-compat.h"
-- | This module provides 'client' which can automatically generate
@ -18,6 +20,7 @@ module Servant.Client
( AuthClientData
, AuthenticateReq(..)
, client
, staticClient
, HasClient(..)
, ClientM
, mkAuthenticateReq
@ -60,6 +63,24 @@ import Servant.Common.Req
client :: HasClient layout => Proxy layout -> Client layout
client p = clientWithRoute p defReq
newtype InjectArg arg = InjectArg { getInjectedArg :: arg }
class HasArgument s arg result | s arg -> result, s result -> arg where
supplyArgument :: arg -> s -> result
instance (HasArgument left arg left1, HasArgument right arg right1) => HasArgument (left :<|> right) arg (left1 :<|> right1) where
supplyArgument arg (left :<|> right) = supplyArgument arg left :<|> supplyArgument arg right
instance (HasArgument rest arg rest') => HasArgument (a -> rest) arg (a -> rest') where
supplyArgument arg f = \a -> supplyArgument arg (f a)
instance HasArgument (arg -> rest) (InjectArg arg) rest where
supplyArgument (InjectArg arg) f = f arg
staticClient :: (HasClient layout, HasArgument (Client layout) (InjectArg BaseUrl) result) => Proxy layout -> BaseUrl -> result
staticClient p baseUrl = supplyArgument (InjectArg baseUrl) $ client p
-- | This class lets us define how each API combinator
-- influences the creation of an HTTP request. It's mostly
-- an internal class, you can just use 'client'.

View file

@ -296,6 +296,11 @@ sucessSpec = beforeAll (startWaiApp server) $ afterAll endWaiApp $ do
return $
result === Right (cap, num, flag, body)
describe "staticClient" $ do
it "allows to pass in the BaseUrl to staticClient" $ \(_, baseUrl) -> do
let getGet' :: C.Manager -> ClientM Person
getGet' :<|> _ = staticClient api baseUrl
(left show <$> runExceptT (getGet' manager)) `shouldReturn` Right alice
wrappedApiSpec :: Spec
wrappedApiSpec = describe "error status codes" $ do