| Safe Haskell | None | 
|---|---|
| Language | Haskell2010 | 
Test.Tasty.Sugar
Description
Provides test identification by Search Using Golden Answer References. This is similar in principle to Tasty.KAT and Tasty.Golden, but with different input selection processes. The intent is that there are multiple different test scenarios, which may all originate with the same input, and that all scenarios are specified by the presence of an "expected" result file along with optional support files.
A CUBE object is provided to the findSugar function
 which returns an array of Sweets that describe test
 configurations.
The sugarOptions should be added to the tasty Options
 specification, and the sugarIngredients provides additional
 ingredients for the sugar testing (e.g. the ability to use
 --showsearch and see the scan and identification of tests).
The withSugarGroups function can be used to drive the test
 invocations and group the Sweets by parameter values.
Example:
import Test.Tasty as T
import Test.Tasty.Options
import Test.Tasty.Sugar
sugarCube = mkCUBE { inputDir = "test/samples"
                   , rootName = "*.c"
                   , associatedNames = [ ("inputs", "inp") ]
                   , expectedSuffix = "exp"
                   }
ingredients = T.includingOptions sugarOptions :
              sugarIngredients sugarCube <>
              T.defaultIngredients
main =
  do testSweets <- findSugar sugarCube
     T.defaultMainWithIngredients ingredients $
     T.testGroup "sweet tests" $
     withSugarGroups testSweets T.testGroup mkTest
mkTest :: Sweets -> Natural -> Expectation -> T.TestTree
mkTest s n e = testCase (rootMatchName s <> " #" <> show n) $ do
               Just inpF <- lookup "inputs" $ associated e
               inp <- readFile inpF
               exp <- reads <$> readFile $ expectedFile e
               result <- testSomething inp
               result @?= expSee the README for more information.
Synopsis
- sugarOptions :: [OptionDescription]
- sugarIngredients :: [CUBE] -> [Ingredient]
- findSugar :: MonadIO m => CUBE -> m [Sweets]
- findSugarIn :: CUBE -> [FilePath] -> ([Sweets], Doc ann)
- withSugarGroups :: MonadIO m => [Sweets] -> (String -> [a] -> a) -> (Sweets -> Natural -> Expectation -> m [a]) -> m [a]
- data CUBE = CUBE {}
- type Separators = String
- type ParameterPattern = (String, Maybe [String])
- mkCUBE :: CUBE
- data Sweets = Sweets {}
- data Expectation = Expectation {}
- type Association = (String, FilePath)
- type NamedParamMatch = (String, ParamMatch)
- data ParamMatch
- paramMatchVal :: String -> ParamMatch -> Bool
Tasty Options and Ingredients
sugarOptions :: [OptionDescription] Source #
Specify the Sugar-specific Tasty command-line options
sugarIngredients :: [CUBE] -> [Ingredient] Source #
Provides the Tasty Ingredients that can be used to inform the testing process.
Test Generation Functions
findSugar :: MonadIO m => CUBE -> m [Sweets] Source #
Returns a list of the discovered test configurations (Sweets) that should be run. This function is used to get the list of possible test configurations that is passed with the withSugarGroups function to generate the actual tests.
findSugarIn :: CUBE -> [FilePath] -> ([Sweets], Doc ann) Source #
Given a list of files and a CUBE, returns the list of matching test Sweets that should be run, and an explanation of the search process (describing unmatched possibilities as well as valid test configurations).
This is a low-level function; the findSugar and withSugarGroups are the recommended interface functions to use for writing tests.
withSugarGroups :: MonadIO m => [Sweets] -> (String -> [a] -> a) -> (Sweets -> Natural -> Expectation -> m [a]) -> m [a] Source #
The withSugarGroups is the primary function used to run tests.
 Given a list of Sweets returned by findSugar, a function to
 mark a group of tests (usually Tasty.testGroup), and a function
 to generate a number of tests from a Sweets and a specific
 Expectation, this will iterate over the supplied Sweets and
 call the test generator for each valid test configuration.
Note that Sweets contains all expectations ([Expectation]), but
 the passed Expectation is the only one that should be tested for
 this set of generated tests.
withSugarGroups sweets groupFun mkTestFun
where
- groupFunis the function to group a set of tests with a specific name. Typically this can just be 'tasty.testGroup'
- mkTestFunis the function to create any specific tests for the specified expectation. The output type is usually a- [. This is passed the general- TestTree]- Sweets, the specific- Expectationfor the tests that should be created, and a numeric iteration indicating the- Expectationnumber within this group. The iteration number can be used for differentiation against the other tests, but there is no determinate relationship to elements of the- Sweets(such as parameters or associated sets). It is also possible to suppress the generation of any tests for a particular- Expectationby returning an empty list from the- mkTestFun.
Types
Input
Specifies the parameters and patterns to use when searching for
 samples to build tests from.  The mkCUBE function should be used
 to obtain a CUBE structure initialized with overrideable
 defaults.
The primary elements to specify are the rootName and the
 expectedSuffix.  With these two specifications (and possibly the
 inputDir) the Sugar functionality will be similar to
 a "golden" testing package.
The validParams is an optional feature that is useful when
 multiple expected results files are generated from a single
 rootName, differing by the specified parameters.
The associatedNames is an optional feature that is useful for
 when there are other files to be associated with a test in addition
 to the rootFile and the expectedFile.
Constructors
| CUBE | |
| Fields 
 | |
type Separators = String #
Separators for the path and suffix specifications. Any separator is accepted in any position between parameters and prior to the expected suffix. The synonym name is primarily used to indicate where this separators specification is intended to be used.
type ParameterPattern = (String, Maybe [String]) #
Parameters are specified by their name and a possible list of valid values. If there is no list of valid values, any value is accepted for that parameter position. Parameters are listed in the order that they should appear in the filenames to be matched.
Generates the default CUBE configuration; callers should override
 individual fields as appropriate.
Output
Each identified test input set is represented as a Sweets
 object.. a Specifications With Existing Expected Testing Samples.
Constructors
| Sweets | |
| Fields 
 | |
data Expectation #
The Expectation represents a valid test configuration based on
 the set of provided files.  The Expectation consists of an
 expected file which matches the rootFile in the containing
 Sweets data object.  The expectedFile field is the name of the
 file containing expected output, the expParamsMatch field
 specifies the ParameterPattern matching values for this expected
 file, and the associated field provides a list of files
 associated with this expected file.
Constructors
| Expectation | |
| Fields 
 | |
Instances
| Eq Expectation | Equality comparisons of two  | 
| Defined in Test.Tasty.Sugar.Types | |
| Show Expectation | |
| Defined in Test.Tasty.Sugar.Types Methods showsPrec :: Int -> Expectation -> ShowS # show :: Expectation -> String # showList :: [Expectation] -> ShowS # | |
| Pretty Expectation | |
| Defined in Test.Tasty.Sugar.Types | |
type Association = (String, FilePath) #
The Association specifies the name of the associated file entry
 and the actual filepath of that associated file.
type NamedParamMatch = (String, ParamMatch) #
The NamedParamMatch specifies the parameter name and the
 corresponding value for the expected file found.  These can be
 extracted from the name of the expected file and the set of
 ParameterPattern entries, but they are presented in an associated
 list format for easy utilization by the invoked test target.
data ParamMatch #
Indicates the matching parameter value for this identified
 expected test.  If the parameter value is explicitly specified in
 the expected filename, it is an Explicit entry, otherwise it is
 Assumed (for each of the valid ParameterPattern values) or
 NotSpecified if there are no known ParameterPattern values.
Constructors
| Explicit String | This parameter value was explicitly specified in the filename of the expected file. | 
| Assumed String | This parameter value was not specified in the filename of the
 expected file, so the value is being synthetically supplied.
 This is used for parameters that have known values but none is
 present: an  | 
| NotSpecified | This parameter value was not specified in the filename for the
 expected file.  In addition, the associated  | 
Instances
| Eq ParamMatch | |
| Defined in Test.Tasty.Sugar.Types | |
| Show ParamMatch | |
| Defined in Test.Tasty.Sugar.Types Methods showsPrec :: Int -> ParamMatch -> ShowS # show :: ParamMatch -> String # showList :: [ParamMatch] -> ShowS # | |
| Pretty ParamMatch | |
| Defined in Test.Tasty.Sugar.Types | |
paramMatchVal :: String -> ParamMatch -> Bool #
The paramMatchVal function is used to determine if a specific
 value matches the corresponding ParamMatch