Safe Haskell | None |
---|---|
Language | Haskell2010 |
Text.Regex.TDFA.Sequence
Contents
Description
This modules provides RegexMaker
and RegexLike
instances for using
ByteString
with the DFA backend (Text.Regex.Lib.WrapDFAEngine and
Text.Regex.Lazy.DFAEngineFPS). This module is usually used via
import Text.Regex.TDFA.
This exports instances of the high level API and the medium level
API of compile
,execute
, and regexec
.
Synopsis
- data Regex
- data CompOption
- data ExecOption
- compile :: CompOption -> ExecOption -> Seq Char -> Either String Regex
- execute :: Regex -> Seq Char -> Either String (Maybe MatchArray)
- regexec :: Regex -> Seq Char -> Either String (Maybe (Seq Char, Seq Char, Seq Char, [Seq Char]))
Documentation
The TDFA backend specific Regex
type, used by this module's RegexOptions
and RegexMaker
.
Instances
data CompOption Source #
Control whether the pattern is multiline or case-sensitive like Text.Regex and whether to capture the subgroups (\1, \2, etc). Controls enabling extra anchor syntax.
Instances
data ExecOption Source #
Instances
Arguments
:: CompOption | Flags (summed together) |
-> ExecOption | Flags (summed together) |
-> Seq Char | The regular expression to compile |
-> Either String Regex | Returns: the compiled regular expression |
Arguments
:: Regex | Compiled regular expression |
-> Seq Char | String to match against |
-> Either String (Maybe MatchArray) |
Arguments
:: Regex | Compiled regular expression |
-> Seq Char | String to match against |
-> Either String (Maybe (Seq Char, Seq Char, Seq Char, [Seq Char])) |
Orphan instances
RegexMaker Regex CompOption ExecOption (Seq Char) Source # | |
Methods makeRegex :: Seq Char -> Regex # makeRegexOpts :: CompOption -> ExecOption -> Seq Char -> Regex # makeRegexM :: MonadFail m => Seq Char -> m Regex # makeRegexOptsM :: MonadFail m => CompOption -> ExecOption -> Seq Char -> m Regex # | |
RegexLike Regex (Seq Char) Source # | |
Methods matchOnce :: Regex -> Seq Char -> Maybe MatchArray # matchAll :: Regex -> Seq Char -> [MatchArray] # matchCount :: Regex -> Seq Char -> Int # matchTest :: Regex -> Seq Char -> Bool # matchAllText :: Regex -> Seq Char -> [MatchText (Seq Char)] # matchOnceText :: Regex -> Seq Char -> Maybe (Seq Char, MatchText (Seq Char), Seq Char) # | |
RegexContext Regex (Seq Char) (Seq Char) Source # | |