| Safe Haskell | None | 
|---|---|
| Language | Haskell2010 | 
Text.RE.TestBench
- newtype MacroID = MacroID {- getMacroID :: String
 
- data RegexType
- isTDFA :: RegexType -> Bool
- isPCRE :: RegexType -> Bool
- presentRegexType :: RegexType -> String
- type MacroEnv = HashMap MacroID MacroDescriptor
- data WithCaptures
- data MacroDescriptor = MacroDescriptor {- _md_source :: !RegexSource
- _md_samples :: ![String]
- _md_counter_samples :: ![String]
- _md_test_results :: ![TestResult]
- _md_parser :: !(Maybe FunctionID)
- _md_description :: !String
 
- newtype TestResult = TestResult {}
- newtype RegexSource = RegexSource {}
- newtype FunctionID = FunctionID {}
- mkMacros :: (Monad m, Functor m) => (String -> m r) -> RegexType -> WithCaptures -> MacroEnv -> m (Macros r)
- testMacroEnv :: String -> RegexType -> MacroEnv -> IO Bool
- badMacros :: MacroEnv -> [MacroID]
- runTests :: (Eq a, Show a) => RegexType -> (String -> Maybe a) -> [(String, a)] -> MacroEnv -> MacroID -> MacroDescriptor -> MacroDescriptor
- runTests' :: (Eq a, Show a) => RegexType -> (Match String -> Maybe a) -> [(String, a)] -> MacroEnv -> MacroID -> MacroDescriptor -> MacroDescriptor
- formatMacroTable :: RegexType -> MacroEnv -> String
- dumpMacroTable :: String -> RegexType -> MacroEnv -> IO ()
- formatMacroSummary :: RegexType -> MacroEnv -> MacroID -> String
- formatMacroSources :: RegexType -> WithCaptures -> MacroEnv -> String
- formatMacroSource :: RegexType -> WithCaptures -> MacroEnv -> MacroID -> String
- testMacroDescriptors :: [MacroDescriptor] -> [TestResult]
- mdRegexSource :: RegexType -> WithCaptures -> MacroEnv -> MacroDescriptor -> String
Documentation
Constructors
| MacroID | |
| Fields 
 | |
what kind of back end will be compiling the RE, and its match function
presentRegexType :: RegexType -> String Source #
type MacroEnv = HashMap MacroID MacroDescriptor Source #
each macro can reference others, the whole environment being required for each macro, so we use a Lazy HashMap
data WithCaptures Source #
do we need the captures in the RE or whould they be stripped out where possible
Constructors
| InclCaptures | |
| ExclCaptures | 
Instances
data MacroDescriptor Source #
describes a macro, giving the text of the RE and a si=ummary description
Constructors
| MacroDescriptor | |
| Fields 
 | |
Instances
newtype TestResult Source #
list of failures on a validation run
Constructors
| TestResult | |
| Fields | |
Instances
newtype RegexSource Source #
a RE that should work for POSIX and PCRE with open brackets ('(') represented as follows: ( mere symbol (?: used for grouping only, not for captures (}: used for captures only, not for grouping (]: used for captures and grouping ( do not modify
Constructors
| RegexSource | |
| Fields | |
Instances
newtype FunctionID Source #
name of the Haskell parser function for parsing the text matched by a macro
Constructors
| FunctionID | |
| Fields | |
Instances
mkMacros :: (Monad m, Functor m) => (String -> m r) -> RegexType -> WithCaptures -> MacroEnv -> m (Macros r) Source #
runTests :: (Eq a, Show a) => RegexType -> (String -> Maybe a) -> [(String, a)] -> MacroEnv -> MacroID -> MacroDescriptor -> MacroDescriptor Source #
runTests' :: (Eq a, Show a) => RegexType -> (Match String -> Maybe a) -> [(String, a)] -> MacroEnv -> MacroID -> MacroDescriptor -> MacroDescriptor Source #
formatMacroSources :: RegexType -> WithCaptures -> MacroEnv -> String Source #
formatMacroSource :: RegexType -> WithCaptures -> MacroEnv -> MacroID -> String Source #
testMacroDescriptors :: [MacroDescriptor] -> [TestResult] Source #
mdRegexSource :: RegexType -> WithCaptures -> MacroEnv -> MacroDescriptor -> String Source #