text1-0.0.6.1: Non-empty values of `Data.Text`.

Safe HaskellNone
LanguageHaskell2010

Data.Text1

Documentation

data Text1 Source #

Constructors

Text1 Char Text 
Instances
Eq Text1 Source # 
Instance details

Defined in Data.Text1

Methods

(==) :: Text1 -> Text1 -> Bool #

(/=) :: Text1 -> Text1 -> Bool #

Data Text1 Source # 
Instance details

Defined in Data.Text1

Methods

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

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

toConstr :: Text1 -> Constr #

dataTypeOf :: Text1 -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord Text1 Source # 
Instance details

Defined in Data.Text1

Methods

compare :: Text1 -> Text1 -> Ordering #

(<) :: Text1 -> Text1 -> Bool #

(<=) :: Text1 -> Text1 -> Bool #

(>) :: Text1 -> Text1 -> Bool #

(>=) :: Text1 -> Text1 -> Bool #

max :: Text1 -> Text1 -> Text1 #

min :: Text1 -> Text1 -> Text1 #

Show Text1 Source # 
Instance details

Defined in Data.Text1

Methods

showsPrec :: Int -> Text1 -> ShowS #

show :: Text1 -> String #

showList :: [Text1] -> ShowS #

Semigroup Text1 Source # 
Instance details

Defined in Data.Text1

Methods

(<>) :: Text1 -> Text1 -> Text1 #

sconcat :: NonEmpty Text1 -> Text1 #

stimes :: Integral b => b -> Text1 -> Text1 #

Binary Text1 Source # 
Instance details

Defined in Data.Text1

Methods

put :: Text1 -> Put #

get :: Get Text1 #

putList :: [Text1] -> Put #

Reversing Text1 Source # 
Instance details

Defined in Data.Text1

Methods

reversing :: Text1 -> Text1 #

IsText1 Text1 Source # 
Instance details

Defined in Data.Text1

AsSingle Text1 Char Source # 
Instance details

Defined in Data.Text1

AsText1 p f Text1 Source # 
Instance details

Defined in Data.Text1

OneAnd Text1 Text1 Char Char Text Text Source # 
Instance details

Defined in Data.Text1

IsText (Maybe Text1) Source # 
Instance details

Defined in Data.Text1

Cons (Maybe Text1) (Maybe Text1) Char Char Source # 
Instance details

Defined in Data.Text1

Snoc (Maybe Text1) (Maybe Text1) Char Char Source # 
Instance details

Defined in Data.Text1

class AsText1 p f s where Source #

Minimal complete definition

_Text1

Methods

_Text1 :: Optic' p f s Text1 Source #

Instances
(Choice p, Applicative f) => AsText1 p f Text Source # 
Instance details

Defined in Data.Text1

Methods

_Text1 :: Optic' p f Text Text1 Source #

(Choice p, Applicative f) => AsText1 p f String Source # 
Instance details

Defined in Data.Text1

AsText1 p f Text1 Source # 
Instance details

Defined in Data.Text1

(Profunctor p, Functor f) => AsText1 p f (NonEmpty Char) Source # 
Instance details

Defined in Data.Text1

class AsSingle c a | c -> a where Source #

Minimal complete definition

_Single

Methods

_Single :: Prism' c a Source #

Instances
AsSingle Text Char Source # 
Instance details

Defined in Data.Text1

AsSingle Text1 Char Source # 
Instance details

Defined in Data.Text1

AsSingle [a] a Source # 
Instance details

Defined in Data.Text1

Methods

_Single :: Prism' [a] a Source #

AsSingle (Maybe a) a Source # 
Instance details

Defined in Data.Text1

Methods

_Single :: Prism' (Maybe a) a Source #

AsSingle (NonEmpty a) a Source # 
Instance details

Defined in Data.Text1

Methods

_Single :: Prism' (NonEmpty a) a Source #

class OneAnd s t a b x y | s -> a, s -> x, t -> b, t -> y, s b -> t, x b -> t, t a -> s, y a -> s where Source #

Minimal complete definition

_OneAnd

Methods

_OneAnd :: Iso s t (a, x) (b, y) Source #

Instances
OneAnd Text1 Text1 Char Char Text Text Source # 
Instance details

Defined in Data.Text1

OneAnd (NonEmpty a) (NonEmpty b) a b [a] [b] Source # 
Instance details

Defined in Data.Text1

Methods

_OneAnd :: Iso (NonEmpty a) (NonEmpty b) (a, [a]) (b, [b]) Source #