Safe Haskell | None |
---|---|
Language | Haskell2010 |
Documentation
Instances
Show SdbError Source # | |
Exception SdbError Source # | |
Defined in Aws.SimpleDb.Core toException :: SdbError -> SomeException # fromException :: SomeException -> Maybe SdbError # displayException :: SdbError -> String # |
data SdbMetadata Source #
Instances
Show SdbMetadata Source # | |
Defined in Aws.SimpleDb.Core showsPrec :: Int -> SdbMetadata -> ShowS # show :: SdbMetadata -> String # showList :: [SdbMetadata] -> ShowS # | |
Semigroup SdbMetadata Source # | |
Defined in Aws.SimpleDb.Core (<>) :: SdbMetadata -> SdbMetadata -> SdbMetadata # sconcat :: NonEmpty SdbMetadata -> SdbMetadata # stimes :: Integral b => b -> SdbMetadata -> SdbMetadata # | |
Monoid SdbMetadata Source # | |
Defined in Aws.SimpleDb.Core mempty :: SdbMetadata # mappend :: SdbMetadata -> SdbMetadata -> SdbMetadata # mconcat :: [SdbMetadata] -> SdbMetadata # | |
Loggable SdbMetadata Source # | |
Defined in Aws.SimpleDb.Core toLogText :: SdbMetadata -> Text Source # |
data SdbConfiguration qt Source #
SdbConfiguration | |
|
Instances
Show (SdbConfiguration qt) Source # | |
Defined in Aws.SimpleDb.Core showsPrec :: Int -> SdbConfiguration qt -> ShowS # show :: SdbConfiguration qt -> String # showList :: [SdbConfiguration qt] -> ShowS # | |
DefaultServiceConfiguration (SdbConfiguration UriOnlyQuery) Source # | |
DefaultServiceConfiguration (SdbConfiguration NormalQuery) Source # | |
sdbHttpGet :: ByteString -> SdbConfiguration qt Source #
sdbHttpsGet :: ByteString -> SdbConfiguration qt Source #
sdbSignQuery :: [(ByteString, ByteString)] -> SdbConfiguration qt -> SignatureData -> SignedQuery Source #
sdbResponseConsumer :: (Cursor -> Response SdbMetadata a) -> IORef SdbMetadata -> HTTPResponseConsumer a Source #
class SdbFromResponse a where Source #
sdbFromResponse :: Cursor -> Response SdbMetadata a Source #
sdbCheckResponseType :: MonadThrow m => a -> Text -> Cursor -> m a Source #
decodeBase64 :: MonadThrow m => Cursor -> m Text Source #
ForAttribute | |
|
Instances
ListResponse SelectResponse (Item [Attribute Text]) Source # | |
Defined in Aws.SimpleDb.Commands.Select listResponse :: SelectResponse -> [Item [Attribute Text]] Source # | |
Show a => Show (Attribute a) Source # | |
readAttribute :: MonadThrow m => Cursor -> m (Attribute Text) Source #
data SetAttribute Source #
Instances
Show SetAttribute Source # | |
Defined in Aws.SimpleDb.Core showsPrec :: Int -> SetAttribute -> ShowS # show :: SetAttribute -> String # showList :: [SetAttribute] -> ShowS # |
attributeQuery :: (a -> [(ByteString, ByteString)]) -> Attribute a -> [(ByteString, ByteString)] Source #
addAttribute :: Text -> Text -> Attribute SetAttribute Source #
replaceAttribute :: Text -> Text -> Attribute SetAttribute Source #
setAttributeQuery :: SetAttribute -> [(ByteString, ByteString)] Source #
data DeleteAttribute Source #
Instances
Show DeleteAttribute Source # | |
Defined in Aws.SimpleDb.Core showsPrec :: Int -> DeleteAttribute -> ShowS # show :: DeleteAttribute -> String # showList :: [DeleteAttribute] -> ShowS # |
deleteAttributeQuery :: DeleteAttribute -> [(ByteString, ByteString)] Source #
data ExpectedAttribute Source #
Instances
Show ExpectedAttribute Source # | |
Defined in Aws.SimpleDb.Core showsPrec :: Int -> ExpectedAttribute -> ShowS # show :: ExpectedAttribute -> String # showList :: [ExpectedAttribute] -> ShowS # |
expectedValue :: Text -> Text -> Attribute ExpectedAttribute Source #
expectedExists :: Text -> Bool -> Attribute ExpectedAttribute Source #
Instances
ListResponse SelectResponse (Item [Attribute Text]) Source # | |
Defined in Aws.SimpleDb.Commands.Select listResponse :: SelectResponse -> [Item [Attribute Text]] Source # | |
Show a => Show (Item a) Source # | |
itemQuery :: (a -> [(ByteString, ByteString)]) -> Item a -> [(ByteString, ByteString)] Source #