text-1.2.4.0: An efficient packed Unicode text type.
Copyright(c) 2009 2010 Bryan O'Sullivan
LicenseBSD-style
Maintainerbos@serpentine.com
Stabilityexperimental
PortabilityGHC
Safe HaskellNone
LanguageHaskell2010

Data.Text.Internal.Lazy

Description

Warning: this is an internal module, and does not have a stable API or name. Functions in this module may not check or enforce preconditions expected by public modules. Use at your own risk!

A module containing private Text internals. This exposes the Text representation and low level construction functions. Modules which extend the Text system may need to use this module.

Synopsis

Documentation

data Text Source #

Constructors

Empty 
Chunk !Text Text 

Instances

Instances details
IsList Text #

Since: text-1.2.0.0

Instance details

Defined in Data.Text.Lazy

Associated Types

type Item Text Source #

Eq Text # 
Instance details

Defined in Data.Text.Lazy

Methods

(==) :: Text -> Text -> Bool Source #

(/=) :: Text -> Text -> Bool Source #

Data Text #

This instance preserves data abstraction at the cost of inefficiency. We omit reflection services for the sake of data abstraction.

This instance was created by copying the updated behavior of Data.Text.Text

Instance details

Defined in Data.Text.Lazy

Methods

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

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

toConstr :: Text -> Constr Source #

dataTypeOf :: Text -> DataType Source #

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

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

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

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

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

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

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

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

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

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

Ord Text # 
Instance details

Defined in Data.Text.Lazy

Read Text # 
Instance details

Defined in Data.Text.Lazy

Show Text # 
Instance details

Defined in Data.Text.Lazy

IsString Text # 
Instance details

Defined in Data.Text.Lazy

Semigroup Text #

Non-orphan Semigroup instance only defined for base-4.9.0.0 and later; orphan instances for older GHCs are provided by the semigroups package

Since: text-1.2.2.0

Instance details

Defined in Data.Text.Lazy

Monoid Text # 
Instance details

Defined in Data.Text.Lazy

Lift Text #

This instance has similar considerations to the Data instance: it preserves abstraction at the cost of inefficiency.

Since: text-1.2.4.0

Instance details

Defined in Data.Text.Lazy

Methods

lift :: Text -> Q Exp Source #

PrintfArg Text #

Only defined for base-4.7.0.0 and later

Since: text-1.2.2.0

Instance details

Defined in Data.Text.Lazy

Binary Text #

Since: text-1.2.1.0

Instance details

Defined in Data.Text.Lazy

NFData Text # 
Instance details

Defined in Data.Text.Lazy

Methods

rnf :: Text -> () Source #

type Item Text # 
Instance details

Defined in Data.Text.Lazy

type Item Text = Char

chunk :: Text -> Text -> Text Source #

Smart constructor for Chunk. Guarantees the data type invariant.

empty :: Text Source #

Smart constructor for Empty.

foldrChunks :: (Text -> a -> a) -> a -> Text -> a Source #

Consume the chunks of a lazy Text with a natural right fold.

foldlChunks :: (a -> Text -> a) -> a -> Text -> a Source #

Consume the chunks of a lazy Text with a strict, tail-recursive, accumulating left fold.

Data type invariant and abstraction functions

The data type invariant for lazy Text: Every Text is either Empty or consists of non-null Texts. All functions must preserve this, and the QC properties must check this.

strictInvariant :: Text -> Bool Source #

Check the invariant strictly.

lazyInvariant :: Text -> Text Source #

Check the invariant lazily.

showStructure :: Text -> String Source #

Display the internal structure of a lazy Text.

Chunk allocation sizes

defaultChunkSize :: Int Source #

Currently set to 16 KiB, less the memory management overhead.

smallChunkSize :: Int Source #

Currently set to 128 bytes, less the memory management overhead.

chunkOverhead :: Int Source #

The memory management overhead. Currently this is tuned for GHC only.