wai-middleware-rollbar-0.2.0: Middleware that communicates to Rollbar.

Copyright(c) Hardy Jones 2017
LicenseBSD3
Maintainerjones3.hardy@gmail.com
Stabilityexperimental
Safe HaskellNone
LanguageHaskell2010

Rollbar.Item.Request

Description

 

Synopsis

Documentation

data Request Source #

Data sent to the server

Constructors

Request 

Fields

Instances

Eq Request Source # 

Methods

(==) :: Request -> Request -> Bool #

(/=) :: Request -> Request -> Bool #

Show Request Source # 
Generic Request Source # 

Associated Types

type Rep Request :: * -> * #

Methods

from :: Request -> Rep Request x #

to :: Rep Request x -> Request #

ToJSON Request Source # 
type Rep Request Source # 

newtype Get Source #

The query string parameters as a more useful data structure.

Constructors

Get Query 

Instances

Eq Get Source # 

Methods

(==) :: Get -> Get -> Bool #

(/=) :: Get -> Get -> Bool #

Show Get Source # 

Methods

showsPrec :: Int -> Get -> ShowS #

show :: Get -> String #

showList :: [Get] -> ShowS #

Generic Get Source # 

Associated Types

type Rep Get :: * -> * #

Methods

from :: Get -> Rep Get x #

to :: Rep Get x -> Get #

ToJSON Get Source # 
type Rep Get Source # 
type Rep Get = D1 (MetaData "Get" "Rollbar.Item.Request" "wai-middleware-rollbar-0.2.0-61meK0xlEWiLnzauG1wcJA" True) (C1 (MetaCons "Get" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Query)))

newtype Headers Source #

The request headers

Constructors

Headers RequestHeaders 

Instances

Eq Headers Source # 

Methods

(==) :: Headers -> Headers -> Bool #

(/=) :: Headers -> Headers -> Bool #

Show Headers Source # 
Generic Headers Source # 

Associated Types

type Rep Headers :: * -> * #

Methods

from :: Headers -> Rep Headers x #

to :: Rep Headers x -> Headers #

ToJSON Headers Source # 
type Rep Headers Source # 
type Rep Headers = D1 (MetaData "Headers" "Rollbar.Item.Request" "wai-middleware-rollbar-0.2.0-61meK0xlEWiLnzauG1wcJA" True) (C1 (MetaCons "Headers" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 RequestHeaders)))

newtype IP Source #

The IP address of the client.

Constructors

IP SockAddr 

Instances

Eq IP Source # 

Methods

(==) :: IP -> IP -> Bool #

(/=) :: IP -> IP -> Bool #

Show IP Source # 

Methods

showsPrec :: Int -> IP -> ShowS #

show :: IP -> String #

showList :: [IP] -> ShowS #

Generic IP Source # 

Associated Types

type Rep IP :: * -> * #

Methods

from :: IP -> Rep IP x #

to :: Rep IP x -> IP #

ToJSON IP Source # 
type Rep IP Source # 
type Rep IP = D1 (MetaData "IP" "Rollbar.Item.Request" "wai-middleware-rollbar-0.2.0-61meK0xlEWiLnzauG1wcJA" True) (C1 (MetaCons "IP" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SockAddr)))

newtype Method Source #

The HTTP Verb

Constructors

Method ByteString 

Instances

Eq Method Source # 

Methods

(==) :: Method -> Method -> Bool #

(/=) :: Method -> Method -> Bool #

Show Method Source # 
Generic Method Source # 

Associated Types

type Rep Method :: * -> * #

Methods

from :: Method -> Rep Method x #

to :: Rep Method x -> Method #

ToJSON Method Source # 
type Rep Method Source # 
type Rep Method = D1 (MetaData "Method" "Rollbar.Item.Request" "wai-middleware-rollbar-0.2.0-61meK0xlEWiLnzauG1wcJA" True) (C1 (MetaCons "Method" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString)))

newtype QueryString Source #

The raw querystring.

Constructors

QueryString ByteString 

newtype RawBody Source #

The raw request body as a ByteString.

Constructors

RawBody ByteString 

Instances

Eq RawBody Source # 

Methods

(==) :: RawBody -> RawBody -> Bool #

(/=) :: RawBody -> RawBody -> Bool #

Show RawBody Source # 
IsString RawBody Source # 

Methods

fromString :: String -> RawBody #

Generic RawBody Source # 

Associated Types

type Rep RawBody :: * -> * #

Methods

from :: RawBody -> Rep RawBody x #

to :: Rep RawBody x -> RawBody #

ToJSON RawBody Source # 
type Rep RawBody Source # 
type Rep RawBody = D1 (MetaData "RawBody" "Rollbar.Item.Request" "wai-middleware-rollbar-0.2.0-61meK0xlEWiLnzauG1wcJA" True) (C1 (MetaCons "RawBody" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 ByteString)))

newtype URL Source #

The URL as a slightly more useful structure.

Constructors

URL (Maybe ByteString, [Text]) 

Instances

Eq URL Source # 

Methods

(==) :: URL -> URL -> Bool #

(/=) :: URL -> URL -> Bool #

Show URL Source # 

Methods

showsPrec :: Int -> URL -> ShowS #

show :: URL -> String #

showList :: [URL] -> ShowS #

Generic URL Source # 

Associated Types

type Rep URL :: * -> * #

Methods

from :: URL -> Rep URL x #

to :: Rep URL x -> URL #

ToJSON URL Source # 
type Rep URL Source # 
type Rep URL = D1 (MetaData "URL" "Rollbar.Item.Request" "wai-middleware-rollbar-0.2.0-61meK0xlEWiLnzauG1wcJA" True) (C1 (MetaCons "URL" PrefixI False) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe ByteString, [Text]))))