Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Synopsis
- getSettings :: IO Settings
- data Settings = Settings {
- settingSeed :: !SeedSetting
- settingRandomiseExecutionOrder :: !Bool
- settingThreads :: !Threads
- settingMaxSuccess :: !Int
- settingMaxSize :: !Int
- settingMaxDiscard :: !Int
- settingMaxShrinks :: !Int
- settingGoldenStart :: !Bool
- settingGoldenReset :: !Bool
- settingColour :: !(Maybe Bool)
- settingFilters :: ![Text]
- settingFailFast :: !Bool
- settingIterations :: !Iterations
- settingRetries :: !Word
- settingFailOnFlaky :: !Bool
- settingReportProgress :: !ReportProgress
- settingProfile :: !Bool
- defaultSettings :: Settings
- defaultRetries :: Word
- deriveTerminalCapababilities :: Settings -> IO TerminalCapabilities
- detectTerminalCapabilities :: IO TerminalCapabilities
- data Flags = Flags {
- flagSeed :: !SeedSetting
- flagRandomiseExecutionOrder :: !(Maybe Bool)
- flagThreads :: !(Maybe Threads)
- flagMaxSize :: !Int
- flagMaxSuccess :: !Int
- flagMaxDiscard :: !Int
- flagMaxShrinks :: !Int
- flagGoldenStart :: !Bool
- flagGoldenReset :: !Bool
- flagColour :: !(Maybe Bool)
- flagFilters :: ![Text]
- flagFailFast :: !(Maybe Bool)
- flagIterations :: !Iterations
- flagRetries :: !(Maybe Word)
- flagFailOnFlaky :: !Bool
- flagReportProgress :: !(Maybe ReportProgress)
- flagDebug :: !Bool
- flagProfile :: !Bool
- data Threads
- data Iterations
- data ReportProgress
Documentation
getSettings :: IO Settings Source #
Test suite definition and run settings
Settings | |
|
Instances
Flags | |
|
Instances
Synchronous | One thread |
ByCapabilities | As many threads as |
Asynchronous !Word | A given number of threads |
Instances
HasCodec Threads Source # | |
Defined in Test.Syd.OptParse | |
Generic Threads Source # | |
Read Threads Source # | |
Show Threads Source # | |
Eq Threads Source # | |
HasParser Threads Source # | |
Defined in Test.Syd.OptParse | |
type Rep Threads Source # | |
Defined in Test.Syd.OptParse type Rep Threads = D1 ('MetaData "Threads" "Test.Syd.OptParse" "sydtest-0.18.0.1-Ew5jfYMgc6A6Aos3R0TaKJ" 'False) (C1 ('MetaCons "Synchronous" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "ByCapabilities" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Asynchronous" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Word)))) |
data Iterations Source #
OneIteration | Run the test suite once, the default |
Iterations !Word | Run the test suite for the given number of iterations, or until we can find flakiness |
Continuous | Run the test suite over and over, until we can find some flakiness |
Instances
data ReportProgress Source #
ReportNoProgress | Don't report any progress, the default |
ReportProgress | Report progress |
Instances
Generic ReportProgress Source # | |
Defined in Test.Syd.OptParse type Rep ReportProgress :: Type -> Type # from :: ReportProgress -> Rep ReportProgress x # to :: Rep ReportProgress x -> ReportProgress # | |
Read ReportProgress Source # | |
Defined in Test.Syd.OptParse readsPrec :: Int -> ReadS ReportProgress # readList :: ReadS [ReportProgress] # | |
Show ReportProgress Source # | |
Defined in Test.Syd.OptParse showsPrec :: Int -> ReportProgress -> ShowS # show :: ReportProgress -> String # showList :: [ReportProgress] -> ShowS # | |
Eq ReportProgress Source # | |
Defined in Test.Syd.OptParse (==) :: ReportProgress -> ReportProgress -> Bool # (/=) :: ReportProgress -> ReportProgress -> Bool # | |
HasParser ReportProgress Source # | |
Defined in Test.Syd.OptParse | |
type Rep ReportProgress Source # | |
Defined in Test.Syd.OptParse |