amazonka-core-1.4.4: Core data types and functionality for Amazonka libraries.

Copyright(c) 2013-2016 Brendan Hay
LicenseMozilla Public License, v. 2.0.
MaintainerBrendan Hay <brendan.g.hay@gmail.com>
Stabilityprovisional
Portabilitynon-portable (GHC extensions)
Safe HaskellNone
LanguageHaskell2010

Network.AWS.Data.ByteString

Contents

Description

 

Synopsis

ByteString

data ByteString :: * #

A space-efficient representation of a Word8 vector, supporting many efficient operations.

A ByteString contains 8-bit bytes, or by using the operations from Data.ByteString.Char8 it can be interpreted as containing 8-bit characters.

Instances

Eq ByteString 
Data ByteString 

Methods

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

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

toConstr :: ByteString -> Constr #

dataTypeOf :: ByteString -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ByteString 
Read ByteString 
Show ByteString 
IsString ByteString 
Semigroup ByteString 
Monoid ByteString 
FoldCase ByteString

Note that foldCase on ByteStrings is only guaranteed to be correct for ISO-8859-1 encoded strings!

ByteArray ByteString 

Methods

allocRet :: Int -> (Ptr p -> IO a) -> IO (a, ByteString) #

ByteArrayAccess ByteString 

Methods

length :: ByteString -> Int #

withByteArray :: ByteString -> (Ptr p -> IO a) -> IO a #

NFData ByteString 

Methods

rnf :: ByteString -> () #

Hashable ByteString 
Ixed ByteString 
ToText ByteString Source # 
FromText ByteString Source # 

Methods

parser :: Parser ByteString Source #

Chunk ByteString 

Associated Types

type ChunkElem ByteString :: *

ToByteString ByteString Source # 
ToQuery ByteString Source # 
ToXML ByteString Source # 

Methods

toXML :: ByteString -> XML Source #

FromXML ByteString Source # 

Methods

parseXML :: [Node] -> Either String ByteString Source #

ToHeader ByteString Source # 
ToPath ByteString Source # 
ToLog ByteString Source # 
ToBody ByteString Source # 
ToHashedBody ByteString Source # 
Strict ByteString ByteString 
ToLog [Header] Source # 

Methods

build :: [Header] -> Builder Source #

type Index ByteString 
type IxValue ByteString 
type State ByteString 
type State ByteString = Buffer
type ChunkElem ByteString 
type ChunkElem ByteString = Word8

class ToByteString a where Source #

Methods

toBS :: a -> ByteString Source #

toBS :: ToText a => a -> ByteString Source #

Instances

ToByteString Double Source # 
ToByteString Int Source # 

Methods

toBS :: Int -> ByteString Source #

ToByteString Integer Source # 
ToByteString ByteString Source # 
ToByteString Text Source # 

Methods

toBS :: Text -> ByteString Source #

ToByteString Builder Source # 
ToByteString UTCTime Source # 
ToByteString String Source # 
ToByteString Natural Source # 
ToByteString StdMethod Source # 
ToByteString LazyByteString Source # 
ToByteString QueryString Source # 
ToByteString EscapedPath Source # 
ToByteString Nat Source # 

Methods

toBS :: Nat -> ByteString Source #

ToByteString Seconds Source # 
ToByteString Region Source # 
ToByteString SessionToken Source # 
ToByteString SecretKey Source # 
ToByteString AccessKey Source # 
ToByteString LogLevel Source # 
ToByteString Base64 Source # 
ToByteString AWSTime Source # 
ToByteString BasicTime Source # 
ToByteString ISO8601 Source # 
ToByteString RFC822 Source # 
ToByteString a => ToByteString (CI a) Source # 

Methods

toBS :: CI a -> ByteString Source #

ToByteString a => ToByteString (Sensitive a) Source #