amazonka-core-2.0: Core data types and functionality for Amazonka libraries.
Copyright(c) 2013-2023 Brendan Hay
LicenseMozilla Public License, v. 2.0.
MaintainerBrendan Hay <brendan.g.hay+amazonka@gmail.com>
Stabilityprovisional
Portabilitynon-portable (GHC extensions)
Safe HaskellSafe-Inferred
LanguageHaskell2010

Amazonka.Data.Text

Description

 
Synopsis

Documentation

data Text #

A space efficient, packed, unboxed Unicode text type.

Instances

Instances details
FromJSON Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

FromJSONKey Text 
Instance details

Defined in Data.Aeson.Types.FromJSON

ToJSON Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToJSONKey Text 
Instance details

Defined in Data.Aeson.Types.ToJSON

ToBody Text Source # 
Instance details

Defined in Amazonka.Data.Body

ToHashedBody Text Source # 
Instance details

Defined in Amazonka.Data.Body

ToByteString Text Source # 
Instance details

Defined in Amazonka.Data.ByteString

Methods

toBS :: Text -> ByteString Source #

ToHeader Text Source # 
Instance details

Defined in Amazonka.Data.Headers

ToLog Text Source # 
Instance details

Defined in Amazonka.Data.Log

ToPath Text Source # 
Instance details

Defined in Amazonka.Data.Path

ToQuery Text Source # 
Instance details

Defined in Amazonka.Data.Query

FromText Text Source # 
Instance details

Defined in Amazonka.Data.Text

ToText Text Source # 
Instance details

Defined in Amazonka.Data.Text

Methods

toText :: Text -> Text Source #

FromXML Text Source # 
Instance details

Defined in Amazonka.Data.XML

ToXML Text Source # 
Instance details

Defined in Amazonka.Data.XML

Methods

toXML :: Text -> XML Source #

Chunk Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

Associated Types

type ChunkElem Text #

FoldCase Text 
Instance details

Defined in Data.CaseInsensitive.Internal

Methods

foldCase :: Text -> Text #

foldCaseList :: [Text] -> [Text]

Hashable Text 
Instance details

Defined in Data.Hashable.Class

Methods

hashWithSalt :: Int -> Text -> Int #

hash :: Text -> Int #

Ixed Text 
Instance details

Defined in Control.Lens.At

Prefixed Text 
Instance details

Defined in Control.Lens.Prism

Methods

prefixed :: Text -> Prism' Text Text #

Suffixed Text 
Instance details

Defined in Control.Lens.Prism

Methods

suffixed :: Text -> Prism' Text Text #

GrowingAppend Text 
Instance details

Defined in Data.MonoTraversable

MonoFoldable Text 
Instance details

Defined in Data.MonoTraversable

Methods

ofoldMap :: Monoid m => (Element Text -> m) -> Text -> m #

ofoldr :: (Element Text -> b -> b) -> b -> Text -> b #

ofoldl' :: (a -> Element Text -> a) -> a -> Text -> a #

otoList :: Text -> [Element Text] #

oall :: (Element Text -> Bool) -> Text -> Bool #

oany :: (Element Text -> Bool) -> Text -> Bool #

onull :: Text -> Bool #

olength :: Text -> Int #

olength64 :: Text -> Int64 #

ocompareLength :: Integral i => Text -> i -> Ordering #

otraverse_ :: Applicative f => (Element Text -> f b) -> Text -> f () #

ofor_ :: Applicative f => Text -> (Element Text -> f b) -> f () #

omapM_ :: Applicative m => (Element Text -> m ()) -> Text -> m () #

oforM_ :: Applicative m => Text -> (Element Text -> m ()) -> m () #

ofoldlM :: Monad m => (a -> Element Text -> m a) -> a -> Text -> m a #

ofoldMap1Ex :: Semigroup m => (Element Text -> m) -> Text -> m #

ofoldr1Ex :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text #

ofoldl1Ex' :: (Element Text -> Element Text -> Element Text) -> Text -> Element Text #

headEx :: Text -> Element Text #

lastEx :: Text -> Element Text #

unsafeHead :: Text -> Element Text #

unsafeLast :: Text -> Element Text #

maximumByEx :: (Element Text -> Element Text -> Ordering) -> Text -> Element Text #

minimumByEx :: (Element Text -> Element Text -> Ordering) -> Text -> Element Text #

oelem :: Element Text -> Text -> Bool #

onotElem :: Element Text -> Text -> Bool #

MonoFunctor Text 
Instance details

Defined in Data.MonoTraversable

Methods

omap :: (Element Text -> Element Text) -> Text -> Text #

MonoPointed Text 
Instance details

Defined in Data.MonoTraversable

Methods

opoint :: Element Text -> Text #

MonoTraversable Text 
Instance details

Defined in Data.MonoTraversable

Methods

otraverse :: Applicative f => (Element Text -> f (Element Text)) -> Text -> f Text #

omapM :: Applicative m => (Element Text -> m (Element Text)) -> Text -> m Text #

IsSequence Text 
Instance details

Defined in Data.Sequences

Methods

fromList :: [Element Text] -> Text #

lengthIndex :: Text -> Index Text #

break :: (Element Text -> Bool) -> Text -> (Text, Text) #

span :: (Element Text -> Bool) -> Text -> (Text, Text) #

dropWhile :: (Element Text -> Bool) -> Text -> Text #

takeWhile :: (Element Text -> Bool) -> Text -> Text #

splitAt :: Index Text -> Text -> (Text, Text) #

unsafeSplitAt :: Index Text -> Text -> (Text, Text) #

take :: Index Text -> Text -> Text #

unsafeTake :: Index Text -> Text -> Text #

drop :: Index Text -> Text -> Text #

unsafeDrop :: Index Text -> Text -> Text #

dropEnd :: Index Text -> Text -> Text #

partition :: (Element Text -> Bool) -> Text -> (Text, Text) #

uncons :: Text -> Maybe (Element Text, Text) #

unsnoc :: Text -> Maybe (Text, Element Text) #

filter :: (Element Text -> Bool) -> Text -> Text #

filterM :: Monad m => (Element Text -> m Bool) -> Text -> m Text #

replicate :: Index Text -> Element Text -> Text #

replicateM :: Monad m => Index Text -> m (Element Text) -> m Text #

groupBy :: (Element Text -> Element Text -> Bool) -> Text -> [Text] #

groupAllOn :: Eq b => (Element Text -> b) -> Text -> [Text] #

subsequences :: Text -> [Text] #

permutations :: Text -> [Text] #

tailEx :: Text -> Text #

tailMay :: Text -> Maybe Text #

initEx :: Text -> Text #

initMay :: Text -> Maybe Text #

unsafeTail :: Text -> Text #

unsafeInit :: Text -> Text #

index :: Text -> Index Text -> Maybe (Element Text) #

indexEx :: Text -> Index Text -> Element Text #

unsafeIndex :: Text -> Index Text -> Element Text #

splitWhen :: (Element Text -> Bool) -> Text -> [Text] #

SemiSequence Text 
Instance details

Defined in Data.Sequences

Associated Types

type Index Text #

Textual Text 
Instance details

Defined in Data.Sequences

Methods

words :: Text -> [Text] #

unwords :: (Element seq ~ Text, MonoFoldable seq) => seq -> Text #

lines :: Text -> [Text] #

unlines :: (Element seq ~ Text, MonoFoldable seq) => seq -> Text #

toLower :: Text -> Text #

toUpper :: Text -> Text #

toCaseFold :: Text -> Text #

breakWord :: Text -> (Text, Text) #

breakLine :: Text -> (Text, Text) #

Extract Text

Since: regex-base-0.94.0.0

Instance details

Defined in Text.Regex.Base.RegexLike

Methods

before :: Int -> Text -> Text #

after :: Int -> Text -> Text #

empty :: Text #

extract :: (Int, Int) -> Text -> Text #

LazySequence Text Text 
Instance details

Defined in Data.Sequences

Utf8 Text ByteString 
Instance details

Defined in Data.Sequences

Cons Text Text Char Char 
Instance details

Defined in Control.Lens.Cons

Methods

_Cons :: Prism Text Text (Char, Text) (Char, Text) #

Snoc Text Text Char Char 
Instance details

Defined in Control.Lens.Cons

Methods

_Snoc :: Prism Text Text (Text, Char) (Text, Char) #

type ChunkElem Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

type State Text 
Instance details

Defined in Data.Attoparsec.Internal.Types

type State Text = Buffer
type Item Text 
Instance details

Defined in Data.Text

type Item Text = Char
type Index Text 
Instance details

Defined in Control.Lens.At

type Index Text = Int
type IxValue Text 
Instance details

Defined in Control.Lens.At

type Element Text 
Instance details

Defined in Data.MonoTraversable

type Index Text 
Instance details

Defined in Data.Sequences

type Index Text = Int

Deserialisation

class FromText a where Source #

Instances

Instances details
FromText Base64 Source # 
Instance details

Defined in Amazonka.Data.Base64

FromText Abbrev Source # 
Instance details

Defined in Amazonka.Types

FromText AccessKey Source # 
Instance details

Defined in Amazonka.Types

FromText ErrorCode Source # 
Instance details

Defined in Amazonka.Types

FromText ErrorMessage Source # 
Instance details

Defined in Amazonka.Types

FromText Region Source # 
Instance details

Defined in Amazonka.Types

FromText RequestId Source # 
Instance details

Defined in Amazonka.Types

FromText Seconds Source # 
Instance details

Defined in Amazonka.Types

FromText SecretKey Source # 
Instance details

Defined in Amazonka.Types

FromText SessionToken Source # 
Instance details

Defined in Amazonka.Types

FromText Int64 Source # 
Instance details

Defined in Amazonka.Data.Text

FromText ByteString Source # 
Instance details

Defined in Amazonka.Data.Text

FromText StdMethod Source # 
Instance details

Defined in Amazonka.Data.Text

FromText Scientific Source # 
Instance details

Defined in Amazonka.Data.Text

FromText Text Source # 
Instance details

Defined in Amazonka.Data.Text

FromText String Source # 
Instance details

Defined in Amazonka.Data.Text

FromText Integer Source # 
Instance details

Defined in Amazonka.Data.Text

FromText Natural Source # 
Instance details

Defined in Amazonka.Data.Text

FromText Bool Source # 
Instance details

Defined in Amazonka.Data.Text

FromText Char Source # 
Instance details

Defined in Amazonka.Data.Text

FromText Double Source # 
Instance details

Defined in Amazonka.Data.Text

FromText Int Source # 
Instance details

Defined in Amazonka.Data.Text

FromText a => FromText (Sensitive a) Source # 
Instance details

Defined in Amazonka.Data.Sensitive

FromText (Time fmt) Source # 
Instance details

Defined in Amazonka.Data.Time

Methods

fromText :: Text -> Either String (Time fmt) Source #

(FoldCase a, FromText a) => FromText (CI a) Source # 
Instance details

Defined in Amazonka.Data.Text

Methods

fromText :: Text -> Either String (CI a) Source #

Serialisation

class ToText a where Source #

Methods

toText :: a -> Text Source #

Instances

Instances details
ToText Base64 Source # 
Instance details

Defined in Amazonka.Data.Base64

Methods

toText :: Base64 -> Text Source #

ToText AWSTime Source # 
Instance details

Defined in Amazonka.Data.Time

Methods

toText :: AWSTime -> Text Source #

ToText BasicTime Source # 
Instance details

Defined in Amazonka.Data.Time

ToText ISO8601 Source # 
Instance details

Defined in Amazonka.Data.Time

Methods

toText :: ISO8601 -> Text Source #

ToText POSIX Source # 
Instance details

Defined in Amazonka.Data.Time

Methods

toText :: POSIX -> Text Source #

ToText RFC822 Source # 
Instance details

Defined in Amazonka.Data.Time

Methods

toText :: RFC822 -> Text Source #

ToText Abbrev Source # 
Instance details

Defined in Amazonka.Types

Methods

toText :: Abbrev -> Text Source #

ToText AccessKey Source # 
Instance details

Defined in Amazonka.Types

ToText ErrorCode Source # 
Instance details

Defined in Amazonka.Types

ToText ErrorMessage Source # 
Instance details

Defined in Amazonka.Types

ToText Region Source # 
Instance details

Defined in Amazonka.Types

Methods

toText :: Region -> Text Source #

ToText RequestId Source # 
Instance details

Defined in Amazonka.Types

ToText Seconds Source # 
Instance details

Defined in Amazonka.Types

Methods

toText :: Seconds -> Text Source #

ToText SecretKey Source # 
Instance details

Defined in Amazonka.Types

ToText SessionToken Source # 
Instance details

Defined in Amazonka.Types

ToText Int64 Source # 
Instance details

Defined in Amazonka.Data.Text

Methods

toText :: Int64 -> Text Source #

ToText ByteString Source # 
Instance details

Defined in Amazonka.Data.Text

ToText StdMethod Source # 
Instance details

Defined in Amazonka.Data.Text

ToText Scientific Source # 
Instance details

Defined in Amazonka.Data.Text

ToText Text Source # 
Instance details

Defined in Amazonka.Data.Text

Methods

toText :: Text -> Text Source #

ToText String Source # 
Instance details

Defined in Amazonka.Data.Text

Methods

toText :: String -> Text Source #

ToText Integer Source # 
Instance details

Defined in Amazonka.Data.Text

Methods

toText :: Integer -> Text Source #

ToText Natural Source # 
Instance details

Defined in Amazonka.Data.Text

Methods

toText :: Natural -> Text Source #

ToText Bool Source # 
Instance details

Defined in Amazonka.Data.Text

Methods

toText :: Bool -> Text Source #

ToText Char Source # 
Instance details

Defined in Amazonka.Data.Text

Methods

toText :: Char -> Text Source #

ToText Double Source # 
Instance details

Defined in Amazonka.Data.Text

Methods

toText :: Double -> Text Source #

ToText Int Source # 
Instance details

Defined in Amazonka.Data.Text

Methods

toText :: Int -> Text Source #

ToText a => ToText (Sensitive a) Source # 
Instance details

Defined in Amazonka.Data.Sensitive

Methods

toText :: Sensitive a -> Text Source #

ToText a => ToText (CI a) Source # 
Instance details

Defined in Amazonka.Data.Text

Methods

toText :: CI a -> Text Source #

ToText (Digest a) Source # 
Instance details

Defined in Amazonka.Data.Text

Methods

toText :: Digest a -> Text Source #

toTextCI :: ToText a => a -> CI Text Source #