| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Network.Mattermost.Exceptions
Documentation
data LoginFailureException Source #
Constructors
| LoginFailureException String |
Instances
| Show LoginFailureException Source # | |
Defined in Network.Mattermost.Exceptions Methods showsPrec :: Int -> LoginFailureException -> ShowS # show :: LoginFailureException -> String # showList :: [LoginFailureException] -> ShowS # | |
| Exception LoginFailureException Source # | |
Defined in Network.Mattermost.Exceptions | |
data URIParseException Source #
Constructors
| URIParseException String |
Instances
| Show URIParseException Source # | |
Defined in Network.Mattermost.Exceptions Methods showsPrec :: Int -> URIParseException -> ShowS # show :: URIParseException -> String # showList :: [URIParseException] -> ShowS # | |
| Exception URIParseException Source # | |
Defined in Network.Mattermost.Exceptions Methods toException :: URIParseException -> SomeException # | |
data ContentTypeException Source #
Constructors
| ContentTypeException String |
Instances
| Show ContentTypeException Source # | |
Defined in Network.Mattermost.Exceptions Methods showsPrec :: Int -> ContentTypeException -> ShowS # show :: ContentTypeException -> String # showList :: [ContentTypeException] -> ShowS # | |
| Exception ContentTypeException Source # | |
Defined in Network.Mattermost.Exceptions Methods toException :: ContentTypeException -> SomeException # fromException :: SomeException -> Maybe ContentTypeException # | |
data JSONDecodeException Source #
Constructors
| JSONDecodeException | |
Fields | |
Instances
| Show JSONDecodeException Source # | |
Defined in Network.Mattermost.Exceptions Methods showsPrec :: Int -> JSONDecodeException -> ShowS # show :: JSONDecodeException -> String # showList :: [JSONDecodeException] -> ShowS # | |
| Exception JSONDecodeException Source # | |
Defined in Network.Mattermost.Exceptions Methods toException :: JSONDecodeException -> SomeException # fromException :: SomeException -> Maybe JSONDecodeException # | |
data HeaderNotFoundException Source #
Constructors
| HeaderNotFoundException String |
Instances
| Show HeaderNotFoundException Source # | |
Defined in Network.Mattermost.Exceptions Methods showsPrec :: Int -> HeaderNotFoundException -> ShowS # show :: HeaderNotFoundException -> String # showList :: [HeaderNotFoundException] -> ShowS # | |
| Exception HeaderNotFoundException Source # | |
Defined in Network.Mattermost.Exceptions | |
data HTTPResponseException Source #
Constructors
| HTTPResponseException String |
Instances
| Show HTTPResponseException Source # | |
Defined in Network.Mattermost.Exceptions Methods showsPrec :: Int -> HTTPResponseException -> ShowS # show :: HTTPResponseException -> String # showList :: [HTTPResponseException] -> ShowS # | |
| Exception HTTPResponseException Source # | |
Defined in Network.Mattermost.Exceptions | |
data MattermostError Source #
Constructors
| MattermostError | |
Instances
| Show MattermostError Source # | |
Defined in Network.Mattermost.Exceptions Methods showsPrec :: Int -> MattermostError -> ShowS # show :: MattermostError -> String # showList :: [MattermostError] -> ShowS # | |
| FromJSON MattermostError Source # | |
Defined in Network.Mattermost.Exceptions Methods parseJSON :: Value -> Parser MattermostError # parseJSONList :: Value -> Parser [MattermostError] # | |
| Exception MattermostError Source # | |
Defined in Network.Mattermost.Exceptions Methods toException :: MattermostError -> SomeException # | |
data ConnectionException Source #
Constructors
| ConnectionException ConnError |
Instances
| Show ConnectionException Source # | |
Defined in Network.Mattermost.Exceptions Methods showsPrec :: Int -> ConnectionException -> ShowS # show :: ConnectionException -> String # showList :: [ConnectionException] -> ShowS # | |
| Exception ConnectionException Source # | |
Defined in Network.Mattermost.Exceptions Methods toException :: ConnectionException -> SomeException # fromException :: SomeException -> Maybe ConnectionException # | |
data MattermostServerError Source #
Constructors
| MattermostServerError Text |
Instances
| Show MattermostServerError Source # | |
Defined in Network.Mattermost.Exceptions Methods showsPrec :: Int -> MattermostServerError -> ShowS # show :: MattermostServerError -> String # showList :: [MattermostServerError] -> ShowS # | |
| Exception MattermostServerError Source # | |
Defined in Network.Mattermost.Exceptions | |