prolude-0.0.0.8: ITProTV's custom prelude
Safe HaskellSafe-Inferred
LanguageHaskell2010

Prolude.ByteString

Synopsis

Documentation

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

Instances details
Eq ByteString 
Instance details

Defined in Data.ByteString.Internal

Data ByteString 
Instance details

Defined in Data.ByteString.Internal

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 :: forall r r'. (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 
Instance details

Defined in Data.ByteString.Internal

Read ByteString 
Instance details

Defined in Data.ByteString.Internal

Show ByteString 
Instance details

Defined in Data.ByteString.Internal

IsString ByteString 
Instance details

Defined in Data.ByteString.Internal

Semigroup ByteString 
Instance details

Defined in Data.ByteString.Internal

Monoid ByteString 
Instance details

Defined in Data.ByteString.Internal

Hashable ByteString 
Instance details

Defined in Data.Hashable.Class

FromField ByteString 
Instance details

Defined in Data.Csv.Conversion

ToField ByteString 
Instance details

Defined in Data.Csv.Conversion

Methods

toField :: ByteString -> Field #

NFData ByteString 
Instance details

Defined in Data.ByteString.Internal

Methods

rnf :: ByteString -> () #

PersistField ByteString 
Instance details

Defined in Database.Persist.Class.PersistField

ToField a => GToRecord (K1 i a :: k -> Type) Field 
Instance details

Defined in Data.Csv.Conversion

Methods

gtoRecord :: forall (p :: k0). Options -> K1 i a p -> [Field]

FromField a => GFromRecordProd (K1 i a :: k -> Type) Record 
Instance details

Defined in Data.Csv.Conversion

Methods

gparseRecordProd :: forall (p :: k0). Options -> Int -> (Int, Record -> Parser (K1 i a p))

GToRecord a Field => GToRecord (M1 S c a :: k -> Type) Field 
Instance details

Defined in Data.Csv.Conversion

Methods

gtoRecord :: forall (p :: k0). Options -> M1 S c a p -> [Field]

GFromRecordProd f Record => GFromRecordProd (M1 i n f :: k -> Type) Record 
Instance details

Defined in Data.Csv.Conversion

Methods

gparseRecordProd :: forall (p :: k0). Options -> Int -> (Int, Record -> Parser (M1 i n f p))

(FromField a, Selector s) => GFromRecordProd (M1 S s (K1 i a :: k -> Type) :: k -> Type) NamedRecord 
Instance details

Defined in Data.Csv.Conversion

Methods

gparseRecordProd :: forall (p :: k0). Options -> Int -> (Int, NamedRecord -> Parser (M1 S s (K1 i a) p))

(ToField a, Selector s) => GToRecord (M1 S s (K1 i a :: k -> Type) :: k -> Type) (ByteString, ByteString) 
Instance details

Defined in Data.Csv.Conversion

Methods

gtoRecord :: forall (p :: k0). Options -> M1 S s (K1 i a) p -> [(ByteString, ByteString)]

FromField a => FromField (Either Field a)

Left field if conversion failed, Right otherwise.

Instance details

Defined in Data.Csv.Conversion

Methods

parseField :: Field -> Parser (Either Field a) #