http-conduit-2.3.8.1: HTTP client package with conduit interface and HTTPS support.
Safe HaskellSafe-Inferred
LanguageHaskell2010

Network.HTTP.Simple

Description

Simplified interface for common HTTP client interactions. Tutorial available at https://haskell-lang.org/library/http-client

Important note: Request is an instance of IsString, and therefore recommended usage is to turn on OverloadedStrings, e.g.

{-# LANGUAGE OverloadedStrings #-}
import Network.HTTP.Simple
import qualified Data.ByteString.Char8 as B8

main :: IO ()
main = httpBS "http://example.com" >>= B8.putStrLn . getResponseBody

The IsString instance uses parseRequest behind the scenes and inherits its behavior.

Synopsis

Perform requests

httpBS :: MonadIO m => Request -> m (Response ByteString) Source #

Perform an HTTP request and return the body as a ByteString.

Since: 2.2.4

httpLBS :: MonadIO m => Request -> m (Response ByteString) Source #

Perform an HTTP request and return the body as a lazy ByteString. Note that the entire value will be read into memory at once (no lazy I/O will be performed). The advantage of a lazy ByteString here (versus using httpBS) is--if needed--a better in-memory representation.

Since: 2.1.10

httpNoBody :: MonadIO m => Request -> m (Response ()) Source #

Perform an HTTP request and ignore the response body.

Since: 2.2.2

httpJSON :: (MonadIO m, FromJSON a) => Request -> m (Response a) Source #

Perform an HTTP request and parse the body as JSON. In the event of an JSON parse errors, a JSONException runtime exception will be thrown.

NOTE: Depends on the aeson cabal flag being enabled

Since: 2.1.10

httpJSONEither :: (MonadIO m, FromJSON a) => Request -> m (Response (Either JSONException a)) Source #

Perform an HTTP request and parse the body as JSON. In the event of an JSON parse errors, a Left value will be returned.

NOTE: Depends on the aeson cabal flag being enabled

Since: 2.1.10

httpSink :: MonadUnliftIO m => Request -> (Response () -> ConduitM ByteString Void m a) -> m a Source #

Perform an HTTP request and consume the body with the given Sink

Since: 2.1.10

httpSource :: (MonadResource m, MonadIO n) => Request -> (Response (ConduitM i ByteString n ()) -> ConduitM i o m r) -> ConduitM i o m r Source #

Perform an HTTP request, and get the response body as a Source.

The second argument to this function tells us how to make the Source from the Response itself. This allows you to perform actions with the status or headers, for example, in addition to the raw bytes themselves. If you just care about the response body, you can use getResponseBody as the second argument here.

{-# LANGUAGE OverloadedStrings #-}
import           Control.Monad.IO.Class       (liftIO)
import           Control.Monad.Trans.Resource (runResourceT)
import           Data.Conduit                 (($$))
import qualified Data.Conduit.Binary          as CB
import qualified Data.Conduit.List            as CL
import           Network.HTTP.Simple
import           System.IO                    (stdout)

main :: IO ()
main =
    runResourceT
        $ httpSource "http://httpbin.org/robots.txt" getSrc
       $$ CB.sinkHandle stdout
  where
    getSrc res = do
        liftIO $ print (getResponseStatus res, getResponseHeaders res)
        getResponseBody res

Since: 2.2.1

withResponse :: (MonadUnliftIO m, MonadIO n) => Request -> (Response (ConduitM i ByteString n ()) -> m a) -> m a Source #

Perform an action with the given request. This employes the bracket pattern.

This is similar to httpSource, but does not require MonadResource and allows the result to not contain a ConduitM value.

Since: 2.2.3

Types

type Header = (HeaderName, ByteString) #

type Query = [QueryItem] #

data Request #

Instances

Instances details
Show Request 
Instance details

Defined in Network.HTTP.Client.Types

data Response body #

Instances

Instances details
Foldable Response 
Instance details

Defined in Network.HTTP.Client.Types

Methods

fold :: Monoid m => Response m -> m Source #

foldMap :: Monoid m => (a -> m) -> Response a -> m Source #

foldMap' :: Monoid m => (a -> m) -> Response a -> m Source #

foldr :: (a -> b -> b) -> b -> Response a -> b Source #

foldr' :: (a -> b -> b) -> b -> Response a -> b Source #

foldl :: (b -> a -> b) -> b -> Response a -> b Source #

foldl' :: (b -> a -> b) -> b -> Response a -> b Source #

foldr1 :: (a -> a -> a) -> Response a -> a Source #

foldl1 :: (a -> a -> a) -> Response a -> a Source #

toList :: Response a -> [a] Source #

null :: Response a -> Bool Source #

length :: Response a -> Int Source #

elem :: Eq a => a -> Response a -> Bool Source #

maximum :: Ord a => Response a -> a Source #

minimum :: Ord a => Response a -> a Source #

sum :: Num a => Response a -> a Source #

product :: Num a => Response a -> a Source #

Traversable Response 
Instance details

Defined in Network.HTTP.Client.Types

Methods

traverse :: Applicative f => (a -> f b) -> Response a -> f (Response b) Source #

sequenceA :: Applicative f => Response (f a) -> f (Response a) Source #

mapM :: Monad m => (a -> m b) -> Response a -> m (Response b) Source #

sequence :: Monad m => Response (m a) -> m (Response a) Source #

Functor Response 
Instance details

Defined in Network.HTTP.Client.Types

Methods

fmap :: (a -> b) -> Response a -> Response b Source #

(<$) :: a -> Response b -> Response a Source #

Show body => Show (Response body) 
Instance details

Defined in Network.HTTP.Client.Types

Methods

showsPrec :: Int -> Response body -> ShowS Source #

show :: Response body -> String Source #

showList :: [Response body] -> ShowS Source #

data JSONException Source #

An exception that can occur when parsing JSON

NOTE: Depends on the aeson cabal flag being enabled

Since: 2.1.10

data Proxy #

Constructors

Proxy 

Instances

Instances details
Read Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Show Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Eq Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Methods

(==) :: Proxy -> Proxy -> Bool Source #

(/=) :: Proxy -> Proxy -> Bool Source #

Ord Proxy 
Instance details

Defined in Network.HTTP.Client.Types

Request constructions

parseRequestThrow :: MonadThrow m => String -> m Request Source #

Same as parseRequest, except will throw an HttpException in the event of a non-2XX response. This uses throwErrorStatusCodes to implement checkResponse.

Exactly the same as parseUrlThrow, but has a name that is more consistent with the other parseRequest functions.

Since: 2.3.2

parseRequestThrow_ :: String -> Request Source #

Same as parseRequestThrow, but parse errors cause an impure exception. Mostly useful for static strings which are known to be correctly formatted.

Since: 2.3.2

Request lenses

Basics

setRequestMethod :: ByteString -> Request -> Request Source #

Set the request method

Since: 2.1.10

setRequestSecure :: Bool -> Request -> Request Source #

Set whether this is a secureHTTPS (True) or insecureHTTP (False) request

Since: 2.1.10

setRequestHost :: ByteString -> Request -> Request Source #

Set the destination host of the request

Since: 2.1.10

setRequestPort :: Int -> Request -> Request Source #

Set the destination port of the request

Since: 2.1.10

setRequestPath :: ByteString -> Request -> Request Source #

Lens for the requested path info of the request

Since: 2.1.10

addRequestHeader :: HeaderName -> ByteString -> Request -> Request Source #

Add a request header name/value combination

Since: 2.1.10

getRequestHeader :: HeaderName -> Request -> [ByteString] Source #

Get all request header values for the given name

Since: 2.1.10

setRequestHeader :: HeaderName -> [ByteString] -> Request -> Request Source #

Set the given request header to the given list of values. Removes any previously set header values with the same name.

Since: 2.1.10

setRequestHeaders :: RequestHeaders -> Request -> Request Source #

Set the request headers, wiping out all previously set headers. This means if you use setRequestHeaders to set some headers and also use one of the other setters that modifies the content-type header (such as setRequestBodyJSON), be sure that setRequestHeaders is evaluated first.

Since: 2.1.10

setRequestQueryString :: Query -> Request -> Request Source #

Set the query string parameters

Since: 2.1.10

getRequestQueryString :: Request -> Query Source #

Get the query string parameters

Since: 2.1.10

addToRequestQueryString :: Query -> Request -> Request Source #

Add to the existing query string parameters.

Since: 2.3.5

Request body

setRequestBody :: RequestBody -> Request -> Request Source #

Set the request body to the given RequestBody. You may want to consider using one of the convenience functions in the modules, e.g. requestBodyJSON.

Note: This will not modify the request method. For that, please use requestMethod. You likely don't want the default of GET.

Since: 2.1.10

setRequestBodyJSON :: ToJSON a => a -> Request -> Request Source #

Set the request body as a JSON value

Note: This will not modify the request method. For that, please use requestMethod. You likely don't want the default of GET.

This also sets the Content-Type to application/json; charset=utf-8

NOTE: Depends on the aeson cabal flag being enabled

Since: 2.1.10

setRequestBodyLBS :: ByteString -> Request -> Request Source #

Set the request body as a lazy ByteString

Note: This will not modify the request method. For that, please use requestMethod. You likely don't want the default of GET.

Since: 2.1.10

setRequestBodySource Source #

Arguments

:: Int64

length of source

-> ConduitM () ByteString IO () 
-> Request 
-> Request 

Set the request body as a Source

Note: This will not modify the request method. For that, please use requestMethod. You likely don't want the default of GET.

Since: 2.1.10

setRequestBodyFile :: FilePath -> Request -> Request Source #

Set the request body as a file

Note: This will not modify the request method. For that, please use requestMethod. You likely don't want the default of GET.

Since: 2.1.10

setRequestBodyURLEncoded :: [(ByteString, ByteString)] -> Request -> Request Source #

Set the request body as URL encoded data

Note: This will change the request method to POST and set the content-type to application/x-www-form-urlencoded

Since: 2.1.10

Special fields

setRequestBasicAuth Source #

Arguments

:: ByteString

username

-> ByteString

password

-> Request 
-> Request 

Set basic auth with the given username and password

Since: 2.1.10

setRequestBearerAuth Source #

Arguments

:: ByteString

token

-> Request 
-> Request 

Set bearer auth with the given token

Since: 2.3.8

setRequestManager :: Manager -> Request -> Request Source #

Instead of using the default global Manager, use the supplied Manager.

Since: 2.1.10

setRequestProxy :: Maybe Proxy -> Request -> Request Source #

Override the default proxy server settings

Since: 2.1.10

setRequestResponseTimeout :: ResponseTimeout -> Request -> Request Source #

Set the maximum time to wait for a response

Since: 2.3.8

Response lenses

getResponseStatus :: Response a -> Status Source #

Get the status of the response

Since: 2.1.10

getResponseStatusCode :: Response a -> Int Source #

Get the integral status code of the response

Since: 2.1.10

getResponseHeader :: HeaderName -> Response a -> [ByteString] Source #

Get all response header values with the given name

Since: 2.1.10

getResponseHeaders :: Response a -> [(HeaderName, ByteString)] Source #

Get all response headers

Since: 2.1.10

getResponseBody :: Response a -> a Source #

Get the response body

Since: 2.1.10

Alternate spellings

httpLbs :: MonadIO m => Request -> m (Response ByteString) Source #

Alternate spelling of httpLBS

Since: 2.1.10