- 18 Nov, 2004 3 commits
- 17 Nov, 2004 8 commits
-
-
ross authored
GHC-only tests: signals002 uses Handlers forkprocess01 forkProcess timeexts001 tests obsolete library net002 non-blocking I/O thurston-modular-arith GHC-only scoped type variables
-
ross authored
update Hugs output
-
ross authored
add explicit import of Control.Monad.Fix
-
ross authored
update output (though the alpha one looks out-of-date)
-
ross authored
add Hugs output (different error messages, H98-style printing of Rationals)
-
ross authored
catch other exceptions (e.g. overflow and pattern match failure), and add take's to the tests for () -- GHC produces the wrong results for enumFromThen () () and enumFromThenTo () () ().
-
ross authored
catch other exceptions (e.g. overflow)
-
ross authored
update output: GHC loses some output before an exception due to its implementation of hPutStr.
-
- 16 Nov, 2004 3 commits
- 15 Nov, 2004 1 commit
-
-
simonpj authored
Update output
-
- 14 Nov, 2004 1 commit
-
-
ross authored
Hugs doesn't implement multiple-reader single-writer locking on files.
-
- 13 Nov, 2004 1 commit
-
-
ross authored
update Hugs output
-
- 12 Nov, 2004 10 commits
-
-
ross authored
update Hugs output
-
ross authored
hGetBuf001 is GHC-only (uses throwTo for timeout)
-
ross authored
another documented Hugs bug: tcfail030 (empty file)
-
ross authored
Documented bugs in Hugs: mod154 module M where != module M(module M) where read023 Just.let x=id in x read033 1.0e+x read034 (3 + 4 +) read021 empty file tc084 monomorphism restriction and defaulting tc096 monomorphism restriction and defaulting Also omitted tc144 for Hugs, because it loops.
-
ross authored
these take too long under Hugs
-
ross authored
Hugs produces slightly different output on these
-
ross authored
Hugs versions of various error messages
-
ross authored
config file for Hugs
-
ross authored
tc168 is GHC-only (tests -ddump-types output)
-
ross authored
conc013 is GHC-only (compares ThreadIds)
-
- 11 Nov, 2004 6 commits
-
-
ross authored
GHC's Show instance for Ratio is slightly different from Haskell 98
-
simonpj authored
Accept output
-
simonpj authored
Add comments
-
ross authored
added more module tests from the Hugs testsuite, and merged mod200 into mod154, which tests the same thing.
-
ross authored
get hSetBinaryMode from System.IO
-
ross authored
no longer needs -package lang
-
- 10 Nov, 2004 2 commits
- 09 Nov, 2004 5 commits
-
-
ross authored
mark GHC-specific tests
-
ross authored
mark the following failures as GHC-specific: ds052 hReady001 tc175 tcfail080
-
ross authored
mark groups of tests as GHC-only, as they test GHC-specific features.
-
ross authored
Rename several .stderr files to .stderr-ghc, because in each case the output consists of GHC-only warnings.
-
ross authored
More compiler_type support: added the option functions omit_compiler_types(compilers) skip this test for certain compilers only_compiler_types(compilers) do this test for certain compilers only expect_fail_if_compiler_type(compiler) expect failure from a certain compiler and also use output files ending in -<compiler_type> if present.
-