Safe Haskell | None |
---|---|
Language | Haskell2010 |
Text.Regex.TDFA.String
Description
This modules provides RegexMaker
and RegexLike
instances for using
String
with the TDFA backend.
This exports instances of the high level API and the medium level
API of compile
,execute
, and regexec
.
Synopsis
- data Regex
- type MatchOffset = Int
- type MatchLength = Int
- data CompOption
- data ExecOption
- compile :: CompOption -> ExecOption -> String -> Either String Regex
- execute :: Regex -> String -> Either String (Maybe MatchArray)
- regexec :: Regex -> String -> Either String (Maybe (String, String, String, [String]))
Types
The TDFA backend specific Regex
type, used by this module's RegexOptions
and RegexMaker
.
Instances
type MatchOffset = Int #
type MatchLength = Int #
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
Medium level API functions
Arguments
:: CompOption | Flags (summed together) |
-> ExecOption | Flags (summed together) |
-> String | The regular expression to compile (ASCII only, no null bytes) |
-> Either String Regex | Returns: the compiled regular expression |
Arguments
:: Regex | Compiled regular expression |
-> String | String to match against |
-> Either String (Maybe MatchArray) |
Arguments
:: Regex | Compiled regular expression |
-> String | String to match against |
-> Either String (Maybe (String, String, String, [String])) |
Orphan instances
RegexLike Regex String Source # | |
Methods matchOnce :: Regex -> String -> Maybe MatchArray # matchAll :: Regex -> String -> [MatchArray] # matchCount :: Regex -> String -> Int # matchTest :: Regex -> String -> Bool # matchAllText :: Regex -> String -> [MatchText String] # matchOnceText :: Regex -> String -> Maybe (String, MatchText String, String) # | |
RegexContext Regex String String Source # | |
RegexMaker Regex CompOption ExecOption String Source # | |
Methods makeRegex :: String -> Regex # makeRegexOpts :: CompOption -> ExecOption -> String -> Regex # makeRegexM :: MonadFail m => String -> m Regex # makeRegexOptsM :: MonadFail m => CompOption -> ExecOption -> String -> m Regex # |