| Safe Haskell | None | 
|---|---|
| Language | Haskell2010 | 
Text.Regex.PCRE.String
Description
Synopsis
- data Regex
 - type MatchOffset = Int
 - type MatchLength = Int
 - newtype CompOption = CompOption CInt
 - newtype ExecOption = ExecOption CInt
 - data ReturnCode
 - type WrapError = (ReturnCode, String)
 - unusedOffset :: MatchOffset
 - getVersion :: Maybe String
 - compile :: CompOption -> ExecOption -> String -> IO (Either (MatchOffset, String) Regex)
 - execute :: Regex -> String -> IO (Either WrapError (Maybe (Array Int (MatchOffset, MatchLength))))
 - regexec :: Regex -> String -> IO (Either WrapError (Maybe (String, String, String, [String])))
 - compBlank :: CompOption
 - compAnchored :: CompOption
 - compAutoCallout :: CompOption
 - compCaseless :: CompOption
 - compDollarEndOnly :: CompOption
 - compDotAll :: CompOption
 - compExtended :: CompOption
 - compExtra :: CompOption
 - compFirstLine :: CompOption
 - compMultiline :: CompOption
 - compNoAutoCapture :: CompOption
 - compUngreedy :: CompOption
 - compUTF8 :: CompOption
 - compNoUTF8Check :: CompOption
 - execBlank :: ExecOption
 - execAnchored :: ExecOption
 - execNotBOL :: ExecOption
 - execNotEOL :: ExecOption
 - execNotEmpty :: ExecOption
 - execNoUTF8Check :: ExecOption
 - execPartial :: ExecOption
 
Types
A compiled regular expression
Instances
type MatchOffset = Int #
0 based index from start of source, or (-1) for unused
type MatchLength = Int #
non-negative length of a match
newtype CompOption Source #
Constructors
| CompOption CInt | 
Instances
newtype ExecOption Source #
Constructors
| ExecOption CInt | 
Instances
data ReturnCode Source #
Instances
| Eq ReturnCode Source # | |
Defined in Text.Regex.PCRE.Wrap  | |
| Show ReturnCode Source # | |
Defined in Text.Regex.PCRE.Wrap Methods showsPrec :: Int -> ReturnCode -> ShowS # show :: ReturnCode -> String # showList :: [ReturnCode] -> ShowS #  | |
type WrapError = (ReturnCode, String) Source #
Miscellaneous
getVersion :: Maybe String Source #
Version string of PCRE library
NOTE: The Maybe type is used for historic reasons; practically, getVersion is never Nothing.
Medium level API functions
Arguments
| :: CompOption | Flags (summed together)  | 
| -> ExecOption | Flags (summed together)  | 
| -> String | The regular expression to compile  | 
| -> IO (Either (MatchOffset, String) Regex) | Returns: an error string and offset or the compiled regular expression  | 
Compiles a regular expression
Arguments
| :: Regex | Compiled regular expression  | 
| -> String | String to match against  | 
| -> IO (Either WrapError (Maybe (Array Int (MatchOffset, MatchLength)))) | Returns:   | 
Matches a regular expression against a string
Arguments
| :: Regex | compiled regular expression  | 
| -> String | string to match  | 
| -> IO (Either WrapError (Maybe (String, String, String, [String]))) | Returns: Nothing if no match, else (text before match, text after match, array of matches with 0 being the whole match)  | 
execute match and extract substrings rather than just offsets
Constants for CompOption
Constants for ExecOption
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 #  | |