Safe Haskell | None |
---|---|
Language | Haskell2010 |
Aws.Ses.Core
Synopsis
- data SesError = SesError {}
- data SesMetadata = SesMetadata {}
- data SesConfiguration qt = SesConfiguration {}
- sesEuWest1 :: ByteString
- sesUsEast :: ByteString
- sesUsEast1 :: ByteString
- sesUsWest2 :: ByteString
- sesHttpsGet :: ByteString -> SesConfiguration qt
- sesHttpsPost :: ByteString -> SesConfiguration NormalQuery
- sesSignQuery :: [(ByteString, ByteString)] -> SesConfiguration qt -> SignatureData -> SignedQuery
- sesResponseConsumer :: (Cursor -> Response SesMetadata a) -> IORef SesMetadata -> HTTPResponseConsumer a
- data RawMessage = RawMessage {}
- data Destination = Destination {}
- type EmailAddress = Text
- data Sender = Sender {}
- sesAsQuery :: SesAsQuery a => a -> [(ByteString, ByteString)]
Documentation
Constructors
SesError | |
Fields
|
Instances
Show SesError Source # | |
Exception SesError Source # | |
Defined in Aws.Ses.Core Methods toException :: SesError -> SomeException # fromException :: SomeException -> Maybe SesError # displayException :: SesError -> String # |
data SesMetadata Source #
Constructors
SesMetadata | |
Instances
Show SesMetadata Source # | |
Defined in Aws.Ses.Core Methods showsPrec :: Int -> SesMetadata -> ShowS # show :: SesMetadata -> String # showList :: [SesMetadata] -> ShowS # | |
Semigroup SesMetadata Source # | |
Defined in Aws.Ses.Core Methods (<>) :: SesMetadata -> SesMetadata -> SesMetadata # sconcat :: NonEmpty SesMetadata -> SesMetadata # stimes :: Integral b => b -> SesMetadata -> SesMetadata # | |
Monoid SesMetadata Source # | |
Defined in Aws.Ses.Core Methods mempty :: SesMetadata # mappend :: SesMetadata -> SesMetadata -> SesMetadata # mconcat :: [SesMetadata] -> SesMetadata # | |
Loggable SesMetadata Source # | |
Defined in Aws.Ses.Core Methods toLogText :: SesMetadata -> Text Source # |
data SesConfiguration qt Source #
Constructors
SesConfiguration | |
Fields |
Instances
Show (SesConfiguration qt) Source # | |
Defined in Aws.Ses.Core Methods showsPrec :: Int -> SesConfiguration qt -> ShowS # show :: SesConfiguration qt -> String # showList :: [SesConfiguration qt] -> ShowS # | |
DefaultServiceConfiguration (SesConfiguration UriOnlyQuery) Source # | |
Defined in Aws.Ses.Core | |
DefaultServiceConfiguration (SesConfiguration NormalQuery) Source # | |
Defined in Aws.Ses.Core |
sesHttpsGet :: ByteString -> SesConfiguration qt Source #
sesSignQuery :: [(ByteString, ByteString)] -> SesConfiguration qt -> SignatureData -> SignedQuery Source #
sesResponseConsumer :: (Cursor -> Response SesMetadata a) -> IORef SesMetadata -> HTTPResponseConsumer a Source #
data RawMessage Source #
A raw e-mail.
Constructors
RawMessage | |
Fields |
Instances
Eq RawMessage Source # | |
Defined in Aws.Ses.Core | |
Ord RawMessage Source # | |
Defined in Aws.Ses.Core Methods compare :: RawMessage -> RawMessage -> Ordering # (<) :: RawMessage -> RawMessage -> Bool # (<=) :: RawMessage -> RawMessage -> Bool # (>) :: RawMessage -> RawMessage -> Bool # (>=) :: RawMessage -> RawMessage -> Bool # max :: RawMessage -> RawMessage -> RawMessage # min :: RawMessage -> RawMessage -> RawMessage # | |
Show RawMessage Source # | |
Defined in Aws.Ses.Core Methods showsPrec :: Int -> RawMessage -> ShowS # show :: RawMessage -> String # showList :: [RawMessage] -> ShowS # |
data Destination Source #
The destinations of an e-mail.
Constructors
Destination | |
Fields |
Instances
Eq Destination Source # | |
Defined in Aws.Ses.Core | |
Ord Destination Source # | |
Defined in Aws.Ses.Core Methods compare :: Destination -> Destination -> Ordering # (<) :: Destination -> Destination -> Bool # (<=) :: Destination -> Destination -> Bool # (>) :: Destination -> Destination -> Bool # (>=) :: Destination -> Destination -> Bool # max :: Destination -> Destination -> Destination # min :: Destination -> Destination -> Destination # | |
Show Destination Source # | |
Defined in Aws.Ses.Core Methods showsPrec :: Int -> Destination -> ShowS # show :: Destination -> String # showList :: [Destination] -> ShowS # | |
Semigroup Destination Source # | |
Defined in Aws.Ses.Core Methods (<>) :: Destination -> Destination -> Destination # sconcat :: NonEmpty Destination -> Destination # stimes :: Integral b => b -> Destination -> Destination # | |
Monoid Destination Source # | |
Defined in Aws.Ses.Core Methods mempty :: Destination # mappend :: Destination -> Destination -> Destination # mconcat :: [Destination] -> Destination # |
type EmailAddress = Text Source #
An e-mail address.
The sender's e-mail address.
Constructors
Sender | |
Fields |
sesAsQuery :: SesAsQuery a => a -> [(ByteString, ByteString)] Source #
Write a data type as a list of query parameters.