Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- data Bytes
- empty :: Bytes
- emptyPinned :: Bytes
- emptyPinnedU :: ByteArray
- null :: Bytes -> Bool
- length :: Bytes -> Int
- uncons :: Bytes -> Maybe (Word8, Bytes)
- unsnoc :: Bytes -> Maybe (Bytes, Word8)
- any :: (Word8 -> Bool) -> Bytes -> Bool
- all :: (Word8 -> Bool) -> Bytes -> Bool
- singleton :: Word8 -> Bytes
- doubleton :: Word8 -> Word8 -> Bytes
- tripleton :: Word8 -> Word8 -> Word8 -> Bytes
- replicate :: Int -> Word8 -> Bytes
- singletonU :: Word8 -> ByteArray
- doubletonU :: Word8 -> Word8 -> ByteArray
- tripletonU :: Word8 -> Word8 -> Word8 -> ByteArray
- replicateU :: Int -> Word8 -> ByteArray
- takeWhile :: (Word8 -> Bool) -> Bytes -> Bytes
- dropWhile :: (Word8 -> Bool) -> Bytes -> Bytes
- takeWhileEnd :: (Word8 -> Bool) -> Bytes -> Bytes
- dropWhileEnd :: (Word8 -> Bool) -> Bytes -> Bytes
- foldl :: (a -> Word8 -> a) -> a -> Bytes -> a
- foldl' :: (a -> Word8 -> a) -> a -> Bytes -> a
- foldr :: (Word8 -> a -> a) -> a -> Bytes -> a
- foldr' :: (Word8 -> a -> a) -> a -> Bytes -> a
- ifoldl' :: (a -> Int -> Word8 -> a) -> a -> Bytes -> a
- elem :: Word8 -> Bytes -> Bool
- split :: Word8 -> Bytes -> [Bytes]
- splitU :: Word8 -> Bytes -> UnliftedArray ByteArray
- splitInit :: Word8 -> Bytes -> [Bytes]
- splitInitU :: Word8 -> Bytes -> UnliftedArray ByteArray
- splitNonEmpty :: Word8 -> Bytes -> NonEmpty Bytes
- splitStream :: forall m. Applicative m => Word8 -> Bytes -> Stream m Bytes
- split1 :: Word8 -> Bytes -> Maybe (Bytes, Bytes)
- split2 :: Word8 -> Bytes -> Maybe (Bytes, Bytes, Bytes)
- split3 :: Word8 -> Bytes -> Maybe (Bytes, Bytes, Bytes, Bytes)
- split4 :: Word8 -> Bytes -> Maybe (Bytes, Bytes, Bytes, Bytes, Bytes)
- splitEnd1 :: Word8 -> Bytes -> Maybe (Bytes, Bytes)
- intercalate :: Bytes -> [Bytes] -> Bytes
- intercalateByte2 :: Word8 -> Bytes -> Bytes -> Bytes
- count :: Word8 -> Bytes -> Int
- isPrefixOf :: Bytes -> Bytes -> Bool
- isSuffixOf :: Bytes -> Bytes -> Bool
- stripPrefix :: Bytes -> Bytes -> Maybe Bytes
- stripOptionalPrefix :: Bytes -> Bytes -> Bytes
- stripSuffix :: Bytes -> Bytes -> Maybe Bytes
- stripOptionalSuffix :: Bytes -> Bytes -> Bytes
- longestCommonPrefix :: Bytes -> Bytes -> Bytes
- stripCStringPrefix :: CString -> Bytes -> Maybe Bytes
- isBytePrefixOf :: Word8 -> Bytes -> Bool
- isByteSuffixOf :: Word8 -> Bytes -> Bool
- equalsLatin1 :: Char -> Bytes -> Bool
- equalsLatin2 :: Char -> Char -> Bytes -> Bool
- equalsLatin3 :: Char -> Char -> Char -> Bytes -> Bool
- equalsLatin4 :: Char -> Char -> Char -> Char -> Bytes -> Bool
- equalsLatin5 :: Char -> Char -> Char -> Char -> Char -> Bytes -> Bool
- equalsLatin6 :: Char -> Char -> Char -> Char -> Char -> Char -> Bytes -> Bool
- equalsLatin7 :: Char -> Char -> Char -> Char -> Char -> Char -> Char -> Bytes -> Bool
- equalsLatin8 :: Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Bytes -> Bool
- equalsLatin9 :: Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Bytes -> Bool
- equalsLatin10 :: Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Bytes -> Bool
- equalsLatin11 :: Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Bytes -> Bool
- equalsLatin12 :: Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Bytes -> Bool
- equalsCString :: CString -> Bytes -> Bool
- fnv1a32 :: Bytes -> Word32
- fnv1a64 :: Bytes -> Word64
- unsafeTake :: Int -> Bytes -> Bytes
- unsafeDrop :: Int -> Bytes -> Bytes
- unsafeIndex :: Bytes -> Int -> Word8
- unsafeCopy :: PrimMonad m => MutableByteArray (PrimState m) -> Int -> Bytes -> m ()
- pin :: Bytes -> Bytes
- contents :: Bytes -> Ptr Word8
- touch :: PrimMonad m => Bytes -> m ()
- toByteArray :: Bytes -> ByteArray
- toByteArrayClone :: Bytes -> ByteArray
- toPinnedByteArray :: Bytes -> ByteArray
- toPinnedByteArrayClone :: Bytes -> ByteArray
- fromAsciiString :: String -> Bytes
- fromLatinString :: String -> Bytes
- fromByteArray :: ByteArray -> Bytes
- toLatinString :: Bytes -> String
- fromCString# :: Addr# -> Bytes
- toByteString :: Bytes -> ByteString
- fromByteString :: ByteString -> Bytes
- fromShortByteString :: ShortByteString -> Bytes
- toShortByteString :: Bytes -> ShortByteString
- toShortByteStringClone :: Bytes -> ShortByteString
- toLowerAsciiByteArrayClone :: Bytes -> ByteArray
- hGet :: Handle -> Int -> IO Bytes
- readFile :: FilePath -> IO Bytes
- hPut :: Handle -> Bytes -> IO ()
Types
A slice of a ByteArray
.
Constants
emptyPinned :: Bytes Source #
The empty pinned byte sequence.
emptyPinnedU :: ByteArray Source #
The empty pinned byte sequence.
Properties
Decompose
Predicates
any :: (Word8 -> Bool) -> Bytes -> Bool Source #
O(n) Returns true if any byte in the sequence satisfies the predicate.
all :: (Word8 -> Bool) -> Bytes -> Bool Source #
O(n) Returns true if all bytes in the sequence satisfy the predicate.
Create
Sliced
Unsliced
singletonU :: Word8 -> ByteArray Source #
Create an unsliced byte sequence with one byte.
tripletonU :: Word8 -> Word8 -> Word8 -> ByteArray Source #
Create an unsliced byte sequence with three bytes.
replicateU :: Int -> Word8 -> ByteArray Source #
Variant of replicate
that returns a unsliced byte array.
Filtering
takeWhileEnd :: (Word8 -> Bool) -> Bytes -> Bytes Source #
O(n) takeWhileEnd
p
b
returns the longest suffix of
elements that satisfy predicate p
.
dropWhileEnd :: (Word8 -> Bool) -> Bytes -> Bytes Source #
O(n) dropWhileEnd
p
b
returns the prefix remaining after
dropping characters that satisfy the predicate p
from the end of
t
.
Folds
foldl :: (a -> Word8 -> a) -> a -> Bytes -> a Source #
Left fold over bytes, non-strict in the accumulator.
foldl' :: (a -> Word8 -> a) -> a -> Bytes -> a Source #
Left fold over bytes, strict in the accumulator.
foldr :: (Word8 -> a -> a) -> a -> Bytes -> a Source #
Right fold over bytes, non-strict in the accumulator.
foldr' :: (Word8 -> a -> a) -> a -> Bytes -> a Source #
Right fold over bytes, strict in the accumulator.
Folds with Indices
ifoldl' :: (a -> Int -> Word8 -> a) -> a -> Bytes -> a Source #
Left fold over bytes, strict in the accumulator. The reduction function is applied to each element along with its index.
Common Folds
Splitting
Unlimited
split :: Word8 -> Bytes -> [Bytes] Source #
Break a byte sequence into pieces separated by the byte argument,
consuming the delimiter. This function is a good producer for list
fusion. It is common to immidiately consume the results of split
with foldl'
, traverse_
, foldlM
, and being a good producer helps
in this situation.
Note: this function differs from its counterpart in bytestring
.
If the byte sequence is empty, this returns a singleton list with
the empty byte sequence.
splitU :: Word8 -> Bytes -> UnliftedArray ByteArray Source #
Variant of split
that returns an array of unsliced byte sequences.
Unlike split
, this is not a good producer for list fusion. (It does
not return a list, so it could not be.) Prefer split
if the result
is going to be consumed exactly once by a good consumer. Prefer splitU
if the result of the split is going to be around for a while and
inspected multiple times.
splitInit :: Word8 -> Bytes -> [Bytes] Source #
Variant of split
that drops the trailing element. This behaves
correctly even if the byte sequence is empty. This is a good producer
for list fusion. This is useful when splitting a text file
into lines.
POSIX
mandates that text files end with a newline, so the list resulting
from split
always has an empty byte sequence as its last element.
With splitInit
, that unwanted element is discarded.
splitInitU :: Word8 -> Bytes -> UnliftedArray ByteArray Source #
splitStream :: forall m. Applicative m => Word8 -> Bytes -> Stream m Bytes Source #
Variant of split
that intended for use with stream fusion rather
than build
-foldr
fusion.
Fixed from Beginning
split1 :: Word8 -> Bytes -> Maybe (Bytes, Bytes) Source #
Split a byte sequence on the first occurrence of the target byte. The target is removed from the result. For example:
>>>
split1 0xA [0x1,0x2,0xA,0xB]
Just ([0x1,0x2],[0xB])
split2 :: Word8 -> Bytes -> Maybe (Bytes, Bytes, Bytes) Source #
Split a byte sequence on the first and second occurrences of the target byte. The target is removed from the result. For example:
>>>
split2 0xA [0x1,0x2,0xA,0xB,0xA,0xA,0xA]
Just ([0x1,0x2],[0xB],[0xA,0xA])
split3 :: Word8 -> Bytes -> Maybe (Bytes, Bytes, Bytes, Bytes) Source #
Split a byte sequence on the first, second, and third occurrences of the target byte. The target is removed from the result. For example:
>>>
split3 0xA [0x1,0x2,0xA,0xB,0xA,0xA,0xA]
Just ([0x1,0x2],[0xB],[],[0xA])
split4 :: Word8 -> Bytes -> Maybe (Bytes, Bytes, Bytes, Bytes, Bytes) Source #
Split a byte sequence on the first, second, third, and fourth occurrences of the target byte. The target is removed from the result. For example:
>>>
split4 0xA [0x1,0x2,0xA,0xB,0xA,0xA,0xA]
Just ([0x1,0x2],[0xB],[],[],[])
Fixed from End
splitEnd1 :: Word8 -> Bytes -> Maybe (Bytes, Bytes) Source #
Split a byte sequence on the last occurrence of the target byte. The target is removed from the result. For example:
>>>
split1 0xA [0x1,0x2,0xA,0xB,0xA,0xC]
Just ([0x1,0x2,0xA,0xB],[0xC])
Combining
Specialization of intercalate
where the separator is a single byte and
there are exactly two byte sequences that are being concatenated.
Counting
Prefix and Suffix
Byte Sequence
stripPrefix :: Bytes -> Bytes -> Maybe Bytes Source #
O(n) Return the suffix of the second string if its prefix matches the entire first string.
stripOptionalPrefix :: Bytes -> Bytes -> Bytes Source #
O(n) Return the suffix of the second string if its prefix matches the entire first string. Otherwise, return the second string unchanged.
stripSuffix :: Bytes -> Bytes -> Maybe Bytes Source #
O(n) Return the prefix of the second string if its suffix matches the entire first string.
stripOptionalSuffix :: Bytes -> Bytes -> Bytes Source #
O(n) Return the prefix of the second string if its suffix matches the entire first string. Otherwise, return the second string unchanged.
longestCommonPrefix :: Bytes -> Bytes -> Bytes Source #
Find the longest string which is a prefix of both arguments.
C Strings
stripCStringPrefix :: CString -> Bytes -> Maybe Bytes Source #
O(n) Variant of stripPrefix
that takes a NUL
-terminated C String
as the prefix to test for.
Single Byte
isBytePrefixOf :: Word8 -> Bytes -> Bool Source #
Does the byte sequence begin with the given byte? False if the byte sequence is empty.
isByteSuffixOf :: Word8 -> Bytes -> Bool Source #
Does the byte sequence end with the given byte? False if the byte sequence is empty.
Equality
Fixed Characters
equalsLatin1 :: Char -> Bytes -> Bool Source #
Is the byte sequence, when interpreted as ISO-8859-1-encoded text, a singleton whose element matches the character?
equalsLatin2 :: Char -> Char -> Bytes -> Bool Source #
Is the byte sequence, when interpreted as ISO-8859-1-encoded text, a doubleton whose elements match the characters?
equalsLatin3 :: Char -> Char -> Char -> Bytes -> Bool Source #
Is the byte sequence, when interpreted as ISO-8859-1-encoded text, a tripleton whose elements match the characters?
equalsLatin4 :: Char -> Char -> Char -> Char -> Bytes -> Bool Source #
Is the byte sequence, when interpreted as ISO-8859-1-encoded text, a quadrupleton whose elements match the characters?
equalsLatin5 :: Char -> Char -> Char -> Char -> Char -> Bytes -> Bool Source #
Is the byte sequence, when interpreted as ISO-8859-1-encoded text, a quintupleton whose elements match the characters?
equalsLatin6 :: Char -> Char -> Char -> Char -> Char -> Char -> Bytes -> Bool Source #
Is the byte sequence, when interpreted as ISO-8859-1-encoded text, a sextupleton whose elements match the characters?
equalsLatin7 :: Char -> Char -> Char -> Char -> Char -> Char -> Char -> Bytes -> Bool Source #
Is the byte sequence, when interpreted as ISO-8859-1-encoded text, a septupleton whose elements match the characters?
equalsLatin8 :: Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Bytes -> Bool Source #
Is the byte sequence, when interpreted as ISO-8859-1-encoded text, an octupleton whose elements match the characters?
equalsLatin9 :: Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Bytes -> Bool Source #
Is the byte sequence, when interpreted as ISO-8859-1-encoded text, a 9-tuple whose elements match the characters?
equalsLatin10 :: Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Bytes -> Bool Source #
Is the byte sequence, when interpreted as ISO-8859-1-encoded text, a 10-tuple whose elements match the characters?
equalsLatin11 :: Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Bytes -> Bool Source #
Is the byte sequence, when interpreted as ISO-8859-1-encoded text, a 11-tuple whose elements match the characters?
equalsLatin12 :: Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Char -> Bytes -> Bool Source #
Is the byte sequence, when interpreted as ISO-8859-1-encoded text, a 12-tuple whose elements match the characters?
C Strings
equalsCString :: CString -> Bytes -> Bool Source #
Is the byte sequence equal to the NUL
-terminated C String?
The C string must be a constant.
Hashing
Unsafe Slicing
unsafeTake :: Int -> Bytes -> Bytes Source #
Take the first n
bytes from the argument. Precondition: n ≤ len
unsafeDrop :: Int -> Bytes -> Bytes Source #
Drop the first n
bytes from the argument. Precondition: n ≤ len
unsafeIndex :: Bytes -> Int -> Word8 Source #
Index into the byte sequence at the given position. This index must be less than the length.
Copying
:: PrimMonad m | |
=> MutableByteArray (PrimState m) | Destination |
-> Int | Destination Offset |
-> Bytes | Source |
-> m () |
Copy the byte sequence into a mutable buffer. The buffer must have enough space to accomodate the byte sequence, but this this is not checked.
Pointers
pin :: Bytes -> Bytes Source #
Yields a pinned byte sequence whose contents are identical to those
of the original byte sequence. If the ByteArray
backing the argument
was already pinned, this simply aliases the argument and does not perform
any copying.
contents :: Bytes -> Ptr Word8 Source #
Yields a pointer to the beginning of the byte sequence. It is only safe
to call this on a Bytes
backed by a pinned ByteArray
.
touch :: PrimMonad m => Bytes -> m () Source #
Touch the byte array backing the byte sequence. This sometimes needed
after calling contents
so that the ByteArray
does not get garbage
collected.
Conversion
toByteArray :: Bytes -> ByteArray Source #
toByteArrayClone :: Bytes -> ByteArray Source #
Variant of toByteArray
that unconditionally makes a copy of
the array backing the sliced Bytes
even if the original array
could be reused. Prefer toByteArray
.
toPinnedByteArray :: Bytes -> ByteArray Source #
toPinnedByteArrayClone :: Bytes -> ByteArray Source #
Variant of toPinnedByteArray
that unconditionally makes a copy of
the array backing the sliced Bytes
even if the original array
could be reused. Prefer toPinnedByteArray
.
fromAsciiString :: String -> Bytes Source #
Convert a String
consisting of only characters in the ASCII block
to a byte sequence. Any character with a codepoint above U+007F
is
replaced by U+0000
.
fromLatinString :: String -> Bytes Source #
Convert a String
consisting of only characters representable
by ISO-8859-1. These are encoded with ISO-8859-1. Any character
with a codepoint above U+00FF
is replaced by an unspecified byte.
fromByteArray :: ByteArray -> Bytes Source #
Create a slice of Bytes
that spans the entire argument array.
toLatinString :: Bytes -> String Source #
Interpret a byte sequence as text encoded by ISO-8859-1.
fromCString# :: Addr# -> Bytes Source #
Copy a primitive string literal into managed memory.
toByteString :: Bytes -> ByteString Source #
O(n) when unpinned, O(1) when pinned. Create a ByteString
from
a byte sequence. This only copies the byte sequence if it is not pinned.
fromByteString :: ByteString -> Bytes Source #
O(n) Copy a ByteString
to a byte sequence.
fromShortByteString :: ShortByteString -> Bytes Source #
O(1) Create Bytes
from a ShortByteString
.
toShortByteString :: Bytes -> ShortByteString Source #
Convert the sliced Bytes
to an unsliced ShortByteString
. This
reuses the array backing the sliced Bytes
if the slicing metadata
implies that all of the bytes are used. Otherwise, it makes a copy.
toShortByteStringClone :: Bytes -> ShortByteString Source #
Variant of toShortByteString
that unconditionally makes a copy of
the array backing the sliced Bytes
even if the original array
could be reused. Prefer toShortByteString
.
toLowerAsciiByteArrayClone :: Bytes -> ByteArray Source #
O(n) Interpreting the bytes an ASCII-encoded characters, convert
the string to lowercase. This adds 0x20
to bytes in the range
[0x41,0x5A]
and leaves all other bytes alone. Unconditionally
copies the bytes.