Safe Haskell | None |
---|---|
Language | Haskell2010 |
Documentation
data UnparsableResponse Source #
UnparsableResponse Value |
Instances
Show UnparsableResponse Source # | |
Defined in Network.Mail.Mailgun.API showsPrec :: Int -> UnparsableResponse -> ShowS # show :: UnparsableResponse -> String # showList :: [UnparsableResponse] -> ShowS # | |
Exception UnparsableResponse Source # | |
Defined in Network.Mail.Mailgun.API |
_UnparsableResponse :: Iso' UnparsableResponse Value Source #
data MailgunApiError Source #
Instances
Show MailgunApiError Source # | |
Defined in Network.Mail.Mailgun.API showsPrec :: Int -> MailgunApiError -> ShowS # show :: MailgunApiError -> String # showList :: [MailgunApiError] -> ShowS # | |
Exception MailgunApiError Source # | |
Defined in Network.Mail.Mailgun.API |
_UnknownResponseError :: Prism' MailgunApiError Int Source #
_MailgunNotFound :: Prism' MailgunApiError () Source #
_MailgunSideError :: Prism' MailgunApiError () Source #
_RequestTooLarge :: Prism' MailgunApiError () Source #
MGGet | |
| |
MGDelete | |
| |
Postable b => MGPost | |
|
wreqOptions :: MailgunConfig -> Options Source #
call :: forall c m r. (HasMailgunConfig c, MonadIO m, MonadThrow m, MonadReader c m) => MGRequest -> (Value -> Maybe r) -> m r Source #
:: (HasMailgunConfig c, MonadIO m, MonadThrow m, MonadReader c m) | |
=> s | The initial start parameter (like |
-> (s -> (t, MGRequest)) | |
-> (t -> Value -> Maybe (Maybe s, [r])) | |
-> SourceT m r |
paginatedStream :: forall c m r. (HasMailgunConfig c, MonadIO m, MonadThrow m, MonadReader c m) => MGRequest -> (Value -> Maybe [r]) -> SourceT m r Source #