Copyright | (c) Dong Han 2017-2018 |
---|---|
License | BSD |
Maintainer | winterland1989@gmail.com |
Stability | experimental |
Portability | non-portable |
Safe Haskell | None |
Language | Haskell2010 |
Synopsis
- newtype Text = Text {}
- validate :: HasCallStack => Bytes -> Text
- validateASCII :: HasCallStack => Bytes -> Text
- validateMaybe :: Bytes -> Maybe Text
- validateASCIIMaybe :: Bytes -> Maybe Text
- index :: HasCallStack => Text -> Int -> Char
- indexMaybe :: Text -> Int -> Maybe Char
- charByteIndex :: Text -> Int -> Int
- indexR :: HasCallStack => Text -> Int -> Char
- indexMaybeR :: Text -> Int -> Maybe Char
- charByteIndexR :: Text -> Int -> Int
- empty :: Text
- singleton :: Char -> Text
- copy :: Text -> Text
- replicate :: Int -> Char -> Text
- cycleN :: Int -> Text -> Text
- pack :: String -> Text
- packN :: Int -> String -> Text
- packR :: String -> Text
- packRN :: Int -> String -> Text
- unpack :: Text -> String
- unpackR :: Text -> String
- fromVector :: PrimVector Char -> Text
- toVector :: Text -> PrimVector Char
- null :: Text -> Bool
- length :: Text -> Int
- append :: Text -> Text -> Text
- map' :: (Char -> Char) -> Text -> Text
- imap' :: (Int -> Char -> Char) -> Text -> Text
- foldl' :: (b -> Char -> b) -> b -> Text -> b
- ifoldl' :: (b -> Int -> Char -> b) -> b -> Text -> b
- foldr' :: (Char -> b -> b) -> b -> Text -> b
- ifoldr' :: (Int -> Char -> b -> b) -> b -> Text -> b
- concat :: [Text] -> Text
- concatMap :: (Char -> Text) -> Text -> Text
- count :: Char -> Text -> Int
- all :: (Char -> Bool) -> Text -> Bool
- any :: (Char -> Bool) -> Text -> Bool
- displayWidth :: Text -> Int
- data NormalizationResult
- data NormalizeMode
- isNormalized :: Text -> NormalizationResult
- isNormalizedTo :: NormalizeMode -> Text -> NormalizationResult
- normalize :: Text -> Text
- normalizeTo :: NormalizeMode -> Text -> Text
- envLocale :: IO Locale
- caseFold :: Text -> Text
- caseFoldWith :: Locale -> Text -> Text
- toLower :: Text -> Text
- toLowerWith :: Locale -> Text -> Text
- toUpper :: Text -> Text
- toUpperWith :: Locale -> Text -> Text
- toTitle :: Text -> Text
- toTitleWith :: Locale -> Text -> Text
- isCategory :: Category -> Text -> Bool
- spanCategory :: Category -> Text -> (Text, Text)
- type Locale = CSize
- pattern LocaleDefault :: Locale
- pattern LocaleLithuanian :: Locale
- pattern LocaleTurkishAndAzeriLatin :: Locale
- type Category = CSize
- pattern CategoryLetterUppercase :: Category
- pattern CategoryLetterLowercase :: Category
- pattern CategoryLetterTitlecase :: Category
- pattern CategoryLetterOther :: Category
- pattern CategoryLetter :: Category
- pattern CategoryCaseMapped :: Category
- pattern CategoryMarkNonSpacing :: Category
- pattern CategoryMarkSpacing :: Category
- pattern CategoryMarkEnclosing :: Category
- pattern CategoryMark :: Category
- pattern CategoryNumberDecimal :: Category
- pattern CategoryNumberLetter :: Category
- pattern CategoryNumberOther :: Category
- pattern CategoryNumber :: Category
- pattern CategoryPunctuationConnector :: Category
- pattern CategoryPunctuationDash :: Category
- pattern CategoryPunctuationOpen :: Category
- pattern CategoryPunctuationClose :: Category
- pattern CategoryPunctuationInitial :: Category
- pattern CategoryPunctuationFinal :: Category
- pattern CategoryPunctuationOther :: Category
- pattern CategoryPunctuation :: Category
- pattern CategorySymbolMath :: Category
- pattern CategorySymbolCurrency :: Category
- pattern CategorySymbolModifier :: Category
- pattern CategorySymbolOther :: Category
- pattern CategorySymbol :: Category
- pattern CategorySeparatorSpace :: Category
- pattern CategorySeparatorLine :: Category
- pattern CategorySeparatorParagraph :: Category
- pattern CategorySeparator :: Category
- pattern CategoryControl :: Category
- pattern CategoryFormat :: Category
- pattern CategorySurrogate :: Category
- pattern CategoryPrivateUse :: Category
- pattern CategoryUnassigned :: Category
- pattern CategoryCompatibility :: Category
- pattern CategoryIgnoreGraphemeCluster :: Category
- pattern CategoryIscntrl :: Category
- pattern CategoryIsprint :: Category
- pattern CategoryIsspace :: Category
- pattern CategoryIsblank :: Category
- pattern CategoryIsgraph :: Category
- pattern CategoryIspunct :: Category
- pattern CategoryIsalnum :: Category
- pattern CategoryIsalpha :: Category
- pattern CategoryIsupper :: Category
- pattern CategoryIslower :: Category
- pattern CategoryIsdigit :: Category
- pattern CategoryIsxdigit :: Category
- data TextException
- errorEmptyText :: HasCallStack => a
- c_utf8_validate_ba :: ByteArray# -> Int# -> Int# -> Int
- c_utf8_validate_addr :: Addr# -> Int -> IO Int
- c_ascii_validate_ba :: ByteArray# -> Int# -> Int# -> Int
- c_ascii_validate_addr :: Addr# -> Int -> IO Int
Text type
Instances
IsList Text Source # | |
Eq Text Source # | |
Ord Text Source # | |
Read Text Source # | Accepted syntax and escaping rules are same with |
Show Text Source # | The escaping rules is different from |
IsString Text Source # | |
Defined in Z.Data.Text.Base fromString :: String -> Text # | |
Semigroup Text Source # | |
Monoid Text Source # | |
Arbitrary Text Source # | |
CoArbitrary Text Source # | |
Defined in Z.Data.Text.Base coarbitrary :: Text -> Gen b -> Gen b # | |
FoldCase Text Source # | case fold with default locale. |
Defined in Z.Data.Text.Base | |
NFData Text Source # | |
Defined in Z.Data.Text.Base | |
Hashable Text Source # | |
Defined in Z.Data.Text.Base | |
Print Text Source # | The escaping rules is same with |
Defined in Z.Data.Text.Print | |
JSON Text Source # | |
JSON a => JSON (Map Text a) Source # | |
JSON a => JSON (HashMap Text a) Source # | default instance prefer later key |
JSON a => JSON (FlatMap Text a) Source # | default instance prefer later key |
type Item Text Source # | |
Defined in Z.Data.Text.Base |
Building text
validate :: HasCallStack => Bytes -> Text Source #
O(n) Validate a sequence of bytes is UTF-8 encoded.
Throw InvalidUTF8Exception
in case of invalid codepoint.
validateASCII :: HasCallStack => Bytes -> Text Source #
O(n) Validate a sequence of bytes is all ascii char byte(<128).
Throw InvalidASCIIException
in case of invalid byte, It's not always faster
than validate
, use it only if you want to validate ASCII char sequences.
validateMaybe :: Bytes -> Maybe Text Source #
O(n) Validate a sequence of bytes is UTF-8 encoded.
Return Nothing
in case of invalid codepoint.
validateASCIIMaybe :: Bytes -> Maybe Text Source #
O(n) Validate a sequence of bytes is all ascii char byte(<128).
Return Nothing
in case of invalid byte.
index :: HasCallStack => Text -> Int -> Char Source #
O(n) Get the nth codepoint from Text
, throw IndexOutOfTextRange
when out of bound.
charByteIndex :: Text -> Int -> Int Source #
O(n) Find the nth codepoint's byte index (pointing to the nth char's begining byte).
The index is only meaningful to the whole byte slice, if there's less than n codepoints, the index will point to next byte after the end.
indexR :: HasCallStack => Text -> Int -> Char Source #
O(n) Get the nth codepoint from Text
counting from the end,
throw IndexOutOfVectorRange n callStack
when out of bound.
indexMaybeR :: Text -> Int -> Maybe Char Source #
O(n) Get the nth codepoint from Text
counting from the end.
charByteIndexR :: Text -> Int -> Int Source #
O(n) Find the nth codepoint's byte index from the end (pointing to the previous char's ending byte).
The index is only meaningful to the whole byte slice, if there's less than n codepoints, the index will point to previous byte before the start.
Basic creating
Conversion between list
pack :: String -> Text Source #
O(n) Convert a string into a text
Alias for
, will be rewritten to a memcpy if possible.packN
defaultInitSize
packN :: Int -> String -> Text Source #
O(n) Convert a list into a text with an approximate size(in bytes, not codepoints).
If the encoded bytes length is larger than the size given, we simply double the buffer size and continue building.
This function is a good consumer in the sense of build/foldr fusion.
packRN :: Int -> String -> Text Source #
O(n) packN
in reverse order.
This function is a good consumer in the sense of build/foldr fusion.
unpack :: Text -> String Source #
O(n) Convert text to a char list.
Unpacking is done lazily. i.e. we will retain reference to the array until all element are consumed.
This function is a good producer in the sense of build/foldr fusion.
unpackR :: Text -> String Source #
O(n) Convert text to a list in reverse order.
This function is a good producer in the sense of build/foldr fusion.
Conversion between codepoint vector
fromVector :: PrimVector Char -> Text Source #
O(n) convert from a char vector.
Basic interface
append :: Text -> Text -> Text Source #
O(m+n)
There's no need to guard empty vector because we guard them for you, so appending empty text are no-ops.
map' :: (Char -> Char) -> Text -> Text Source #
O(n) map
f
t
is the Text
obtained by applying f
to
each char of t
. Performs replacement on invalid scalar values.
ifoldr' :: (Int -> Char -> b -> b) -> b -> Text -> b Source #
Strict right to left fold with index
NOTE: the index is counting from 0, not backwards
concat :: [Text] -> Text Source #
O(n) Concatenate a list of text.
Note: concat
have to force the entire list to filter out empty text and calculate
the length for allocation.
concatMap :: (Char -> Text) -> Text -> Text Source #
Map a function over a text and concatenate the results
Special folds
all :: (Char -> Bool) -> Text -> Bool Source #
O(n) Applied to a predicate and text, all
determines
if all chars of the text satisfy the predicate.
any :: (Char -> Bool) -> Text -> Bool Source #
O(n) Applied to a predicate and a text, any
determines
if any chars of the text satisfy the predicate.
Text display width
displayWidth :: Text -> Int Source #
Get the display width of a piece of text.
You shouldn't pass texts with control characters(<0x20, \DEL), which are counted with -1 width.
>>>
displayWidth "你好世界!"
>>>
10
>>>
displayWidth "hello world!"
>>>
12
normalization
data NormalizationResult Source #
Instances
data NormalizeMode Source #
These are the Unicode Normalization Forms:
Form | Description ---------------------------- | --------------------------------------------- Normalization Form D (NFD) | Canonical decomposition Normalization Form C (NFC) | Canonical decomposition, followed by canonical composition Normalization Form KD (NFKD) | Compatibility decomposition Normalization Form KC (NFKC) | Compatibility decomposition, followed by canonical composition
Instances
isNormalized :: Text -> NormalizationResult Source #
Check if a string is stable in the NFC (Normalization Form C).
isNormalizedTo :: NormalizeMode -> Text -> NormalizationResult Source #
Check if a string is stable in the specified Unicode Normalization Form.
This function can be used as a preprocessing step, before attempting to normalize a string. Normalization is a very expensive process, it is often cheaper to first determine if the string is unstable in the requested normalization form.
The result of the check will be YES if the string is stable and MAYBE or NO if it is unstable. If the result is MAYBE, the string does not necessarily have to be normalized.
For more information, please review <http://www.unicode.org/reports/tr15/ Unicode Standard Annex #15 - Unicode Normalization Forms>.
normalizeTo :: NormalizeMode -> Text -> Text Source #
Normalize a string to the specified Unicode Normalization Form.
The Unicode standard defines two standards for equivalence between characters: canonical and compatibility equivalence. Canonically equivalent characters and sequence represent the same abstract character and must be rendered with the same appearance and behavior. Compatibility equivalent characters have a weaker equivalence and may be rendered differently.
Unicode Normalization Forms are formally defined standards that can be used to test whether any two strings of characters are equivalent to each other. This equivalence may be canonical or compatibility.
The algorithm puts all combining marks into a specified order and uses the rules for decomposition and composition to transform the string into one of four Unicode Normalization Forms. A binary comparison can then be used to determine equivalence.
Case conversion
caseFold :: Text -> Text Source #
Remove case distinction from UTF-8 encoded text with default locale.
caseFoldWith :: Locale -> Text -> Text Source #
Remove case distinction from UTF-8 encoded text.
Case folding is the process of eliminating differences between code points concerning case mapping. It is most commonly used for comparing strings in a case-insensitive manner. Conversion is fully compliant with the Unicode 7.0 standard.
Although similar to lowercasing text, there are significant differences. For one, case folding does _not_ take locale into account when converting. In some cases, case folding can be up to 20% faster than lowercasing the same text, but the result cannot be treated as correct lowercased text.
Only two locale-specific exception are made when case folding text. In Turkish, U+0049 LATIN CAPITAL LETTER I maps to U+0131 LATIN SMALL LETTER DOTLESS I and U+0130 LATIN CAPITAL LETTER I WITH DOT ABOVE maps to U+0069 LATIN SMALL LETTER I.
Although most code points can be case folded without changing length, there are notable exceptions. For example, U+0130 (LATIN CAPITAL LETTER I WITH DOT ABOVE) maps to "U+0069 U+0307" (LATIN SMALL LETTER I and COMBINING DOT ABOVE) when converted to lowercase.
Only a handful of scripts make a distinction between upper- and lowercase. In addition to modern scripts, such as Latin, Greek, Armenian and Cyrillic, a few historic or archaic scripts have case. The vast majority of scripts do not have case distinctions.
toLowerWith :: Locale -> Text -> Text Source #
Convert UTF-8 encoded text to lowercase.
This function allows conversion of UTF-8 encoded strings to lowercase without first changing the encoding to UTF-32. Conversion is fully compliant with the Unicode 7.0 standard.
Although most code points can be converted to lowercase with changing length, there are notable exceptions. For example, U+0130 (LATIN CAPITAL LETTER I WITH DOT ABOVE) maps to "U+0069 U+0307" (LATIN SMALL LETTER I and COMBINING DOT ABOVE) when converted to lowercase.
Only a handful of scripts make a distinction between upper- and lowercase. In addition to modern scripts, such as Latin, Greek, Armenian and Cyrillic, a few historic or archaic scripts have case. The vast majority of scripts do not have case distinctions.
Case mapping is not reversible. That is, toUpper(toLower(x)) != toLower(toUpper(x))
.
Certain code points (or combinations of code points) apply rules based on the locale. For more information about these exceptional code points, please refer to the Unicode standard: ftp://ftp.unicode.org/Public/UNIDATA/SpecialCasing.txt
toUpperWith :: Locale -> Text -> Text Source #
Convert UTF-8 encoded text to uppercase.
Conversion is fully compliant with the Unicode 7.0 standard.
Although most code points can be converted without changing length, there are notable exceptions. For example, U+00DF (LATIN SMALL LETTER SHARP S) maps to "U+0053 U+0053" (LATIN CAPITAL LETTER S and LATIN CAPITAL LETTER S) when converted to uppercase.
Only a handful of scripts make a distinction between upper and lowercase. In addition to modern scripts, such as Latin, Greek, Armenian and Cyrillic, a few historic or archaic scripts have case. The vast majority of scripts do not have case distinctions.
Case mapping is not reversible. That is, toUpper(toLower(x)) != toLower(toUpper(x))
.
Certain code points (or combinations of code points) apply rules based on the locale. For more information about these exceptional code points, please refer to the Unicode standard: ftp://ftp.unicode.org/Public/UNIDATA/SpecialCasing.txt
toTitleWith :: Locale -> Text -> Text Source #
Convert UTF-8 encoded text to titlecase.
This function allows conversion of UTF-8 encoded strings to titlecase. Conversion is fully compliant with the Unicode 7.0 standard.
Titlecase requires a bit more explanation than uppercase and lowercase, because it is not a common text transformation. Titlecase uses uppercase for the first letter of each word and lowercase for the rest. Words are defined as "collections of code points with general category Lu, Ll, Lt, Lm or Lo according to the Unicode database".
Effectively, any type of punctuation can break up a word, even if this is not grammatically valid. This happens because the titlecasing algorithm does not and cannot take grammar rules into account.
Text | Titlecase -------------------------------------|------------------------------------- The running man | The Running Man NATO Alliance | Nato Alliance You're amazing at building libraries | You'Re Amazing At Building Libraries
Although most code points can be converted to titlecase without changing length, there are notable exceptions. For example, U+00DF (LATIN SMALL LETTER SHARP S) maps to "U+0053 U+0073" (LATIN CAPITAL LETTER S and LATIN SMALL LETTER S) when converted to titlecase.
Certain code points (or combinations of code points) apply rules based on the locale. For more information about these exceptional code points, please refer to the Unicode standard: ftp://ftp.unicode.org/Public/UNIDATA/SpecialCasing.txt
Unicode category
isCategory :: Category -> Text -> Bool Source #
Check if the input string conforms to the category specified by the flags.
This function can be used to check if the code points in a string are part of a category. Valid flags are members of the "list of categories". The category for a code point is defined as part of the entry in UnicodeData.txt, the data file for the Unicode code point database.
By default, the function will treat grapheme clusters as a single code point. This means that the following string:
Code point | Canonical combining class | General category | Name ---------- | ------------------------- | --------------------- | ---------------------- U+0045 | 0 | Lu (Uppercase letter) | LATIN CAPITAL LETTER E U+0300 | 230 | Mn (Non-spacing mark) | COMBINING GRAVE ACCENT
Will match with CategoryLetterUppercase
in its entirety, because
the COMBINING GRAVE ACCENT is treated as part of the grapheme cluster. This
is useful when e.g. creating a text parser, because you do not have to
normalize the text first.
If this is undesired behavior, specify the CategoryIgnoreGraphemeCluster
flag.
In order to maintain backwards compatibility with POSIX functions
like isdigit
and isspace
, compatibility flags have been provided. Note,
however, that the result is only guaranteed to be correct for code points
in the Basic Latin range, between U+0000 and 0+007F. Combining a
compatibility flag with a regular category flag will result in undefined
behavior.
spanCategory :: Category -> Text -> (Text, Text) Source #
Try to match as many code points with the matching category flags as possible and return the prefix and suffix.
Constants
Locale
pattern LocaleDefault :: Locale Source #
pattern LocaleLithuanian :: Locale Source #
pattern LocaleTurkishAndAzeriLatin :: Locale Source #
Category
type Category = CSize Source #
Unicode categories.
See isCategory
, you can combine categories with bitwise or.
pattern CategoryLetterUppercase :: Category Source #
pattern CategoryLetterLowercase :: Category Source #
pattern CategoryLetterTitlecase :: Category Source #
pattern CategoryLetterOther :: Category Source #
pattern CategoryLetter :: Category Source #
pattern CategoryCaseMapped :: Category Source #
pattern CategoryMarkNonSpacing :: Category Source #
pattern CategoryMarkSpacing :: Category Source #
pattern CategoryMarkEnclosing :: Category Source #
pattern CategoryMark :: Category Source #
pattern CategoryNumberDecimal :: Category Source #
pattern CategoryNumberLetter :: Category Source #
pattern CategoryNumberOther :: Category Source #
pattern CategoryNumber :: Category Source #
pattern CategoryPunctuationConnector :: Category Source #
pattern CategoryPunctuationDash :: Category Source #
pattern CategoryPunctuationOpen :: Category Source #
pattern CategoryPunctuationClose :: Category Source #
pattern CategoryPunctuationInitial :: Category Source #
pattern CategoryPunctuationFinal :: Category Source #
pattern CategoryPunctuationOther :: Category Source #
pattern CategoryPunctuation :: Category Source #
pattern CategorySymbolMath :: Category Source #
pattern CategorySymbolCurrency :: Category Source #
pattern CategorySymbolModifier :: Category Source #
pattern CategorySymbolOther :: Category Source #
pattern CategorySymbol :: Category Source #
pattern CategorySeparatorSpace :: Category Source #
pattern CategorySeparatorLine :: Category Source #
pattern CategorySeparatorParagraph :: Category Source #
pattern CategorySeparator :: Category Source #
pattern CategoryControl :: Category Source #
pattern CategoryFormat :: Category Source #
pattern CategorySurrogate :: Category Source #
pattern CategoryPrivateUse :: Category Source #
pattern CategoryUnassigned :: Category Source #
pattern CategoryCompatibility :: Category Source #
pattern CategoryIgnoreGraphemeCluster :: Category Source #
pattern CategoryIscntrl :: Category Source #
pattern CategoryIsprint :: Category Source #
pattern CategoryIsspace :: Category Source #
pattern CategoryIsblank :: Category Source #
pattern CategoryIsgraph :: Category Source #
pattern CategoryIspunct :: Category Source #
pattern CategoryIsalnum :: Category Source #
pattern CategoryIsalpha :: Category Source #
pattern CategoryIsupper :: Category Source #
pattern CategoryIslower :: Category Source #
pattern CategoryIsdigit :: Category Source #
pattern CategoryIsxdigit :: Category Source #
Misc
data TextException Source #
InvalidUTF8Exception CallStack | |
InvalidASCIIException CallStack | |
IndexOutOfTextRange Int CallStack | first payload is invalid char index |
EmptyText CallStack |
Instances
Show TextException Source # | |
Defined in Z.Data.Text.Base showsPrec :: Int -> TextException -> ShowS # show :: TextException -> String # showList :: [TextException] -> ShowS # | |
Exception TextException Source # | |
Defined in Z.Data.Text.Base |
errorEmptyText :: HasCallStack => a Source #
c_utf8_validate_ba :: ByteArray# -> Int# -> Int# -> Int Source #
c_ascii_validate_ba :: ByteArray# -> Int# -> Int# -> Int Source #