checkmate-0.4.0: Generate checklists relevant to a given patch

Safe HaskellNone
LanguageHaskell2010

Checkmate.Publisher.GitHub

Synopsis

Documentation

data Error #

Errors have been tagged according to their source, so you can more easily dispatch and handle them.

Constructors

HTTPError !HttpException

A HTTP error occurred. The actual caught error is included.

ParseError !Text

An error in the parser itself.

JsonError !Text

The JSON is malformed or unexpected.

UserError !Text

Incorrect input.

Instances
Show Error 
Instance details

Defined in GitHub.Data.Definitions

Methods

showsPrec :: Int -> Error -> ShowS #

show :: Error -> String #

showList :: [Error] -> ShowS #

Exception Error 
Instance details

Defined in GitHub.Data.Definitions

newtype URL #

Data representing URLs in responses.

N.B. syntactical validity is not verified.

Constructors

URL Text 
Instances
Eq URL 
Instance details

Defined in GitHub.Data.URL

Methods

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

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

Data URL 
Instance details

Defined in GitHub.Data.URL

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> URL -> c URL #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c URL #

toConstr :: URL -> Constr #

dataTypeOf :: URL -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c URL) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c URL) #

gmapT :: (forall b. Data b => b -> b) -> URL -> URL #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> URL -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> URL -> r #

gmapQ :: (forall d. Data d => d -> u) -> URL -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> URL -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> URL -> m URL #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> URL -> m URL #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> URL -> m URL #

Ord URL 
Instance details

Defined in GitHub.Data.URL

Methods

compare :: URL -> URL -> Ordering #

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

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

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

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

max :: URL -> URL -> URL #

min :: URL -> URL -> URL #

Show URL 
Instance details

Defined in GitHub.Data.URL

Methods

showsPrec :: Int -> URL -> ShowS #

show :: URL -> String #

showList :: [URL] -> ShowS #

Generic URL 
Instance details

Defined in GitHub.Data.URL

Associated Types

type Rep URL :: * -> * #

Methods

from :: URL -> Rep URL x #

to :: Rep URL x -> URL #

ToJSON URL 
Instance details

Defined in GitHub.Data.URL

FromJSON URL 
Instance details

Defined in GitHub.Data.URL

Binary URL 
Instance details

Defined in GitHub.Data.URL

Methods

put :: URL -> Put #

get :: Get URL #

putList :: [URL] -> Put #

NFData URL 
Instance details

Defined in GitHub.Data.URL

Methods

rnf :: URL -> () #

type Rep URL 
Instance details

Defined in GitHub.Data.URL

type Rep URL = D1 (MetaData "URL" "GitHub.Data.URL" "github-0.19-GNcGYqsaYt4BqIyQ6QO61H" True) (C1 (MetaCons "URL" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)))