Documentation

This commit is contained in:
Julian K. Arni 2017-09-13 11:05:48 -04:00
parent ffbfa42a14
commit 6be78e0b38
5 changed files with 61 additions and 30 deletions

View file

@ -1,4 +1,3 @@
{-# LANGUAGE AllowAmbiguousTypes #-}
{-# LANGUAGE CPP #-} {-# LANGUAGE CPP #-}
{-# LANGUAGE DataKinds #-} {-# LANGUAGE DataKinds #-}
{-# LANGUAGE FlexibleContexts #-} {-# LANGUAGE FlexibleContexts #-}
@ -17,23 +16,34 @@
-- querying functions for each endpoint just from the type representing your -- querying functions for each endpoint just from the type representing your
-- API. -- API.
module Servant.Client.Core module Servant.Client.Core
( AuthClientData (
, AuthenticateReq(..) -- * Client generation
, clientIn clientIn
, HasClient(..) , HasClient(..)
-- * Authentication
, mkAuthenticateReq , mkAuthenticateReq
, ServantError(..) , AuthenticateReq(..)
, EmptyClient(..) , AuthClientData
, RunClient(..)
, Request(..) -- * Generic Client
, defaultRequest
, Response(..)
, RequestBody(..)
, module Servant.Client.Core.Internal.BaseUrl
, ClientLike(..) , ClientLike(..)
, genericMkClientL , genericMkClientL
, genericMkClientP , genericMkClientP
-- * Writing instances , ServantError(..)
, EmptyClient(..)
-- * Request
, Request(..)
, defaultRequest
, RequestBody(..)
-- * Response
, Response(..)
, RunClient(..)
, module Servant.Client.Core.Internal.BaseUrl
-- * Writing HasClient instances
, addHeader , addHeader
, appendToQueryString , appendToQueryString
, appendToPath , appendToPath
@ -84,13 +94,13 @@ import Servant.Client.Core.Internal.BaseUrl (BaseUrl (..),
showBaseUrl) showBaseUrl)
import Servant.Client.Core.Internal.BasicAuth import Servant.Client.Core.Internal.BasicAuth
import Servant.Client.Core.Internal.Class import Servant.Client.Core.Internal.Class
import Servant.Client.Core.Internal.Request
import Servant.Client.Core.Internal.Generic import Servant.Client.Core.Internal.Generic
import Servant.Client.Core.Internal.Request
-- * Accessing APIs as a Client -- * Accessing APIs as a Client
-- | 'client' allows you to produce operations to query an API from a client within -- | 'clientIn' allows you to produce operations to query an API from a client
-- a given monadic context `m` -- within a 'RunClient' monad.
-- --
-- > type MyApi = "books" :> Get '[JSON] [Book] -- GET /books -- > type MyApi = "books" :> Get '[JSON] [Book] -- GET /books
-- > :<|> "books" :> ReqBody '[JSON] Book :> Post '[JSON] Book -- POST /books -- > :<|> "books" :> ReqBody '[JSON] Book :> Post '[JSON] Book -- POST /books
@ -108,9 +118,12 @@ clientIn :: HasClient m api => Proxy api -> Proxy m -> Client m api
clientIn p pm = clientWithRoute pm p defaultRequest clientIn p pm = clientWithRoute pm p defaultRequest
-- | This class lets us define how each API combinator -- | This class lets us define how each API combinator influences the creation
-- influences the creation of an HTTP request. It's mostly -- of an HTTP request.
-- an internal class, you can just use 'client'. --
-- Unless you are writing a new backend for @servant-client-core@ or new
-- combinators that you want to support client-generation, you can ignore this
-- class.
class RunClient m => HasClient m api where class RunClient m => HasClient m api where
type Client (m :: * -> *) (api :: *) :: * type Client (m :: * -> *) (api :: *) :: *
clientWithRoute :: Proxy m -> Proxy api -> Request -> Client m api clientWithRoute :: Proxy m -> Proxy api -> Request -> Client m api

View file

@ -3,7 +3,7 @@
{-# LANGUAGE ScopedTypeVariables #-} {-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE TypeFamilies #-} {-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE OverloadedStrings #-} {-# LANGUAGE OverloadedStrings #-}
{-| Types for possible backends to run client-side `Request` queries -} -- | Types for possible backends to run client-side `Request` queries
module Servant.Client.Core.Internal.Class where module Servant.Client.Core.Internal.Class where
import Control.Monad (unless) import Control.Monad (unless)

View file

@ -28,6 +28,8 @@ import Web.HttpApiData (ToHttpApiData, toEncodedUrlPiece,
toHeader) toHeader)
-- | A type representing possible errors in a request -- | A type representing possible errors in a request
--
-- Note that this type substially change in 0.12
data ServantError = data ServantError =
-- | The server returned an error response -- | The server returned an error response
FailureResponse Response FailureResponse Response

View file

@ -1,10 +1,13 @@
-- | This module provides 'client' which can automatically generate
-- querying functions for each endpoint just from the type representing your
-- API.
module Servant.Client module Servant.Client
( ClientEnv(..) ( client
, ClientM , ClientM
, runClientM , runClientM
, client , ClientEnv(..)
, module X , module Servant.Client.Core
) where ) where
import Servant.Client.Internal.HttpClient import Servant.Client.Internal.HttpClient
import Servant.Client.Core as X import Servant.Client.Core

View file

@ -41,23 +41,36 @@ import Servant.Client.Core
import qualified Network.HTTP.Client as Client import qualified Network.HTTP.Client as Client
-- | The environment in which a request is run.
data ClientEnv data ClientEnv
= ClientEnv = ClientEnv
{ manager :: Client.Manager { manager :: Client.Manager
, baseUrl :: BaseUrl , baseUrl :: BaseUrl
} }
-- | Generates a set of client functions for an API.
--
-- Example:
--
-- > type API = Capture "no" Int :> Get '[JSON] Int
-- > :<|> Get '[JSON] [Bool]
-- >
-- > api :: Proxy API
-- > api = Proxy
-- >
-- > getInt :: Int -> ClientM Int
-- > getBools :: ClientM [Bool]
-- > getInt :<|> getBools = client api
client :: HasClient ClientM api => Proxy api -> Client ClientM api client :: HasClient ClientM api => Proxy api -> Client ClientM api
client api = api `clientIn` (Proxy :: Proxy ClientM) client api = api `clientIn` (Proxy :: Proxy ClientM)
-- | @ClientM@ is the monad in which client functions run. Contains the -- | @ClientM@ is the monad in which client functions run. Contains the
-- 'Manager' and 'BaseUrl' used for requests in the reader environment. -- 'Manager' and 'BaseUrl' used for requests in the reader environment.
newtype ClientM a = ClientM { runClientM' :: ReaderT ClientEnv (ExceptT ServantError IO) a } newtype ClientM a = ClientM
{ runClientM' :: ReaderT ClientEnv (ExceptT ServantError IO) a }
deriving ( Functor, Applicative, Monad, MonadIO, Generic deriving ( Functor, Applicative, Monad, MonadIO, Generic
, MonadReader ClientEnv , MonadReader ClientEnv, MonadError ServantError, MonadThrow
, MonadError ServantError , MonadCatch)
, MonadThrow, MonadCatch
)
instance MonadBase IO ClientM where instance MonadBase IO ClientM where
liftBase = ClientM . liftBase liftBase = ClientM . liftBase