Safe Haskell | None |
---|---|
Language | Haskell2010 |
This module allows to prove statements in tasty.
Synopsis
- testStatement :: (Testable a, Provable a) => TestName -> a -> TestTree
- newtype SbvPrintBase = SbvPrintBase Int
- newtype SbvPrintRealPrec = SbvPrintRealPrec Int
- newtype SbvValidateModel = SbvValidateModel Bool
- newtype SbvTranscript = SbvTranscript (Maybe FilePath)
- newtype SbvVerbose = SbvVerbose Bool
- newtype SbvRedirectVerbose = SbvRedirectVerbose (Maybe FilePath)
- newtype SbvSolver = SbvSolver Solver
- newtype SbvQuickCheck = SbvQuickCheck Bool
- data FS = (Testable a, Provable a) => FS a
Documentation
testStatement :: (Testable a, Provable a) => TestName -> a -> TestTree Source #
Create a test that attempts to proves a statement. When checking via QuickCheck is requested, tasty-quickcheck options will be respected.
newtype SbvPrintBase Source #
The base to use for integer literal printing (2, 10, and 16 are supported).
Instances
Eq SbvPrintBase Source # | |
Defined in Test.Tasty.SBV (==) :: SbvPrintBase -> SbvPrintBase -> Bool # (/=) :: SbvPrintBase -> SbvPrintBase -> Bool # | |
Ord SbvPrintBase Source # | |
Defined in Test.Tasty.SBV compare :: SbvPrintBase -> SbvPrintBase -> Ordering # (<) :: SbvPrintBase -> SbvPrintBase -> Bool # (<=) :: SbvPrintBase -> SbvPrintBase -> Bool # (>) :: SbvPrintBase -> SbvPrintBase -> Bool # (>=) :: SbvPrintBase -> SbvPrintBase -> Bool # max :: SbvPrintBase -> SbvPrintBase -> SbvPrintBase # min :: SbvPrintBase -> SbvPrintBase -> SbvPrintBase # | |
Show SbvPrintBase Source # | |
Defined in Test.Tasty.SBV showsPrec :: Int -> SbvPrintBase -> ShowS # show :: SbvPrintBase -> String # showList :: [SbvPrintBase] -> ShowS # | |
IsOption SbvPrintBase Source # | |
Defined in Test.Tasty.SBV |
newtype SbvPrintRealPrec Source #
The precision to print real values with (SReal, default is 16).
Instances
Eq SbvPrintRealPrec Source # | |
Defined in Test.Tasty.SBV (==) :: SbvPrintRealPrec -> SbvPrintRealPrec -> Bool # (/=) :: SbvPrintRealPrec -> SbvPrintRealPrec -> Bool # | |
Ord SbvPrintRealPrec Source # | |
Defined in Test.Tasty.SBV compare :: SbvPrintRealPrec -> SbvPrintRealPrec -> Ordering # (<) :: SbvPrintRealPrec -> SbvPrintRealPrec -> Bool # (<=) :: SbvPrintRealPrec -> SbvPrintRealPrec -> Bool # (>) :: SbvPrintRealPrec -> SbvPrintRealPrec -> Bool # (>=) :: SbvPrintRealPrec -> SbvPrintRealPrec -> Bool # max :: SbvPrintRealPrec -> SbvPrintRealPrec -> SbvPrintRealPrec # min :: SbvPrintRealPrec -> SbvPrintRealPrec -> SbvPrintRealPrec # | |
Show SbvPrintRealPrec Source # | |
Defined in Test.Tasty.SBV showsPrec :: Int -> SbvPrintRealPrec -> ShowS # show :: SbvPrintRealPrec -> String # showList :: [SbvPrintRealPrec] -> ShowS # | |
IsOption SbvPrintRealPrec Source # | |
newtype SbvValidateModel Source #
If sbv
should attempt to validate the model it gets back from the solver.
Instances
Eq SbvValidateModel Source # | |
Defined in Test.Tasty.SBV (==) :: SbvValidateModel -> SbvValidateModel -> Bool # (/=) :: SbvValidateModel -> SbvValidateModel -> Bool # | |
Ord SbvValidateModel Source # | |
Defined in Test.Tasty.SBV compare :: SbvValidateModel -> SbvValidateModel -> Ordering # (<) :: SbvValidateModel -> SbvValidateModel -> Bool # (<=) :: SbvValidateModel -> SbvValidateModel -> Bool # (>) :: SbvValidateModel -> SbvValidateModel -> Bool # (>=) :: SbvValidateModel -> SbvValidateModel -> Bool # max :: SbvValidateModel -> SbvValidateModel -> SbvValidateModel # min :: SbvValidateModel -> SbvValidateModel -> SbvValidateModel # | |
Show SbvValidateModel Source # | |
Defined in Test.Tasty.SBV showsPrec :: Int -> SbvValidateModel -> ShowS # show :: SbvValidateModel -> String # showList :: [SbvValidateModel] -> ShowS # | |
IsOption SbvValidateModel Source # | |
newtype SbvTranscript Source #
Where and if sbv
should save a replayble transcript.
Instances
Eq SbvTranscript Source # | |
Defined in Test.Tasty.SBV (==) :: SbvTranscript -> SbvTranscript -> Bool # (/=) :: SbvTranscript -> SbvTranscript -> Bool # | |
Ord SbvTranscript Source # | |
Defined in Test.Tasty.SBV compare :: SbvTranscript -> SbvTranscript -> Ordering # (<) :: SbvTranscript -> SbvTranscript -> Bool # (<=) :: SbvTranscript -> SbvTranscript -> Bool # (>) :: SbvTranscript -> SbvTranscript -> Bool # (>=) :: SbvTranscript -> SbvTranscript -> Bool # max :: SbvTranscript -> SbvTranscript -> SbvTranscript # min :: SbvTranscript -> SbvTranscript -> SbvTranscript # | |
Show SbvTranscript Source # | |
Defined in Test.Tasty.SBV showsPrec :: Int -> SbvTranscript -> ShowS # show :: SbvTranscript -> String # showList :: [SbvTranscript] -> ShowS # | |
IsOption SbvTranscript Source # | |
Defined in Test.Tasty.SBV |
newtype SbvVerbose Source #
Verbose debug output.
Instances
Eq SbvVerbose Source # | |
Defined in Test.Tasty.SBV (==) :: SbvVerbose -> SbvVerbose -> Bool # (/=) :: SbvVerbose -> SbvVerbose -> Bool # | |
Ord SbvVerbose Source # | |
Defined in Test.Tasty.SBV compare :: SbvVerbose -> SbvVerbose -> Ordering # (<) :: SbvVerbose -> SbvVerbose -> Bool # (<=) :: SbvVerbose -> SbvVerbose -> Bool # (>) :: SbvVerbose -> SbvVerbose -> Bool # (>=) :: SbvVerbose -> SbvVerbose -> Bool # max :: SbvVerbose -> SbvVerbose -> SbvVerbose # min :: SbvVerbose -> SbvVerbose -> SbvVerbose # | |
Show SbvVerbose Source # | |
Defined in Test.Tasty.SBV showsPrec :: Int -> SbvVerbose -> ShowS # show :: SbvVerbose -> String # showList :: [SbvVerbose] -> ShowS # | |
IsOption SbvVerbose Source # | |
Defined in Test.Tasty.SBV |
newtype SbvRedirectVerbose Source #
If we should save the verbose output to a file instead of printing to stdout, and what it is.
Instances
Eq SbvRedirectVerbose Source # | |
Defined in Test.Tasty.SBV (==) :: SbvRedirectVerbose -> SbvRedirectVerbose -> Bool # (/=) :: SbvRedirectVerbose -> SbvRedirectVerbose -> Bool # | |
Ord SbvRedirectVerbose Source # | |
Defined in Test.Tasty.SBV compare :: SbvRedirectVerbose -> SbvRedirectVerbose -> Ordering # (<) :: SbvRedirectVerbose -> SbvRedirectVerbose -> Bool # (<=) :: SbvRedirectVerbose -> SbvRedirectVerbose -> Bool # (>) :: SbvRedirectVerbose -> SbvRedirectVerbose -> Bool # (>=) :: SbvRedirectVerbose -> SbvRedirectVerbose -> Bool # max :: SbvRedirectVerbose -> SbvRedirectVerbose -> SbvRedirectVerbose # min :: SbvRedirectVerbose -> SbvRedirectVerbose -> SbvRedirectVerbose # | |
Show SbvRedirectVerbose Source # | |
Defined in Test.Tasty.SBV showsPrec :: Int -> SbvRedirectVerbose -> ShowS # show :: SbvRedirectVerbose -> String # showList :: [SbvRedirectVerbose] -> ShowS # | |
IsOption SbvRedirectVerbose Source # | |
Which solver sbv
shoul use.
The current options are z3 (the default), yices, boolector, cvc4, mathsat, and abc.
newtype SbvQuickCheck Source #
Check properties with QuickCheck instead of a solver. This allows basic checking of the statement even without a solver installed on the system.
Instances
Eq SbvQuickCheck Source # | |
Defined in Test.Tasty.SBV (==) :: SbvQuickCheck -> SbvQuickCheck -> Bool # (/=) :: SbvQuickCheck -> SbvQuickCheck -> Bool # | |
Ord SbvQuickCheck Source # | |
Defined in Test.Tasty.SBV compare :: SbvQuickCheck -> SbvQuickCheck -> Ordering # (<) :: SbvQuickCheck -> SbvQuickCheck -> Bool # (<=) :: SbvQuickCheck -> SbvQuickCheck -> Bool # (>) :: SbvQuickCheck -> SbvQuickCheck -> Bool # (>=) :: SbvQuickCheck -> SbvQuickCheck -> Bool # max :: SbvQuickCheck -> SbvQuickCheck -> SbvQuickCheck # min :: SbvQuickCheck -> SbvQuickCheck -> SbvQuickCheck # | |
Show SbvQuickCheck Source # | |
Defined in Test.Tasty.SBV showsPrec :: Int -> SbvQuickCheck -> ShowS # show :: SbvQuickCheck -> String # showList :: [SbvQuickCheck] -> ShowS # | |
IsOption SbvQuickCheck Source # | |
Defined in Test.Tasty.SBV |