| License | BSD-style |
|---|---|
| Maintainer | Vincent Hanquez <vincent@snarc.org> |
| Stability | experimental |
| Portability | portable |
| Safe Haskell | None |
| Language | Haskell2010 |
Foundation.String
Description
Opaque packed String encoded in UTF8.
The type is an instance of IsString and IsList, which allow OverloadedStrings
for string literal, and fromList to convert a [Char] (Prelude String) to a packed
representation
{-# LANGUAGE OverloadedStrings #-}
s = "Hello World :: Strings = fromList ("Hello World" :: Prelude.String) :: StringEach unicode code point is represented by a variable encoding of 1 to 4 bytes,
For more information about UTF8: https://en.wikipedia.org/wiki/UTF-8
- data String
- data Encoding
- = ASCII7
- | UTF8
- | UTF16
- | UTF32
- | ISO_8859_1
- fromBytes :: Encoding -> UArray Word8 -> (String, Maybe ValidationFailure, UArray Word8)
- fromBytesLenient :: UArray Word8 -> (String, UArray Word8)
- fromBytesUnsafe :: UArray Word8 -> String
- toBytes :: Encoding -> String -> UArray Word8
- data ValidationFailure
- lines :: String -> [String]
- words :: String -> [String]
Documentation
Opaque packed array of characters in the UTF8 encoding
Constructors
| ASCII7 | |
| UTF8 | |
| UTF16 | |
| UTF32 | |
| ISO_8859_1 |
fromBytesUnsafe :: UArray Word8 -> String Source #
Convert a Byte Array directly to a string without checking for UTF8 validity
data ValidationFailure Source #
Constructors
| InvalidHeader | |
| InvalidContinuation | |
| MissingByte |