ghc-tickets
Threads by month
- ----- 2025 -----
- May
- April
- March
- February
- January
- ----- 2024 -----
- December
- November
- October
- September
- August
- July
- June
- May
- April
- March
- February
- January
- ----- 2023 -----
- December
- November
- October
- September
- August
- July
- June
- May
- April
- March
- February
- January
- ----- 2022 -----
- December
- November
- October
- September
- August
- July
- June
- May
- April
- March
- February
- January
- ----- 2021 -----
- December
- November
- October
- September
- August
- July
- June
- May
- April
- March
- February
- January
- ----- 2020 -----
- December
- November
- October
- September
- August
- July
- June
- May
- April
- March
- February
- January
- ----- 2019 -----
- December
- November
- October
- September
- August
- July
- June
- May
- April
- March
- February
- January
- ----- 2018 -----
- December
- November
- October
- September
- August
- July
- June
- May
- April
- March
- February
- January
- ----- 2017 -----
- December
- November
- October
- September
- August
- July
- June
- May
- April
- March
- February
- January
- ----- 2016 -----
- December
- November
- October
- September
- August
- July
- June
- May
- April
- March
- February
- January
- ----- 2015 -----
- December
- November
- October
- September
- August
- July
- June
- May
- April
- March
- February
- January
- ----- 2014 -----
- December
- November
- October
- September
- August
- July
- June
- May
- April
- March
- February
- January
- ----- 2013 -----
- December
- November
- October
- September
- August
- July
- June
- May
- April
- March
- February
- January
November 2018
- 1 participants
- 587 discussions
#13535: vector test suite uses excessive memory on GHC 8.2
-------------------------------------+-------------------------------------
Reporter: RyanGlScott | Owner: (none)
Type: bug | Status: new
Priority: highest | Milestone: 8.2.1
Component: Compiler | Version: 8.1
Keywords: | Operating System: Unknown/Multiple
Architecture: | Type of failure: Compile-time
Unknown/Multiple | performance bug
Test Case: | Blocked By:
Blocking: | Related Tickets:
Differential Rev(s): | Wiki Page:
-------------------------------------+-------------------------------------
First noticed
[https://github.com/haskell/vector/pull/161#issuecomment-292031845 here].
I haven't managed to boil this down to a test case with no dependencies
yet, so for the time being, this requires `vector`. To reproduce, follow
these steps:
{{{
$ git clone https://github.com/erikd/vector
$ cd vector/
$ cabal install --only-dependencies --enable-tests -w
/opt/ghc/8.2.1/bin/ghc
$ cabal configure --enable-tests -w /opt/ghc/8.2.1/bin/ghc
$ cabal test
}}}
When building `vector-tests-O2`, GHC will stall when compiling the
`Tests.Vector` module. On machines with modest memory allowances (e.g.,
[https://travis-ci.org/haskell/vector/jobs/218749281#L1270 the machines
used on Travis CI]), GHC will be killed with an out-of-memory error after
trying to compile `Tests.Vector` for a while.
--
Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/13535>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler
1
61

30 Nov '18
#14230: Gruesome kind mismatch errors for associated data family instances
-------------------------------------+-------------------------------------
Reporter: RyanGlScott | Owner: (none)
Type: bug | Status: new
Priority: normal | Milestone:
Component: Compiler | Version: 8.3
(Type checker) |
Keywords: TypeInType | Operating System: Unknown/Multiple
Architecture: | Type of failure: Poor/confusing
Unknown/Multiple | error message
Test Case: | Blocked By:
Blocking: | Related Tickets: #14175
Differential Rev(s): | Wiki Page:
-------------------------------------+-------------------------------------
Spun off from https://ghc.haskell.org/trac/ghc/ticket/14175#comment:9.
This program, which can only really be compiled on GHC HEAD at the moment:
{{{#!hs
{-# LANGUAGE GADTs #-}
{-# LANGUAGE PolyKinds #-}
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE TypeFamilies #-}
module Bug where
class C k where
data CD :: k -> k -> *
instance C (Maybe a) where
data CD :: (k -> *) -> (k -> *) -> *
}}}
Gives a heinous error message:
{{{
Bug.hs:11:3: error:
• Expected kind ‘(k -> *) -> (k -> *) -> *’,
but ‘CD :: (k -> *) -> (k -> *) -> *’ has kind ‘Maybe a
-> Maybe a -> *’
• In the data instance declaration for ‘CD’
In the instance declaration for ‘C (Maybe a)’
|
11 | data CD :: (k -> *) -> (k -> *) -> *
| ^^^^^^^
}}}
* We shouldn't be expecting kind `(k -> *) -> (k -> *) -> *`, but rather
kind `Maybe a -> Maybe a -> *`, due to the instance head itself.
* The phrase `‘CD :: (k -> *) -> (k -> *) -> *’ has kind ‘Maybe -> Maybe a
-> *’` is similarly confusing. This doesn't point out that the real issue
is the use of `(k -> *)`.
Another program in a similar vein:
{{{#!hs
{-# LANGUAGE GADTs #-}
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE TypeInType #-}
module Bug where
import Data.Kind
class C a where
data CD k (a :: k) :: k -> *
instance C (Maybe a) where
data CD k (a :: k -> *) :: (k -> *) -> *
}}}
{{{
Bug.hs:13:3: error:
• Expected kind ‘(k -> *) -> *’,
but ‘CD k (a :: k -> *) :: (k -> *) -> *’ has kind ‘k -> *’
• In the data instance declaration for ‘CD’
In the instance declaration for ‘C (Maybe a)’
|
13 | data CD k (a :: k -> *) :: (k -> *) -> *
| ^^^^^^^^^^^^^^^^^^^^^^^
}}}
This error message is further muddled by the incorrect use of `k` as the
first type pattern (instead of `k -> *`, as subsequent kind signatures
would suggest).
--
Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/14230>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler
1
7

[GHC] #13492: -p option report much less time than actual on high intensity of FFI calls application
by GHC 30 Nov '18
by GHC 30 Nov '18
30 Nov '18
#13492: -p option report much less time than actual on high intensity of FFI calls
application
-------------------------------------+-------------------------------------
Reporter: varosi | Owner: (none)
Type: bug | Status: new
Priority: normal | Milestone:
Component: Profiling | Version: 8.0.2
Keywords: | Operating System: Windows
Architecture: x86_64 | Type of failure: Debugging
(amd64) | information is incorrect
Test Case: | Blocked By:
Blocking: | Related Tickets:
Differential Rev(s): | Wiki Page:
-------------------------------------+-------------------------------------
Proprietary application is ran on 44 cores (88 with HT) machine (same
problem on 12 core). It is Haskell between wxHaskell (wxWidgets for UI)
and C API. It is doing FFI calls most of the time. Calls are not so many,
but possibly not so fast. I'm trying to profile where is the problem, in
which calls. But very strange behaviour is there. "total time" of
application that is running 30secs to 1min is showing 0.33secs. Even MAIN
function is not 100%.
Please, see first part of .prof file:
Tue Mar 28 15:38 2017 Time and Allocation Profiling Report
(Final)
app.exe +RTS -N -A40m -qb0 -p -RTS
total time = 0.33 secs (325 ticks @ 1000 us, 1
processor)
total alloc = 86,317,264 bytes (excludes profiling overheads)
COST CENTRE MODULE SRC
%time %alloc
MAIN MAIN <built-
in> 12.6 2.2
--
Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/13492>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler
1
7
#15862: Typeable panic with promoted rank-2 kind (initDs)
-------------------------------------+-------------------------------------
Reporter: RyanGlScott | Owner: (none)
Type: bug | Status: new
Priority: normal | Milestone:
Component: Compiler | Version: 8.6.1
Keywords: Typeable | Operating System: Unknown/Multiple
Architecture: | Type of failure: Compile-time
Unknown/Multiple | crash or panic
Test Case: | Blocked By:
Blocking: | Related Tickets:
Differential Rev(s): | Wiki Page:
-------------------------------------+-------------------------------------
The following program panics on GHC 8.2 and later:
{{{#!hs
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE ImpredicativeTypes #-}
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE TypeApplications #-}
module Bug where
import Type.Reflection
newtype Foo = MkFoo (forall a. a)
foo :: TypeRep MkFoo
foo = typeRep @MkFoo
}}}
{{{
$ /opt/ghc/8.6.1/bin/ghc Bug.hs
[1 of 1] Compiling Bug ( Bug.hs, Bug.o )
GHC error in desugarer lookup in Bug:
attempting to use module ‘main:Bug’ (Bug.hs) which is not loaded
ghc: panic! (the 'impossible' happened)
(GHC version 8.6.1 for x86_64-unknown-linux):
initDs
}}}
--
Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/15862>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler
1
7
#15978: slow test suite failures on 8.6 DARWIN :
-------------------------------------+-------------------------------------
Reporter: carter | Owner: (none)
Type: bug | Status: new
Priority: normal | Milestone: 8.6.3
Component: Compiler | Version: 8.6.2
Keywords: | Operating System: Unknown/Multiple
Architecture: | Type of failure: None/Unknown
Unknown/Multiple |
Test Case: | Blocked By:
Blocking: | Related Tickets:
Differential Rev(s): | Wiki Page:
-------------------------------------+-------------------------------------
step to reproduce
{{{
cd testsuite;
make slow TEST="EtaExpandLevPoly ManyAlternatives ManyConstructors
MultiLayerModules T10370 T11535 T12707 T13379 T13701 T13719 T14683 T14697
T14936 T15349 T4334 T6132 T7702 T9203 T9630 ghci063 haddock.Cabal
haddock.base haddock.compiler hpc_fork signals004 space_leak_001"
}}}
{{{
=====> T11535(normal) 1 of 26 [0, 0, 0]
cd "./deriving/should_run/T11535.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -o
T11535 T11535.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-
warn-missed-specialisations -fshow-warning-groups -fdiagnostics-
color=never -fno-diagnostics-show-caret -dno-debug-output
cd "./deriving/should_run/T11535.run" && ./T11535
=====> T11535(hpc) 1 of 26 [0, 0, 0]
cd "./deriving/should_run/T11535.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -o
T11535 T11535.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-
warn-missed-specialisations -fshow-warning-groups -fdiagnostics-
color=never -fno-diagnostics-show-caret -dno-debug-output -O -fhpc
cd "./deriving/should_run/T11535.run" && ./T11535
=====> T11535(optasm) 1 of 26 [0, 0, 0]
cd "./deriving/should_run/T11535.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -o
T11535 T11535.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-
warn-missed-specialisations -fshow-warning-groups -fdiagnostics-
color=never -fno-diagnostics-show-caret -dno-debug-output -O -fasm
cd "./deriving/should_run/T11535.run" && ./T11535
=====> T11535(profasm) 1 of 26 [0, 0, 0]
cd "./deriving/should_run/T11535.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -o
T11535 T11535.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-
warn-missed-specialisations -fshow-warning-groups -fdiagnostics-
color=never -fno-diagnostics-show-caret -dno-debug-output -O -prof
-static -fprof-auto
cd "./deriving/should_run/T11535.run" && ./T11535 +RTS -hc -p -RTS
cd "./deriving/should_run/T11535.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/hp2ps" T11535
=====> T11535(ghci) 1 of 26 [0, 0, 0]
cd "./deriving/should_run/T11535.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" T11535.hs
-dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-missed-
specialisations -fshow-warning-groups -fdiagnostics-color=never -fno-
diagnostics-show-caret -dno-debug-output --interactive -v0 -ignore-dot-
ghci -fno-ghci-history -fghci-leak-check +RTS -I0.1 -RTS <
T11535.genscript
Wrong exit code for T11535(ghci) (expected 0 , actual 134 )
*** unexpected failure for T11535(ghci)
=====> T11535(threaded1) 1 of 26 [0, 1, 0]
cd "./deriving/should_run/T11535.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -o
T11535 T11535.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-
warn-missed-specialisations -fshow-warning-groups -fdiagnostics-
color=never -fno-diagnostics-show-caret -dno-debug-output -threaded
-debug
cd "./deriving/should_run/T11535.run" && ./T11535
=====> T11535(threaded2) 1 of 26 [0, 1, 0]
cd "./deriving/should_run/T11535.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -o
T11535 T11535.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-
warn-missed-specialisations -fshow-warning-groups -fdiagnostics-
color=never -fno-diagnostics-show-caret -dno-debug-output -O -threaded
-eventlog
cd "./deriving/should_run/T11535.run" && ./T11535 +RTS -N2 -ls -RTS
=====> T11535(dyn) 1 of 26 [0, 1, 0]
cd "./deriving/should_run/T11535.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -o
T11535 T11535.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-
warn-missed-specialisations -fshow-warning-groups -fdiagnostics-
color=never -fno-diagnostics-show-caret -dno-debug-output -O -dynamic
cd "./deriving/should_run/T11535.run" && ./T11535
=====> T11535(profthreaded) 1 of 26 [0, 1, 0]
cd "./deriving/should_run/T11535.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -o
T11535 T11535.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-
warn-missed-specialisations -fshow-warning-groups -fdiagnostics-
color=never -fno-diagnostics-show-caret -dno-debug-output -O -prof
-static -fprof-auto -threaded
cd "./deriving/should_run/T11535.run" && ./T11535 +RTS -p -RTS
=====> ghci063(ghci) 2 of 26 [0, 1, 0]
cd "./ghci/scripts/ghci063.run" && HC="/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" HC_OPTS
="-dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-missed-
specialisations -fshow-warning-groups -fdiagnostics-color=never -fno-
diagnostics-show-caret -dno-debug-output " "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2"
-dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-missed-
specialisations -fshow-warning-groups -fdiagnostics-color=never -fno-
diagnostics-show-caret -dno-debug-output --interactive -v0 -ignore-dot-
ghci -fno-ghci-history -fghci-leak-check +RTS -I0.1 -RTS < ghci063.script
Actual stderr output differs from expected:
diff -uw "/dev/null"
"./ghci/scripts/ghci063.run/ghci063.run.stderr.normalised"
--- /dev/null 2018-11-30 11:28:25.000000000 -0500
+++ ./ghci/scripts/ghci063.run/ghci063.run.stderr.normalised 2018-11-30
11:28:26.000000000 -0500
@@ -0,0 +1,2 @@
+
+B.hs:1:1: parse error on input ‘***’
*** unexpected failure for ghci063(ghci)
=====> T10370(optasm) 3 of 26 [0, 2, 0]
cd "./perf/compiler/T10370.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -c
T10370.hs -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output +RTS -G1 -RTS -O -fasm +RTS -V0
-tT10370.comp.stats --machine-readable -RTS
max_bytes_used value is too high:
Expected T10370(optasm) max_bytes_used: 31524048 +/-15%
Lower bound T10370(optasm) max_bytes_used: 26795440
Upper bound T10370(optasm) max_bytes_used: 36252656
Actual T10370(optasm) max_bytes_used: 36718312
Deviation T10370(optasm) max_bytes_used: 16.5 %
peak_megabytes_allocated value is too high:
Expected T10370(optasm) peak_megabytes_allocated: 117 +/-15%
Lower bound T10370(optasm) peak_megabytes_allocated: 99
Upper bound T10370(optasm) peak_megabytes_allocated: 135
Actual T10370(optasm) peak_megabytes_allocated: 137
Deviation T10370(optasm) peak_megabytes_allocated: 17.1 %
*** unexpected stat test failure for T10370(optasm)
=====> T12707(normal) 4 of 26 [0, 2, 0]
cd "./perf/compiler/T12707.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -c
T12707.hs -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output +RTS -V0 -tT12707.comp.stats --machine-readable
-RTS
=====> T12707(hpc) 4 of 26 [0, 2, 0]
cd "./perf/compiler/T12707.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -c
T12707.hs -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output -O -fhpc +RTS -V0 -tT12707.comp.stats --machine-
readable -RTS
bytes allocated value is too high:
Expected T12707(hpc) bytes allocated: 1141555816 +/-5%
Lower bound T12707(hpc) bytes allocated: 1084478025
Upper bound T12707(hpc) bytes allocated: 1198633607
Actual T12707(hpc) bytes allocated: 3332600544
Deviation T12707(hpc) bytes allocated: 191.9 %
*** unexpected stat test failure for T12707(hpc)
=====> T12707(optasm) 4 of 26 [0, 2, 0]
cd "./perf/compiler/T12707.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -c
T12707.hs -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output -O -fasm +RTS -V0 -tT12707.comp.stats --machine-
readable -RTS
bytes allocated value is too high:
Expected T12707(optasm) bytes allocated: 1141555816 +/-5%
Lower bound T12707(optasm) bytes allocated: 1084478025
Upper bound T12707(optasm) bytes allocated: 1198633607
Actual T12707(optasm) bytes allocated: 3552770216
Deviation T12707(optasm) bytes allocated: 211.2 %
*** unexpected stat test failure for T12707(optasm)
=====> T12707(profasm) 4 of 26 [0, 2, 0]
cd "./perf/compiler/T12707.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -c
T12707.hs -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output -O -prof -static -fprof-auto +RTS -V0
-tT12707.comp.stats --machine-readable -RTS
bytes allocated value is too high:
Expected T12707(profasm) bytes allocated: 1141555816 +/-5%
Lower bound T12707(profasm) bytes allocated: 1084478025
Upper bound T12707(profasm) bytes allocated: 1198633607
Actual T12707(profasm) bytes allocated: 4024687592
Deviation T12707(profasm) bytes allocated: 252.6 %
*** unexpected stat test failure for T12707(profasm)
=====> T13379(normal) 5 of 26 [0, 2, 0]
cd "./perf/compiler/T13379.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -c
T13379.hs -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output +RTS -V0 -tT13379.comp.stats --machine-readable
-RTS
=====> T13379(hpc) 5 of 26 [0, 2, 0]
cd "./perf/compiler/T13379.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -c
T13379.hs -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output -O -fhpc +RTS -V0 -tT13379.comp.stats --machine-
readable -RTS
bytes allocated value is too high:
Expected T13379(hpc) bytes allocated: 453166912 +/-10%
Lower bound T13379(hpc) bytes allocated: 407850220
Upper bound T13379(hpc) bytes allocated: 498483604
Actual T13379(hpc) bytes allocated: 1840473752
Deviation T13379(hpc) bytes allocated: 306.1 %
*** unexpected stat test failure for T13379(hpc)
=====> T13379(optasm) 5 of 26 [0, 2, 0]
cd "./perf/compiler/T13379.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -c
T13379.hs -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output -O -fasm +RTS -V0 -tT13379.comp.stats --machine-
readable -RTS
=====> T13379(profasm) 5 of 26 [0, 2, 0]
cd "./perf/compiler/T13379.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -c
T13379.hs -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output -O -prof -static -fprof-auto +RTS -V0
-tT13379.comp.stats --machine-readable -RTS
=====> MultiLayerModules(normal) 6 of 26 [0, 2, 0]
cd "./perf/compiler/MultiLayerModules.run" && ./genMultiLayerModules
cd "./perf/compiler/MultiLayerModules.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" --make MultiLayerModules -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -v0 +RTS -V0
-tMultiLayerModules.comp.stats --machine-readable -RTS
=====> MultiLayerModules(hpc) 6 of 26 [0, 2, 0]
cd "./perf/compiler/MultiLayerModules.run" && ./genMultiLayerModules
cd "./perf/compiler/MultiLayerModules.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" --make MultiLayerModules -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -O -fhpc -v0 +RTS -V0
-tMultiLayerModules.comp.stats --machine-readable -RTS
Timeout happened...killed process "cd
"./perf/compiler/MultiLayerModules.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2"
--make MultiLayerModules -no-user-package-db -rtsopts -fno-warn-missed-
specialisations -fshow-warning-groups -fdiagnostics-color=never -fno-
diagnostics-show-caret -dno-debug-output -O -fhpc -v0 +RTS -V0
-tMultiLayerModules.comp.stats --machine-readable -RTS"...
Compile failed (exit code 99) errors were:
Failed to find field: bytes allocated
*** framework failure for MultiLayerModules(hpc) 'NoneType' object has no
attribute 'group'
Traceback (most recent call last):
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 788, in test_common_work
do_test(name, way, func, args, files)
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 873, in do_test
result = func(*[name,way] + args)
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 1004, in multimod_compile
return do_compile( name, way, 0, top_mod, [], extra_hc_opts )
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 1023, in do_compile
result = simple_build(name, way, extra_hc_opts, should_fail, top_mod,
0, 1, **kwargs)
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 1235, in simple_build
statsResult = checkStats(name, way, stats_file,
opts.compiler_stats_range_fields)
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 1125, in checkStats
val = int(m.group(1))
AttributeError: 'NoneType' object has no attribute 'group'
=====> MultiLayerModules(optasm) 6 of 26 [0, 2, 1]
cd "./perf/compiler/MultiLayerModules.run" && ./genMultiLayerModules
cd "./perf/compiler/MultiLayerModules.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" --make MultiLayerModules -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -O -fasm -v0 +RTS -V0
-tMultiLayerModules.comp.stats --machine-readable -RTS
bytes allocated value is too high:
Expected MultiLayerModules(optasm) bytes allocated: 5619893176
+/-10%
Lower bound MultiLayerModules(optasm) bytes allocated: 5057903858
Upper bound MultiLayerModules(optasm) bytes allocated: 6181882494
Actual MultiLayerModules(optasm) bytes allocated: 6362463680
Deviation MultiLayerModules(optasm) bytes allocated: 13.2 %
*** unexpected stat test failure for MultiLayerModules(optasm)
=====> MultiLayerModules(profasm) 6 of 26 [0, 2, 1]
cd "./perf/compiler/MultiLayerModules.run" && ./genMultiLayerModules
cd "./perf/compiler/MultiLayerModules.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" --make MultiLayerModules -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -O -prof -static -fprof-
auto -v0 +RTS -V0 -tMultiLayerModules.comp.stats --machine-readable -RTS
Timeout happened...killed process "cd
"./perf/compiler/MultiLayerModules.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2"
--make MultiLayerModules -no-user-package-db -rtsopts -fno-warn-missed-
specialisations -fshow-warning-groups -fdiagnostics-color=never -fno-
diagnostics-show-caret -dno-debug-output -O -prof -static -fprof-auto -v0
+RTS -V0 -tMultiLayerModules.comp.stats --machine-readable -RTS"...
Compile failed (exit code 99) errors were:
Failed to find field: bytes allocated
*** framework failure for MultiLayerModules(profasm) 'NoneType' object has
no attribute 'group'
Traceback (most recent call last):
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 788, in test_common_work
do_test(name, way, func, args, files)
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 873, in do_test
result = func(*[name,way] + args)
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 1004, in multimod_compile
return do_compile( name, way, 0, top_mod, [], extra_hc_opts )
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 1023, in do_compile
result = simple_build(name, way, extra_hc_opts, should_fail, top_mod,
0, 1, **kwargs)
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 1235, in simple_build
statsResult = checkStats(name, way, stats_file,
opts.compiler_stats_range_fields)
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 1125, in checkStats
val = int(m.group(1))
AttributeError: 'NoneType' object has no attribute 'group'
=====> ManyConstructors(normal) 7 of 26 [0, 2, 2]
cd "./perf/compiler/ManyConstructors.run" && ./genManyConstructors
cd "./perf/compiler/ManyConstructors.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2"
--make ManyConstructors -no-user-package-db -rtsopts -fno-warn-missed-
specialisations -fshow-warning-groups -fdiagnostics-color=never -fno-
diagnostics-show-caret -dno-debug-output -v0 +RTS -V0
-tManyConstructors.comp.stats --machine-readable -RTS
=====> ManyConstructors(hpc) 7 of 26 [0, 2, 2]
cd "./perf/compiler/ManyConstructors.run" && ./genManyConstructors
cd "./perf/compiler/ManyConstructors.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2"
--make ManyConstructors -no-user-package-db -rtsopts -fno-warn-missed-
specialisations -fshow-warning-groups -fdiagnostics-color=never -fno-
diagnostics-show-caret -dno-debug-output -O -fhpc -v0 +RTS -V0
-tManyConstructors.comp.stats --machine-readable -RTS
bytes allocated value is too high:
Expected ManyConstructors(hpc) bytes allocated: 4246959352 +/-10%
Lower bound ManyConstructors(hpc) bytes allocated: 3822263416
Upper bound ManyConstructors(hpc) bytes allocated: 4671655288
Actual ManyConstructors(hpc) bytes allocated: 9359235576
Deviation ManyConstructors(hpc) bytes allocated: 120.4 %
*** unexpected stat test failure for ManyConstructors(hpc)
=====> ManyConstructors(optasm) 7 of 26 [0, 2, 2]
cd "./perf/compiler/ManyConstructors.run" && ./genManyConstructors
cd "./perf/compiler/ManyConstructors.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2"
--make ManyConstructors -no-user-package-db -rtsopts -fno-warn-missed-
specialisations -fshow-warning-groups -fdiagnostics-color=never -fno-
diagnostics-show-caret -dno-debug-output -O -fasm -v0 +RTS -V0
-tManyConstructors.comp.stats --machine-readable -RTS
bytes allocated value is too high:
Expected ManyConstructors(optasm) bytes allocated: 4246959352
+/-10%
Lower bound ManyConstructors(optasm) bytes allocated: 3822263416
Upper bound ManyConstructors(optasm) bytes allocated: 4671655288
Actual ManyConstructors(optasm) bytes allocated: 9348447040
Deviation ManyConstructors(optasm) bytes allocated: 120.1 %
*** unexpected stat test failure for ManyConstructors(optasm)
=====> ManyConstructors(profasm) 7 of 26 [0, 2, 2]
cd "./perf/compiler/ManyConstructors.run" && ./genManyConstructors
cd "./perf/compiler/ManyConstructors.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2"
--make ManyConstructors -no-user-package-db -rtsopts -fno-warn-missed-
specialisations -fshow-warning-groups -fdiagnostics-color=never -fno-
diagnostics-show-caret -dno-debug-output -O -prof -static -fprof-auto -v0
+RTS -V0 -tManyConstructors.comp.stats --machine-readable -RTS
bytes allocated value is too high:
Expected ManyConstructors(profasm) bytes allocated: 4246959352
+/-10%
Lower bound ManyConstructors(profasm) bytes allocated: 3822263416
Upper bound ManyConstructors(profasm) bytes allocated: 4671655288
Actual ManyConstructors(profasm) bytes allocated: 11167847640
Deviation ManyConstructors(profasm) bytes allocated: 163.0 %
*** unexpected stat test failure for ManyConstructors(profasm)
=====> ManyAlternatives(normal) 8 of 26 [0, 2, 2]
cd "./perf/compiler/ManyAlternatives.run" && ./genManyAlternatives
cd "./perf/compiler/ManyAlternatives.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2"
--make ManyAlternatives -no-user-package-db -rtsopts -fno-warn-missed-
specialisations -fshow-warning-groups -fdiagnostics-color=never -fno-
diagnostics-show-caret -dno-debug-output -v0 +RTS -V0
-tManyAlternatives.comp.stats --machine-readable -RTS
=====> ManyAlternatives(hpc) 8 of 26 [0, 2, 2]
cd "./perf/compiler/ManyAlternatives.run" && ./genManyAlternatives
cd "./perf/compiler/ManyAlternatives.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2"
--make ManyAlternatives -no-user-package-db -rtsopts -fno-warn-missed-
specialisations -fshow-warning-groups -fdiagnostics-color=never -fno-
diagnostics-show-caret -dno-debug-output -O -fhpc -v0 +RTS -V0
-tManyAlternatives.comp.stats --machine-readable -RTS
bytes allocated value is too high:
Expected ManyAlternatives(hpc) bytes allocated: 1398898072 +/-10%
Lower bound ManyAlternatives(hpc) bytes allocated: 1259008264
Upper bound ManyAlternatives(hpc) bytes allocated: 1538787880
Actual ManyAlternatives(hpc) bytes allocated: 2101087728
Deviation ManyAlternatives(hpc) bytes allocated: 50.2 %
*** unexpected stat test failure for ManyAlternatives(hpc)
=====> ManyAlternatives(optasm) 8 of 26 [0, 2, 2]
cd "./perf/compiler/ManyAlternatives.run" && ./genManyAlternatives
cd "./perf/compiler/ManyAlternatives.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2"
--make ManyAlternatives -no-user-package-db -rtsopts -fno-warn-missed-
specialisations -fshow-warning-groups -fdiagnostics-color=never -fno-
diagnostics-show-caret -dno-debug-output -O -fasm -v0 +RTS -V0
-tManyAlternatives.comp.stats --machine-readable -RTS
bytes allocated value is too high:
Expected ManyAlternatives(optasm) bytes allocated: 1398898072
+/-10%
Lower bound ManyAlternatives(optasm) bytes allocated: 1259008264
Upper bound ManyAlternatives(optasm) bytes allocated: 1538787880
Actual ManyAlternatives(optasm) bytes allocated: 2069547176
Deviation ManyAlternatives(optasm) bytes allocated: 47.9 %
*** unexpected stat test failure for ManyAlternatives(optasm)
=====> ManyAlternatives(profasm) 8 of 26 [0, 2, 2]
cd "./perf/compiler/ManyAlternatives.run" && ./genManyAlternatives
cd "./perf/compiler/ManyAlternatives.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2"
--make ManyAlternatives -no-user-package-db -rtsopts -fno-warn-missed-
specialisations -fshow-warning-groups -fdiagnostics-color=never -fno-
diagnostics-show-caret -dno-debug-output -O -prof -static -fprof-auto -v0
+RTS -V0 -tManyAlternatives.comp.stats --machine-readable -RTS
bytes allocated value is too high:
Expected ManyAlternatives(profasm) bytes allocated: 1398898072
+/-10%
Lower bound ManyAlternatives(profasm) bytes allocated: 1259008264
Upper bound ManyAlternatives(profasm) bytes allocated: 1538787880
Actual ManyAlternatives(profasm) bytes allocated: 2191392512
Deviation ManyAlternatives(profasm) bytes allocated: 56.7 %
*** unexpected stat test failure for ManyAlternatives(profasm)
=====> T13701(normal) 9 of 26 [0, 2, 2]
cd "./perf/compiler/T13701.run" && ./genT13701
cd "./perf/compiler/T13701.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" --make
T13701 -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output -v0 +RTS -V0 -tT13701.comp.stats --machine-
readable -RTS
=====> T13701(hpc) 9 of 26 [0, 2, 2]
cd "./perf/compiler/T13701.run" && ./genT13701
cd "./perf/compiler/T13701.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" --make
T13701 -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output -O -fhpc -v0 +RTS -V0 -tT13701.comp.stats
--machine-readable -RTS
Timeout happened...killed process "cd "./perf/compiler/T13701.run" &&
"/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/inplace/test spaces/ghc-stage2" --make T13701 -no-user-package-db
-rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-O -fhpc -v0 +RTS -V0 -tT13701.comp.stats --machine-readable -RTS"...
Compile failed (exit code 99) errors were:
Failed to find field: bytes allocated
*** framework failure for T13701(hpc) 'NoneType' object has no attribute
'group'
Traceback (most recent call last):
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 788, in test_common_work
do_test(name, way, func, args, files)
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 873, in do_test
result = func(*[name,way] + args)
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 1004, in multimod_compile
return do_compile( name, way, 0, top_mod, [], extra_hc_opts )
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 1023, in do_compile
result = simple_build(name, way, extra_hc_opts, should_fail, top_mod,
0, 1, **kwargs)
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 1235, in simple_build
statsResult = checkStats(name, way, stats_file,
opts.compiler_stats_range_fields)
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 1125, in checkStats
val = int(m.group(1))
AttributeError: 'NoneType' object has no attribute 'group'
=====> T13701(optasm) 9 of 26 [0, 2, 3]
cd "./perf/compiler/T13701.run" && ./genT13701
cd "./perf/compiler/T13701.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" --make
T13701 -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output -O -fasm -v0 +RTS -V0 -tT13701.comp.stats
--machine-readable -RTS
bytes allocated value is too high:
Expected T13701(optasm) bytes allocated: 2549206272 +/-10%
Lower bound T13701(optasm) bytes allocated: 2294285644
Upper bound T13701(optasm) bytes allocated: 2804126900
Actual T13701(optasm) bytes allocated: 3222935032
Deviation T13701(optasm) bytes allocated: 26.4 %
*** unexpected stat test failure for T13701(optasm)
=====> T13701(profasm) 9 of 26 [0, 2, 3]
cd "./perf/compiler/T13701.run" && ./genT13701
cd "./perf/compiler/T13701.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" --make
T13701 -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output -O -prof -static -fprof-auto -v0 +RTS -V0
-tT13701.comp.stats --machine-readable -RTS
Timeout happened...killed process "cd "./perf/compiler/T13701.run" &&
"/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/inplace/test spaces/ghc-stage2" --make T13701 -no-user-package-db
-rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-O -prof -static -fprof-auto -v0 +RTS -V0 -tT13701.comp.stats --machine-
readable -RTS"...
Compile failed (exit code 99) errors were:
Failed to find field: bytes allocated
*** framework failure for T13701(profasm) 'NoneType' object has no
attribute 'group'
Traceback (most recent call last):
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 788, in test_common_work
do_test(name, way, func, args, files)
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 873, in do_test
result = func(*[name,way] + args)
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 1004, in multimod_compile
return do_compile( name, way, 0, top_mod, [], extra_hc_opts )
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 1023, in do_compile
result = simple_build(name, way, extra_hc_opts, should_fail, top_mod,
0, 1, **kwargs)
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 1235, in simple_build
statsResult = checkStats(name, way, stats_file,
opts.compiler_stats_range_fields)
File "/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/testsuite/driver/testlib.py", line 1125, in checkStats
val = int(m.group(1))
AttributeError: 'NoneType' object has no attribute 'group'
=====> T13719(normal) 10 of 26 [0, 2, 4]
cd "./perf/compiler/T13719.run" && ./genT13719
cd "./perf/compiler/T13719.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" --make
T13719 -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output -v0 +RTS -V0 -tT13719.comp.stats --machine-
readable -RTS
=====> T13719(hpc) 10 of 26 [0, 2, 4]
cd "./perf/compiler/T13719.run" && ./genT13719
cd "./perf/compiler/T13719.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" --make
T13719 -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output -O -fhpc -v0 +RTS -V0 -tT13719.comp.stats
--machine-readable -RTS
bytes allocated value is too high:
Expected T13719(hpc) bytes allocated: 5187889872 +/-10%
Lower bound T13719(hpc) bytes allocated: 4669100884
Upper bound T13719(hpc) bytes allocated: 5706678860
Actual T13719(hpc) bytes allocated: 6491534040
Deviation T13719(hpc) bytes allocated: 25.1 %
*** unexpected stat test failure for T13719(hpc)
=====> T13719(optasm) 10 of 26 [0, 2, 4]
cd "./perf/compiler/T13719.run" && ./genT13719
cd "./perf/compiler/T13719.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" --make
T13719 -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output -O -fasm -v0 +RTS -V0 -tT13719.comp.stats
--machine-readable -RTS
bytes allocated value is too high:
Expected T13719(optasm) bytes allocated: 5187889872 +/-10%
Lower bound T13719(optasm) bytes allocated: 4669100884
Upper bound T13719(optasm) bytes allocated: 5706678860
Actual T13719(optasm) bytes allocated: 6008103400
Deviation T13719(optasm) bytes allocated: 15.8 %
*** unexpected stat test failure for T13719(optasm)
=====> T13719(profasm) 10 of 26 [0, 2, 4]
cd "./perf/compiler/T13719.run" && ./genT13719
cd "./perf/compiler/T13719.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" --make
T13719 -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output -O -prof -static -fprof-auto -v0 +RTS -V0
-tT13719.comp.stats --machine-readable -RTS
bytes allocated value is too high:
Expected T13719(profasm) bytes allocated: 5187889872 +/-10%
Lower bound T13719(profasm) bytes allocated: 4669100884
Upper bound T13719(profasm) bytes allocated: 5706678860
Actual T13719(profasm) bytes allocated: 6613843944
Deviation T13719(profasm) bytes allocated: 27.5 %
*** unexpected stat test failure for T13719(profasm)
=====> T14697(normal) 11 of 26 [0, 2, 4]
cd "./perf/compiler/T14697.run" && ./genT14697
cd "./perf/compiler/T14697.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" --make
T14697 -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output $(cat T14697-flags) -v0 +RTS -V0
-tT14697.comp.stats --machine-readable -RTS
=====> T14697(hpc) 11 of 26 [0, 2, 4]
cd "./perf/compiler/T14697.run" && ./genT14697
cd "./perf/compiler/T14697.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" --make
T14697 -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output $(cat T14697-flags) -O -fhpc -v0 +RTS -V0
-tT14697.comp.stats --machine-readable -RTS
bytes allocated value is too high:
Expected T14697(hpc) bytes allocated: 371030912 +/-10%
Lower bound T14697(hpc) bytes allocated: 333927820
Upper bound T14697(hpc) bytes allocated: 408134004
Actual T14697(hpc) bytes allocated: 589481848
Deviation T14697(hpc) bytes allocated: 58.9 %
*** unexpected stat test failure for T14697(hpc)
=====> T14697(optasm) 11 of 26 [0, 2, 4]
cd "./perf/compiler/T14697.run" && ./genT14697
cd "./perf/compiler/T14697.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" --make
T14697 -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output $(cat T14697-flags) -O -fasm -v0 +RTS -V0
-tT14697.comp.stats --machine-readable -RTS
bytes allocated value is too high:
Expected T14697(optasm) bytes allocated: 371030912 +/-10%
Lower bound T14697(optasm) bytes allocated: 333927820
Upper bound T14697(optasm) bytes allocated: 408134004
Actual T14697(optasm) bytes allocated: 434183536
Deviation T14697(optasm) bytes allocated: 17.0 %
*** unexpected stat test failure for T14697(optasm)
=====> T14697(profasm) 11 of 26 [0, 2, 4]
cd "./perf/compiler/T14697.run" && ./genT14697
cd "./perf/compiler/T14697.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" --make
T14697 -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output $(cat T14697-flags) -O -prof -static -fprof-auto
-v0 +RTS -V0 -tT14697.comp.stats --machine-readable -RTS
bytes allocated value is too high:
Expected T14697(profasm) bytes allocated: 371030912 +/-10%
Lower bound T14697(profasm) bytes allocated: 333927820
Upper bound T14697(profasm) bytes allocated: 408134004
Actual T14697(profasm) bytes allocated: 595098104
Deviation T14697(profasm) bytes allocated: 60.4 %
*** unexpected stat test failure for T14697(profasm)
=====> T14683(normal) 12 of 26 [0, 2, 4]
cd "./perf/compiler/T14683.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" --make
T14683 -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output -v0 +RTS -V0 -tT14683.comp.stats --machine-
readable -RTS
=====> T14683(hpc) 12 of 26 [0, 2, 4]
cd "./perf/compiler/T14683.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" --make
T14683 -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output -O -fhpc -v0 +RTS -V0 -tT14683.comp.stats
--machine-readable -RTS
bytes allocated value is too high:
Expected T14683(hpc) bytes allocated: 10521594688 +/-10%
Lower bound T14683(hpc) bytes allocated: 9469435219
Upper bound T14683(hpc) bytes allocated: 11573754157
Actual T14683(hpc) bytes allocated: 24859356896
Deviation T14683(hpc) bytes allocated: 136.3 %
*** unexpected stat test failure for T14683(hpc)
=====> T14683(optasm) 12 of 26 [0, 2, 4]
cd "./perf/compiler/T14683.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" --make
T14683 -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output -O -fasm -v0 +RTS -V0 -tT14683.comp.stats
--machine-readable -RTS
bytes allocated value is too high:
Expected T14683(optasm) bytes allocated: 10521594688 +/-10%
Lower bound T14683(optasm) bytes allocated: 9469435219
Upper bound T14683(optasm) bytes allocated: 11573754157
Actual T14683(optasm) bytes allocated: 24961281960
Deviation T14683(optasm) bytes allocated: 137.2 %
*** unexpected stat test failure for T14683(optasm)
=====> T14683(profasm) 12 of 26 [0, 2, 4]
cd "./perf/compiler/T14683.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" --make
T14683 -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output -O -prof -static -fprof-auto -v0 +RTS -V0
-tT14683.comp.stats --machine-readable -RTS
bytes allocated value is too high:
Expected T14683(profasm) bytes allocated: 10521594688 +/-10%
Lower bound T14683(profasm) bytes allocated: 9469435219
Upper bound T14683(profasm) bytes allocated: 11573754157
Actual T14683(profasm) bytes allocated: 23501401952
Deviation T14683(profasm) bytes allocated: 123.4 %
*** unexpected stat test failure for T14683(profasm)
=====> T9630(normal) 13 of 26 [0, 2, 4]
cd "./perf/compiler/T9630.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" --make
T9630 -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output -v0 -O +RTS -V0 -tT9630.comp.stats --machine-
readable -RTS
=====> T9630(hpc) 13 of 26 [0, 2, 4]
cd "./perf/compiler/T9630.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" --make
T9630 -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output -O -fhpc -v0 -O +RTS -V0 -tT9630.comp.stats
--machine-readable -RTS
max_bytes_used value is too high:
Expected T9630(hpc) max_bytes_used: 35324712 +/-15%
Lower bound T9630(hpc) max_bytes_used: 30026005
Upper bound T9630(hpc) max_bytes_used: 40623419
Actual T9630(hpc) max_bytes_used: 45243520
Deviation T9630(hpc) max_bytes_used: 28.1 %
*** unexpected stat test failure for T9630(hpc)
=====> T9630(optasm) 13 of 26 [0, 2, 4]
cd "./perf/compiler/T9630.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" --make
T9630 -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output -O -fasm -v0 -O +RTS -V0 -tT9630.comp.stats
--machine-readable -RTS
=====> T9630(profasm) 13 of 26 [0, 2, 4]
cd "./perf/compiler/T9630.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" --make
T9630 -no-user-package-db -rtsopts -fno-warn-missed-specialisations
-fshow-warning-groups -fdiagnostics-color=never -fno-diagnostics-show-
caret -dno-debug-output -O -prof -static -fprof-auto -v0 -O +RTS -V0
-tT9630.comp.stats --machine-readable -RTS
max_bytes_used value is too high:
Expected T9630(profasm) max_bytes_used: 35324712 +/-15%
Lower bound T9630(profasm) max_bytes_used: 30026005
Upper bound T9630(profasm) max_bytes_used: 40623419
Actual T9630(profasm) max_bytes_used: 47703656
Deviation T9630(profasm) max_bytes_used: 35.0 %
*** unexpected stat test failure for T9630(profasm)
=====> haddock.base(normal) 14 of 26 [0, 2, 4]
bytes allocated value is too high:
Expected haddock.base(normal) bytes allocated: 26201242752 +/-5%
Lower bound haddock.base(normal) bytes allocated: 24891180614
Upper bound haddock.base(normal) bytes allocated: 27511304890
Actual haddock.base(normal) bytes allocated: 36323781512
Deviation haddock.base(normal) bytes allocated: 38.6 %
*** unexpected stat test failure for haddock.base(normal)
=====> haddock.Cabal(normal) 15 of 26 [0, 2, 4]
bytes allocated value is too high:
Expected haddock.Cabal(normal) bytes allocated: 27520214496 +/-5%
Lower bound haddock.Cabal(normal) bytes allocated: 26144203771
Upper bound haddock.Cabal(normal) bytes allocated: 28896225221
Actual haddock.Cabal(normal) bytes allocated: 39795743696
Deviation haddock.Cabal(normal) bytes allocated: 44.6 %
*** unexpected stat test failure for haddock.Cabal(normal)
=====> haddock.compiler(normal) 16 of 26 [0, 2, 4]
bytes allocated value is too high:
Expected haddock.compiler(normal) bytes allocated: 63038317672
+/-10%
Lower bound haddock.compiler(normal) bytes allocated: 56734485904
Upper bound haddock.compiler(normal) bytes allocated: 69342149440
Actual haddock.compiler(normal) bytes allocated: 156651062064
Deviation haddock.compiler(normal) bytes allocated: 148.5 %
*** unexpected stat test failure for haddock.compiler(normal)
=====> T9203(normal) 17 of 26 [0, 2, 4]
cd "./perf/should_run/T9203.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -o T9203
T9203.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -O2
cd "./perf/should_run/T9203.run" && ./T9203 +RTS -V0 -tT9203.stats
--machine-readable -RTS
bytes allocated value is too low:
(If this is because you have improved GHC, please
update the test so that GHC doesn't regress again)
Expected T9203(normal) bytes allocated: 98360576 +/-5%
Lower bound T9203(normal) bytes allocated: 93442547
Upper bound T9203(normal) bytes allocated: 103278605
Actual T9203(normal) bytes allocated: 46371880
Deviation T9203(normal) bytes allocated: -52.9 %
*** unexpected stat test failure for T9203(normal)
=====> T14936(normal) 18 of 26 [0, 2, 4]
cd "./perf/should_run/T14936.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -o T14936
T14936.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -O2
cd "./perf/should_run/T14936.run" && ./T14936 +RTS -V0 -tT14936.stats
--machine-readable -RTS
=====> T14936(hpc) 18 of 26 [0, 2, 4]
cd "./perf/should_run/T14936.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -o T14936
T14936.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -O -fhpc -O2
cd "./perf/should_run/T14936.run" && ./T14936 +RTS -V0 -tT14936.stats
--machine-readable -RTS
bytes allocated value is too high:
Expected T14936(hpc) bytes allocated: 51792 +/-5%
Lower bound T14936(hpc) bytes allocated: 49202
Upper bound T14936(hpc) bytes allocated: 54382
Actual T14936(hpc) bytes allocated: 1440051256
Deviation T14936(hpc) bytes allocated: 2780351.1 %
*** unexpected stat test failure for T14936(hpc)
=====> T14936(optasm) 18 of 26 [0, 2, 4]
cd "./perf/should_run/T14936.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -o T14936
T14936.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -O -fasm -O2
cd "./perf/should_run/T14936.run" && ./T14936 +RTS -V0 -tT14936.stats
--machine-readable -RTS
=====> T14936(profasm) 18 of 26 [0, 2, 4]
cd "./perf/should_run/T14936.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -o T14936
T14936.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -O -prof -static -fprof-
auto -O2
cd "./perf/should_run/T14936.run" && ./T14936 +RTS -V0 -tT14936.stats
--machine-readable -RTS +RTS -hc -p -RTS
cd "./perf/should_run/T14936.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/hp2ps" T14936
bytes allocated value is too high:
Expected T14936(profasm) bytes allocated: 51792 +/-5%
Lower bound T14936(profasm) bytes allocated: 49202
Upper bound T14936(profasm) bytes allocated: 54382
Actual T14936(profasm) bytes allocated: 56280
Deviation T14936(profasm) bytes allocated: 8.7 %
*** unexpected stat test failure for T14936(profasm)
=====> T14936(ghci) 18 of 26 [0, 2, 4]
cd "./perf/should_run/T14936.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" T14936.hs
-dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-missed-
specialisations -fshow-warning-groups -fdiagnostics-color=never -fno-
diagnostics-show-caret -dno-debug-output --interactive -v0 -ignore-dot-
ghci -fno-ghci-history -fghci-leak-check +RTS -I0.1 -RTS -O2<
T14936.genscript
=====> T14936(threaded1) 18 of 26 [0, 2, 4]
cd "./perf/should_run/T14936.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -o T14936
T14936.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -threaded -debug -O2
cd "./perf/should_run/T14936.run" && ./T14936 +RTS -V0 -tT14936.stats
--machine-readable -RTS
bytes allocated value is too high:
Expected T14936(threaded1) bytes allocated: 51792 +/-5%
Lower bound T14936(threaded1) bytes allocated: 49202
Upper bound T14936(threaded1) bytes allocated: 54382
Actual T14936(threaded1) bytes allocated: 73432
Deviation T14936(threaded1) bytes allocated: 41.8 %
*** unexpected stat test failure for T14936(threaded1)
=====> T14936(threaded2) 18 of 26 [0, 2, 4]
cd "./perf/should_run/T14936.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -o T14936
T14936.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -O -threaded -eventlog -O2
cd "./perf/should_run/T14936.run" && ./T14936 +RTS -V0 -tT14936.stats
--machine-readable -RTS +RTS -N2 -ls -RTS
bytes allocated value is too high:
Expected T14936(threaded2) bytes allocated: 51792 +/-5%
Lower bound T14936(threaded2) bytes allocated: 49202
Upper bound T14936(threaded2) bytes allocated: 54382
Actual T14936(threaded2) bytes allocated: 91320
Deviation T14936(threaded2) bytes allocated: 76.3 %
*** unexpected stat test failure for T14936(threaded2)
=====> T14936(dyn) 18 of 26 [0, 2, 4]
cd "./perf/should_run/T14936.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -o T14936
T14936.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -O -dynamic -O2
cd "./perf/should_run/T14936.run" && ./T14936 +RTS -V0 -tT14936.stats
--machine-readable -RTS
=====> T14936(profthreaded) 18 of 26 [0, 2, 4]
cd "./perf/should_run/T14936.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -o T14936
T14936.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -O -prof -static -fprof-
auto -threaded -O2
cd "./perf/should_run/T14936.run" && ./T14936 +RTS -V0 -tT14936.stats
--machine-readable -RTS +RTS -p -RTS
bytes allocated value is too high:
Expected T14936(profthreaded) bytes allocated: 51792 +/-5%
Lower bound T14936(profthreaded) bytes allocated: 49202
Upper bound T14936(profthreaded) bytes allocated: 54382
Actual T14936(profthreaded) bytes allocated: 126784
Deviation T14936(profthreaded) bytes allocated: 144.8 %
*** unexpected stat test failure for T14936(profthreaded)
=====> space_leak_001(normal) 19 of 26 [0, 2, 4]
cd "./perf/space_leaks/space_leak_001.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o space_leak_001 space_leak_001.hs -dcore-lint -dcmm-lint -no-
user-package-db -rtsopts -fno-warn-missed-specialisations -fshow-warning-
groups -fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-
output
cd "./perf/space_leaks/space_leak_001.run" && ./space_leak_001 +RTS -V0
-tspace_leak_001.stats --machine-readable -RTS
=====> space_leak_001(hpc) 19 of 26 [0, 2, 4]
cd "./perf/space_leaks/space_leak_001.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o space_leak_001 space_leak_001.hs -dcore-lint -dcmm-lint -no-
user-package-db -rtsopts -fno-warn-missed-specialisations -fshow-warning-
groups -fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-
output -O -fhpc
cd "./perf/space_leaks/space_leak_001.run" && ./space_leak_001 +RTS -V0
-tspace_leak_001.stats --machine-readable -RTS
max_bytes_used value is too low:
(If this is because you have improved GHC, please
update the test so that GHC doesn't regress again)
Expected space_leak_001(hpc) max_bytes_used: 440000 +/-15%
Lower bound space_leak_001(hpc) max_bytes_used: 374000
Upper bound space_leak_001(hpc) max_bytes_used: 506000
Actual space_leak_001(hpc) max_bytes_used: 291048
Deviation space_leak_001(hpc) max_bytes_used: -33.9 %
*** unexpected stat test failure for space_leak_001(hpc)
=====> space_leak_001(optasm) 19 of 26 [0, 2, 4]
cd "./perf/space_leaks/space_leak_001.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o space_leak_001 space_leak_001.hs -dcore-lint -dcmm-lint -no-
user-package-db -rtsopts -fno-warn-missed-specialisations -fshow-warning-
groups -fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-
output -O -fasm
cd "./perf/space_leaks/space_leak_001.run" && ./space_leak_001 +RTS -V0
-tspace_leak_001.stats --machine-readable -RTS
max_bytes_used value is too low:
(If this is because you have improved GHC, please
update the test so that GHC doesn't regress again)
Expected space_leak_001(optasm) max_bytes_used: 440000 +/-15%
Lower bound space_leak_001(optasm) max_bytes_used: 374000
Upper bound space_leak_001(optasm) max_bytes_used: 506000
Actual space_leak_001(optasm) max_bytes_used: 291048
Deviation space_leak_001(optasm) max_bytes_used: -33.9 %
*** unexpected stat test failure for space_leak_001(optasm)
=====> space_leak_001(ghci) 19 of 26 [0, 2, 4]
cd "./perf/space_leaks/space_leak_001.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2"
space_leak_001.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts
-fno-warn-missed-specialisations -fshow-warning-groups -fdiagnostics-
color=never -fno-diagnostics-show-caret -dno-debug-output --interactive
-v0 -ignore-dot-ghci -fno-ghci-history -fghci-leak-check +RTS -I0.1 -RTS <
space_leak_001.genscript
=====> space_leak_001(dyn) 19 of 26 [0, 2, 4]
cd "./perf/space_leaks/space_leak_001.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o space_leak_001 space_leak_001.hs -dcore-lint -dcmm-lint -no-
user-package-db -rtsopts -fno-warn-missed-specialisations -fshow-warning-
groups -fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-
output -O -dynamic
cd "./perf/space_leaks/space_leak_001.run" && ./space_leak_001 +RTS -V0
-tspace_leak_001.stats --machine-readable -RTS
max_bytes_used value is too low:
(If this is because you have improved GHC, please
update the test so that GHC doesn't regress again)
Expected space_leak_001(dyn) max_bytes_used: 440000 +/-15%
Lower bound space_leak_001(dyn) max_bytes_used: 374000
Upper bound space_leak_001(dyn) max_bytes_used: 506000
Actual space_leak_001(dyn) max_bytes_used: 291048
Deviation space_leak_001(dyn) max_bytes_used: -33.9 %
*** unexpected stat test failure for space_leak_001(dyn)
=====> T4334(normal) 20 of 26 [0, 2, 4]
cd "./perf/space_leaks/T4334.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -o T4334
T4334.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output
cd "./perf/space_leaks/T4334.run" && ./T4334 +RTS -V0 -tT4334.stats
--machine-readable -RTS 1000000 2 t
=====> T4334(hpc) 20 of 26 [0, 2, 4]
cd "./perf/space_leaks/T4334.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -o T4334
T4334.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -O -fhpc
cd "./perf/space_leaks/T4334.run" && ./T4334 +RTS -V0 -tT4334.stats
--machine-readable -RTS 1000000 2 t
=====> T4334(optasm) 20 of 26 [0, 2, 4]
cd "./perf/space_leaks/T4334.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -o T4334
T4334.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -O -fasm
cd "./perf/space_leaks/T4334.run" && ./T4334 +RTS -V0 -tT4334.stats
--machine-readable -RTS 1000000 2 t
=====> T4334(ghci) 20 of 26 [0, 2, 4]
cd "./perf/space_leaks/T4334.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" T4334.hs
-dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-missed-
specialisations -fshow-warning-groups -fdiagnostics-color=never -fno-
diagnostics-show-caret -dno-debug-output --interactive -v0 -ignore-dot-
ghci -fno-ghci-history -fghci-leak-check +RTS -I0.1 -RTS < T4334.genscript
=====> T4334(threaded1) 20 of 26 [0, 2, 4]
cd "./perf/space_leaks/T4334.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -o T4334
T4334.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -threaded -debug
cd "./perf/space_leaks/T4334.run" && ./T4334 +RTS -V0 -tT4334.stats
--machine-readable -RTS 1000000 2 t
=====> T4334(threaded2) 20 of 26 [0, 2, 4]
cd "./perf/space_leaks/T4334.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -o T4334
T4334.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -O -threaded -eventlog
cd "./perf/space_leaks/T4334.run" && ./T4334 +RTS -V0 -tT4334.stats
--machine-readable -RTS +RTS -N2 -ls -RTS 1000000 2 t
peak_megabytes_allocated value is too high:
Expected T4334(threaded2) peak_megabytes_allocated: 2 +/-1%
Lower bound T4334(threaded2) peak_megabytes_allocated: 1
Upper bound T4334(threaded2) peak_megabytes_allocated: 3
Actual T4334(threaded2) peak_megabytes_allocated: 4
Deviation T4334(threaded2) peak_megabytes_allocated: 100.0 %
*** unexpected stat test failure for T4334(threaded2)
=====> T4334(dyn) 20 of 26 [0, 2, 4]
cd "./perf/space_leaks/T4334.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -o T4334
T4334.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -O -dynamic
cd "./perf/space_leaks/T4334.run" && ./T4334 +RTS -V0 -tT4334.stats
--machine-readable -RTS 1000000 2 t
=====> T6132(normal) 21 of 26 [0, 2, 4]
cd "./runghc/T6132.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -c
T6132.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output
*** unexpected pass for T6132(normal)
=====> T6132(hpc) 21 of 26 [1, 2, 4]
cd "./runghc/T6132.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -c
T6132.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -O -fhpc
*** unexpected pass for T6132(hpc)
=====> T6132(optasm) 21 of 26 [2, 2, 4]
cd "./runghc/T6132.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -c
T6132.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -O -fasm
*** unexpected pass for T6132(optasm)
=====> T6132(profasm) 21 of 26 [3, 2, 4]
cd "./runghc/T6132.run" && "/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -c
T6132.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -O -prof -static -fprof-
auto
*** unexpected pass for T6132(profasm)
=====> T7702(normal) 22 of 26 [4, 2, 4]
cd "./simplCore/should_compile/T7702.run" && $MAKE -s --no-print-directory
-C T7702plugin package.T7702 TOP=/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/testsuite
cd "./simplCore/should_compile/T7702.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -c
T7702.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -v0 -package-db
T7702plugin/pkg.T7702/local.package.conf -fplugin T7702Plugin -package
T7702plugin -dynamic +RTS -V0 -tT7702.comp.stats --machine-readable -RTS
=====> T7702(hpc) 22 of 26 [4, 2, 4]
cd "./simplCore/should_compile/T7702.run" && $MAKE -s --no-print-directory
-C T7702plugin package.T7702 TOP=/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/testsuite
cd "./simplCore/should_compile/T7702.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -c
T7702.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -O -fhpc -v0 -package-db
T7702plugin/pkg.T7702/local.package.conf -fplugin T7702Plugin -package
T7702plugin -dynamic +RTS -V0 -tT7702.comp.stats --machine-readable -RTS
=====> T7702(optasm) 22 of 26 [4, 2, 4]
cd "./simplCore/should_compile/T7702.run" && $MAKE -s --no-print-directory
-C T7702plugin package.T7702 TOP=/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/testsuite
cd "./simplCore/should_compile/T7702.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -c
T7702.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -O -fasm -v0 -package-db
T7702plugin/pkg.T7702/local.package.conf -fplugin T7702Plugin -package
T7702plugin -dynamic +RTS -V0 -tT7702.comp.stats --machine-readable -RTS
=====> T7702(profasm) 22 of 26 [4, 2, 4]
cd "./simplCore/should_compile/T7702.run" && $MAKE -s --no-print-directory
-C T7702plugin package.T7702 TOP=/Users/carter/dev-checkouts/ghc-
tree/ghc-8.6.2-checkout-build/testsuite
cd "./simplCore/should_compile/T7702.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2" -c
T7702.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output -O -prof -static -fprof-
auto -v0 -package-db T7702plugin/pkg.T7702/local.package.conf -fplugin
T7702Plugin -package T7702plugin -dynamic +RTS -V0 -tT7702.comp.stats
--machine-readable -RTS
Compile failed (exit code 1) errors were:
<command line>: Could not find module ‘T7702Plugin’
Perhaps you haven't installed the "p_dyn" libraries for package
‘T7702plugin-0.1’?
Use -v to see a list of the files searched for.
*** unexpected failure for T7702(profasm)
=====> EtaExpandLevPoly(normal) 23 of 26 [4, 3, 4]
cd "./typecheck/should_run/EtaExpandLevPoly.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o EtaExpandLevPoly EtaExpandLevPoly.hs -dcore-lint -dcmm-lint
-no-user-package-db -rtsopts -fno-warn-missed-specialisations -fshow-
warning-groups -fdiagnostics-color=never -fno-diagnostics-show-caret -dno-
debug-output
cd "./typecheck/should_run/EtaExpandLevPoly.run" && ./EtaExpandLevPoly
=====> EtaExpandLevPoly(hpc) 23 of 26 [4, 3, 4]
cd "./typecheck/should_run/EtaExpandLevPoly.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o EtaExpandLevPoly EtaExpandLevPoly.hs -dcore-lint -dcmm-lint
-no-user-package-db -rtsopts -fno-warn-missed-specialisations -fshow-
warning-groups -fdiagnostics-color=never -fno-diagnostics-show-caret -dno-
debug-output -O -fhpc
cd "./typecheck/should_run/EtaExpandLevPoly.run" && ./EtaExpandLevPoly
=====> EtaExpandLevPoly(optasm) 23 of 26 [4, 3, 4]
cd "./typecheck/should_run/EtaExpandLevPoly.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o EtaExpandLevPoly EtaExpandLevPoly.hs -dcore-lint -dcmm-lint
-no-user-package-db -rtsopts -fno-warn-missed-specialisations -fshow-
warning-groups -fdiagnostics-color=never -fno-diagnostics-show-caret -dno-
debug-output -O -fasm
cd "./typecheck/should_run/EtaExpandLevPoly.run" && ./EtaExpandLevPoly
=====> EtaExpandLevPoly(profasm) 23 of 26 [4, 3, 4]
cd "./typecheck/should_run/EtaExpandLevPoly.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o EtaExpandLevPoly EtaExpandLevPoly.hs -dcore-lint -dcmm-lint
-no-user-package-db -rtsopts -fno-warn-missed-specialisations -fshow-
warning-groups -fdiagnostics-color=never -fno-diagnostics-show-caret -dno-
debug-output -O -prof -static -fprof-auto
cd "./typecheck/should_run/EtaExpandLevPoly.run" && ./EtaExpandLevPoly
+RTS -hc -p -RTS
cd "./typecheck/should_run/EtaExpandLevPoly.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/hp2ps"
EtaExpandLevPoly
*** unexpected pass for EtaExpandLevPoly(profasm)
=====> EtaExpandLevPoly(threaded1) 23 of 26 [5, 3, 4]
cd "./typecheck/should_run/EtaExpandLevPoly.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o EtaExpandLevPoly EtaExpandLevPoly.hs -dcore-lint -dcmm-lint
-no-user-package-db -rtsopts -fno-warn-missed-specialisations -fshow-
warning-groups -fdiagnostics-color=never -fno-diagnostics-show-caret -dno-
debug-output -threaded -debug
cd "./typecheck/should_run/EtaExpandLevPoly.run" && ./EtaExpandLevPoly
=====> EtaExpandLevPoly(threaded2) 23 of 26 [5, 3, 4]
cd "./typecheck/should_run/EtaExpandLevPoly.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o EtaExpandLevPoly EtaExpandLevPoly.hs -dcore-lint -dcmm-lint
-no-user-package-db -rtsopts -fno-warn-missed-specialisations -fshow-
warning-groups -fdiagnostics-color=never -fno-diagnostics-show-caret -dno-
debug-output -O -threaded -eventlog
cd "./typecheck/should_run/EtaExpandLevPoly.run" && ./EtaExpandLevPoly
+RTS -N2 -ls -RTS
=====> EtaExpandLevPoly(dyn) 23 of 26 [5, 3, 4]
cd "./typecheck/should_run/EtaExpandLevPoly.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o EtaExpandLevPoly EtaExpandLevPoly.hs -dcore-lint -dcmm-lint
-no-user-package-db -rtsopts -fno-warn-missed-specialisations -fshow-
warning-groups -fdiagnostics-color=never -fno-diagnostics-show-caret -dno-
debug-output -O -dynamic
cd "./typecheck/should_run/EtaExpandLevPoly.run" && ./EtaExpandLevPoly
=====> EtaExpandLevPoly(profthreaded) 23 of 26 [5, 3, 4]
cd "./typecheck/should_run/EtaExpandLevPoly.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o EtaExpandLevPoly EtaExpandLevPoly.hs -dcore-lint -dcmm-lint
-no-user-package-db -rtsopts -fno-warn-missed-specialisations -fshow-
warning-groups -fdiagnostics-color=never -fno-diagnostics-show-caret -dno-
debug-output -O -prof -static -fprof-auto -threaded
cd "./typecheck/should_run/EtaExpandLevPoly.run" && ./EtaExpandLevPoly
+RTS -p -RTS
*** unexpected pass for EtaExpandLevPoly(profthreaded)
=====> T15349(normal) 24 of 26 [6, 3, 4]
cd "../../libraries/base/tests/T15349.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o T15349 T15349.hs -dcore-lint -dcmm-lint -no-user-package-db
-rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
cd "../../libraries/base/tests/T15349.run" && ./T15349
=====> T15349(hpc) 24 of 26 [6, 3, 4]
cd "../../libraries/base/tests/T15349.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o T15349 T15349.hs -dcore-lint -dcmm-lint -no-user-package-db
-rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-O -fhpc
cd "../../libraries/base/tests/T15349.run" && ./T15349
=====> T15349(optasm) 24 of 26 [6, 3, 4]
cd "../../libraries/base/tests/T15349.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o T15349 T15349.hs -dcore-lint -dcmm-lint -no-user-package-db
-rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-O -fasm
cd "../../libraries/base/tests/T15349.run" && ./T15349
=====> T15349(profasm) 24 of 26 [6, 3, 4]
cd "../../libraries/base/tests/T15349.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o T15349 T15349.hs -dcore-lint -dcmm-lint -no-user-package-db
-rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-O -prof -static -fprof-auto
cd "../../libraries/base/tests/T15349.run" && ./T15349 +RTS -hc -p -RTS
cd "../../libraries/base/tests/T15349.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/hp2ps" T15349
=====> T15349(ghci) 24 of 26 [6, 3, 4]
cd "../../libraries/base/tests/T15349.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2"
T15349.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output --interactive -v0 -ignore-
dot-ghci -fno-ghci-history -fghci-leak-check +RTS -I0.1 -RTS <
T15349.genscript
Timeout happened...killed process "cd
"../../libraries/base/tests/T15349.run" && "/Users/carter/dev-checkouts
/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-stage2"
T15349.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts -fno-warn-
missed-specialisations -fshow-warning-groups -fdiagnostics-color=never
-fno-diagnostics-show-caret -dno-debug-output --interactive -v0 -ignore-
dot-ghci -fno-ghci-history -fghci-leak-check +RTS -I0.1 -RTS "...
Wrong exit code for T15349(ghci) (expected 1 , actual 99 )
*** unexpected failure for T15349(ghci)
=====> T15349(threaded1) 24 of 26 [6, 4, 4]
cd "../../libraries/base/tests/T15349.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o T15349 T15349.hs -dcore-lint -dcmm-lint -no-user-package-db
-rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-threaded -debug
cd "../../libraries/base/tests/T15349.run" && ./T15349
=====> T15349(threaded2) 24 of 26 [6, 4, 4]
cd "../../libraries/base/tests/T15349.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o T15349 T15349.hs -dcore-lint -dcmm-lint -no-user-package-db
-rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-O -threaded -eventlog
cd "../../libraries/base/tests/T15349.run" && ./T15349 +RTS -N2 -ls -RTS
=====> T15349(dyn) 24 of 26 [6, 4, 4]
cd "../../libraries/base/tests/T15349.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o T15349 T15349.hs -dcore-lint -dcmm-lint -no-user-package-db
-rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-O -dynamic
cd "../../libraries/base/tests/T15349.run" && ./T15349
=====> T15349(profthreaded) 24 of 26 [6, 4, 4]
cd "../../libraries/base/tests/T15349.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o T15349 T15349.hs -dcore-lint -dcmm-lint -no-user-package-db
-rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-O -prof -static -fprof-auto -threaded
cd "../../libraries/base/tests/T15349.run" && ./T15349 +RTS -p -RTS
=====> hpc_fork(normal) 25 of 26 [6, 4, 4]
cd "../../libraries/hpc/tests/fork/hpc_fork.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o hpc_fork hpc_fork.hs -dcore-lint -dcmm-lint -no-user-package-db
-rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-fhpc
cd "../../libraries/hpc/tests/fork/hpc_fork.run" && perl hpcrun.pl --clear
--exeext= --hpc="/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/inplace/test spaces/hpc" ./hpc_fork
=====> hpc_fork(hpc) 25 of 26 [6, 4, 4]
cd "../../libraries/hpc/tests/fork/hpc_fork.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o hpc_fork hpc_fork.hs -dcore-lint -dcmm-lint -no-user-package-db
-rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-O -fhpc -fhpc
cd "../../libraries/hpc/tests/fork/hpc_fork.run" && perl hpcrun.pl --clear
--exeext= --hpc="/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/inplace/test spaces/hpc" ./hpc_fork
=====> hpc_fork(optasm) 25 of 26 [6, 4, 4]
cd "../../libraries/hpc/tests/fork/hpc_fork.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o hpc_fork hpc_fork.hs -dcore-lint -dcmm-lint -no-user-package-db
-rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-O -fasm -fhpc
cd "../../libraries/hpc/tests/fork/hpc_fork.run" && perl hpcrun.pl --clear
--exeext= --hpc="/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/inplace/test spaces/hpc" ./hpc_fork
=====> hpc_fork(profasm) 25 of 26 [6, 4, 4]
cd "../../libraries/hpc/tests/fork/hpc_fork.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o hpc_fork hpc_fork.hs -dcore-lint -dcmm-lint -no-user-package-db
-rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-O -prof -static -fprof-auto -fhpc
cd "../../libraries/hpc/tests/fork/hpc_fork.run" && perl hpcrun.pl --clear
--exeext= --hpc="/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/inplace/test spaces/hpc" ./hpc_fork +RTS -hc -p -RTS
cd "../../libraries/hpc/tests/fork/hpc_fork.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/hp2ps"
hpc_fork
hp2ps error when processing heap profile for hpc_fork
*** unexpected failure for hpc_fork(profasm)
=====> hpc_fork(threaded1) 25 of 26 [6, 5, 4]
cd "../../libraries/hpc/tests/fork/hpc_fork.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o hpc_fork hpc_fork.hs -dcore-lint -dcmm-lint -no-user-package-db
-rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-threaded -debug -fhpc
cd "../../libraries/hpc/tests/fork/hpc_fork.run" && perl hpcrun.pl --clear
--exeext= --hpc="/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/inplace/test spaces/hpc" ./hpc_fork
=====> hpc_fork(dyn) 25 of 26 [6, 5, 4]
cd "../../libraries/hpc/tests/fork/hpc_fork.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o hpc_fork hpc_fork.hs -dcore-lint -dcmm-lint -no-user-package-db
-rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-O -dynamic -fhpc
cd "../../libraries/hpc/tests/fork/hpc_fork.run" && perl hpcrun.pl --clear
--exeext= --hpc="/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/inplace/test spaces/hpc" ./hpc_fork
=====> hpc_fork(profthreaded) 25 of 26 [6, 5, 4]
cd "../../libraries/hpc/tests/fork/hpc_fork.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o hpc_fork hpc_fork.hs -dcore-lint -dcmm-lint -no-user-package-db
-rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-O -prof -static -fprof-auto -threaded -fhpc
cd "../../libraries/hpc/tests/fork/hpc_fork.run" && perl hpcrun.pl --clear
--exeext= --hpc="/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2-checkout-
build/inplace/test spaces/hpc" ./hpc_fork +RTS -p -RTS
=====> signals004(normal) 26 of 26 [6, 5, 4]
cd "../../libraries/unix/tests/signals004.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o signals004 signals004.hs -dcore-lint -dcmm-lint -no-user-
package-db -rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-package unix
cd "../../libraries/unix/tests/signals004.run" && ./signals004
=====> signals004(hpc) 26 of 26 [6, 5, 4]
cd "../../libraries/unix/tests/signals004.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o signals004 signals004.hs -dcore-lint -dcmm-lint -no-user-
package-db -rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-O -fhpc -package unix
cd "../../libraries/unix/tests/signals004.run" && ./signals004
=====> signals004(optasm) 26 of 26 [6, 5, 4]
cd "../../libraries/unix/tests/signals004.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o signals004 signals004.hs -dcore-lint -dcmm-lint -no-user-
package-db -rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-O -fasm -package unix
cd "../../libraries/unix/tests/signals004.run" && ./signals004
=====> signals004(profasm) 26 of 26 [6, 5, 4]
cd "../../libraries/unix/tests/signals004.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o signals004 signals004.hs -dcore-lint -dcmm-lint -no-user-
package-db -rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-O -prof -static -fprof-auto -package unix
cd "../../libraries/unix/tests/signals004.run" && ./signals004 +RTS -hc -p
-RTS
cd "../../libraries/unix/tests/signals004.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/hp2ps"
signals004
=====> signals004(ghci) 26 of 26 [6, 5, 4]
cd "../../libraries/unix/tests/signals004.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" signals004.hs -dcore-lint -dcmm-lint -no-user-package-db -rtsopts
-fno-warn-missed-specialisations -fshow-warning-groups -fdiagnostics-
color=never -fno-diagnostics-show-caret -dno-debug-output --interactive
-v0 -ignore-dot-ghci -fno-ghci-history -fghci-leak-check +RTS -I0.1 -RTS
-package unix< signals004.genscript
=====> signals004(threaded1) 26 of 26 [6, 5, 4]
cd "../../libraries/unix/tests/signals004.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o signals004 signals004.hs -dcore-lint -dcmm-lint -no-user-
package-db -rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-threaded -debug -package unix
cd "../../libraries/unix/tests/signals004.run" && ./signals004
=====> signals004(threaded2) 26 of 26 [6, 5, 4]
cd "../../libraries/unix/tests/signals004.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o signals004 signals004.hs -dcore-lint -dcmm-lint -no-user-
package-db -rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-O -threaded -eventlog -package unix
cd "../../libraries/unix/tests/signals004.run" && ./signals004 +RTS -N2
-ls -RTS
Timeout happened...killed process "cd
"../../libraries/unix/tests/signals004.run" && ./signals004 +RTS -N2 -ls
-RTS "...
Wrong exit code for signals004(threaded2)(expected 0 , actual 99 )
*** unexpected failure for signals004(threaded2)
=====> signals004(dyn) 26 of 26 [6, 6, 4]
cd "../../libraries/unix/tests/signals004.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o signals004 signals004.hs -dcore-lint -dcmm-lint -no-user-
package-db -rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-O -dynamic -package unix
cd "../../libraries/unix/tests/signals004.run" && ./signals004
=====> signals004(profthreaded) 26 of 26 [6, 6, 4]
cd "../../libraries/unix/tests/signals004.run" && "/Users/carter/dev-
checkouts/ghc-tree/ghc-8.6.2-checkout-build/inplace/test spaces/ghc-
stage2" -o signals004 signals004.hs -dcore-lint -dcmm-lint -no-user-
package-db -rtsopts -fno-warn-missed-specialisations -fshow-warning-groups
-fdiagnostics-color=never -fno-diagnostics-show-caret -dno-debug-output
-O -prof -static -fprof-auto -threaded -package unix
cd "../../libraries/unix/tests/signals004.run" && ./signals004 +RTS -p
-RTS
Unexpected results from:
TEST="EtaExpandLevPoly ManyAlternatives ManyConstructors MultiLayerModules
T10370 T11535 T12707 T13379 T13701 T13719 T14683 T14697 T14936 T15349
T4334 T6132 T7702 T9203 T9630 ghci063 haddock.Cabal haddock.base
haddock.compiler hpc_fork signals004 space_leak_001"
SUMMARY for test run started at Fri Nov 30 11:28:02 2018 EST
0:56:11 spent to go through
26 total tests, which gave rise to
137 test cases, of which
20 were skipped
0 had missing libraries
64 expected passes
0 expected failures
4 caused framework failures
0 caused framework warnings
6 unexpected passes
6 unexpected failures
37 unexpected stat failures
Unexpected passes:
runghc/T6132.run T6132 [unexpected] (normal)
runghc/T6132.run T6132 [unexpected] (hpc)
runghc/T6132.run T6132 [unexpected] (optasm)
runghc/T6132.run T6132 [unexpected] (profasm)
typecheck/should_run/EtaExpandLevPoly.run EtaExpandLevPoly
[unexpected] (profasm)
typecheck/should_run/EtaExpandLevPoly.run EtaExpandLevPoly
[unexpected] (profthreaded)
Unexpected failures:
deriving/should_run/T11535.run T11535 [bad exit code]
(ghci)
ghci/scripts/ghci063.run ghci063 [bad stderr]
(ghci)
simplCore/should_compile/T7702.run T7702 [exit code non-0]
(profasm)
../../libraries/base/tests/T15349.run T15349 [bad exit code]
(ghci)
../../libraries/hpc/tests/fork/hpc_fork.run hpc_fork [bad heap
profile] (profasm)
../../libraries/unix/tests/signals004.run signals004 [bad exit code]
(threaded2)
Unexpected stat failures:
perf/compiler/T10370.run T10370 [stat not good enough]
(optasm)
perf/compiler/T12707.run T12707 [stat not good enough]
(hpc)
perf/compiler/T12707.run T12707 [stat not good enough]
(optasm)
perf/compiler/T12707.run T12707 [stat not good enough]
(profasm)
perf/compiler/T13379.run T13379 [stat not good enough]
(hpc)
perf/compiler/MultiLayerModules.run MultiLayerModules [stat not good
enough] (optasm)
perf/compiler/ManyConstructors.run ManyConstructors [stat not good
enough] (hpc)
perf/compiler/ManyConstructors.run ManyConstructors [stat not good
enough] (optasm)
perf/compiler/ManyConstructors.run ManyConstructors [stat not good
enough] (profasm)
perf/compiler/ManyAlternatives.run ManyAlternatives [stat not good
enough] (hpc)
perf/compiler/ManyAlternatives.run ManyAlternatives [stat not good
enough] (optasm)
perf/compiler/ManyAlternatives.run ManyAlternatives [stat not good
enough] (profasm)
perf/compiler/T13701.run T13701 [stat not good enough]
(optasm)
perf/compiler/T13719.run T13719 [stat not good enough]
(hpc)
perf/compiler/T13719.run T13719 [stat not good enough]
(optasm)
perf/compiler/T13719.run T13719 [stat not good enough]
(profasm)
perf/compiler/T14697.run T14697 [stat not good enough]
(hpc)
perf/compiler/T14697.run T14697 [stat not good enough]
(optasm)
perf/compiler/T14697.run T14697 [stat not good enough]
(profasm)
perf/compiler/T14683.run T14683 [stat not good enough]
(hpc)
perf/compiler/T14683.run T14683 [stat not good enough]
(optasm)
perf/compiler/T14683.run T14683 [stat not good enough]
(profasm)
perf/compiler/T9630.run T9630 [stat not good enough] (hpc)
perf/compiler/T9630.run T9630 [stat not good enough]
(profasm)
perf/haddock/haddock.base.run haddock.base [stat not good
enough] (normal)
perf/haddock/haddock.Cabal.run haddock.Cabal [stat not good
enough] (normal)
perf/haddock/haddock.compiler.run haddock.compiler [stat not good
enough] (normal)
perf/should_run/T9203.run T9203 [stat too good] (normal)
perf/should_run/T14936.run T14936 [stat not good enough]
(hpc)
perf/should_run/T14936.run T14936 [stat not good enough]
(profasm)
perf/should_run/T14936.run T14936 [stat not good enough]
(threaded1)
perf/should_run/T14936.run T14936 [stat not good enough]
(threaded2)
perf/should_run/T14936.run T14936 [stat not good enough]
(profthreaded)
perf/space_leaks/space_leak_001.run space_leak_001 [stat too good]
(hpc)
perf/space_leaks/space_leak_001.run space_leak_001 [stat too good]
(optasm)
perf/space_leaks/space_leak_001.run space_leak_001 [stat too good]
(dyn)
perf/space_leaks/T4334.run T4334 [stat not good enough]
(threaded2)
Framework failures:
perf/compiler/MultiLayerModules.run MultiLayerModules [hpc]
('NoneType' object has no attribute 'group')
perf/compiler/MultiLayerModules.run MultiLayerModules [profasm]
('NoneType' object has no attribute 'group')
perf/compiler/T13701.run T13701 [hpc] ('NoneType' object
has no attribute 'group')
perf/compiler/T13701.run T13701 [profasm] ('NoneType'
object has no attribute 'group')
../mk/test.mk:329: recipe for target 'test' failed
make[2]: *** [test] Error 1
make[2]: Leaving directory '/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2
-checkout-build/testsuite/tests'
../mk/test.mk:348: recipe for target 'slow' failed
make[1]: *** [slow] Error 2
make[1]: Leaving directory '/Users/carter/dev-checkouts/ghc-tree/ghc-8.6.2
-checkout-build/testsuite/tests'
Makefile:35: recipe for target 'slow' failed
make: *** [slow] Error 2
}}}
--
Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/15978>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler
1
0
#15977: Restructure typechecking modules
-------------------------------------+-------------------------------------
Reporter: goldfire | Owner: (none)
Type: task | Status: new
Priority: normal | Milestone: 8.6.3
Component: Compiler | Version: 8.6.2
Keywords: | Operating System: Unknown/Multiple
Architecture: | Type of failure: None/Unknown
Unknown/Multiple |
Test Case: | Blocked By:
Blocking: | Related Tickets:
Differential Rev(s): | Wiki Page:
-------------------------------------+-------------------------------------
Some of the kind-checking and type-checking modules have become unruly.
Simon and I propose the new structure:
- KcTyClsDecls will handle kind-checking and generalization of datatype
declarations. (That is, `kcTyClGroup` and children, including related
functions in TcHsType)
- TcInstBinds will handle `tcInstDecls2` and children
- TcTyConValidity will handle `checkValidTyCon` and children
- Fold the rest of TcInstDecls (essentially, `tcInstDecls1`) into what's
left of TcTyClsDecls. TcInstDecls is removed.
--
Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/15977>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler
1
0
#15899: Testcase tcfail158 is broken
-------------------------------------+-------------------------------------
Reporter: RolandSenn | Owner: (none)
Type: bug | Status: new
Priority: normal | Milestone: 8.8.1
Component: Test Suite | Version: 8.7
Keywords: | Operating System: Unknown/Multiple
Architecture: | Type of failure: Other
Unknown/Multiple |
Test Case: | Blocked By:
Blocking: | Related Tickets:
Differential Rev(s): | Wiki Page:
-------------------------------------+-------------------------------------
Test testsuite/tests/typecheck/should_fail/tcfail158.hs contains the
following code:
{{{#!hs
{-# LANGUAGE ExplicitForAll #-}
-- This one actually crashed in 6.4.1
-- There's a kind error in the signature for bar,
-- and we were recovering, and then crashing when we found
-- a scoped type variable not in scope
data Val v sm = Val
foo :: forall v sm. Val v sm
foo = undefined
where foo1 :: Val v sm
foo1 = bar
-- Correct type signature: bar :: forall v sm. Val v sm
bar :: forall v. Val v
bar = undefined foo
}}}
The expected test result in
testsuite/tests/typecheck/should_fail/tcfail158.stderr is:
{{{
tcfail158.hs:1:1: error:
The IO action ‘main’ is not defined in module ‘Main’
}}}
== Issues:
1. With a very high probability, the intention of this test was not to
test on the missing main function. The intention was to test the error
message for the type signature of function ''bar'' .
2. The code for the definitions and functions start in column 2 and not in
column 1.
3. With an added main function GHC Versions 8.0, 8.2, 8.4 and 8.6 report
the following error:
{{{
tcfail158.hs:17:18: error:
• Expecting one more argument to ‘Val v’
Expected a type, but ‘Val v’ has kind ‘* -> *’
• In the type signature:
bar :: forall v. Val v
}}}
4. GHC HEAD version 8.7.20181112, however, reports:
{{{
tcfail158.hs:15:17: error:
• Couldn't match expected type ‘Val v1 sm1’
with actual type ‘Val v0’
• In the expression: bar
In an equation for ‘foo1’: foo1 = bar
In an equation for ‘foo’:
foo
= undefined
where
foo1 :: Val v sm
foo1 = bar
• Relevant bindings include
foo1 :: Val v1 sm1 (bound at tcfail158.hs:15:10)
tcfail158.hs:17:18: error:
• Expecting one more argument to ‘Val v’
Expected a type, but ‘Val v’ has kind ‘* -> *’
• In the type signature: bar :: forall v. Val v
^^^^^
tcfail158.hs:18:7: error:
• Couldn't match kind ‘* -> *’ with ‘*’
When matching types
t0 :: *
Val v :: * -> *
• In the expression: undefined foo
In an equation for ‘bar’: bar = undefined foo
• Relevant bindings include
bar :: Val v (bound at tcfail158.hs:18:1)
}}}
GHC HEAD reports errors in 3 different lines 15, 17 and 18. Fix the type
signature in line 17 and GHC compiles successfully. The error messages
produced by GHC HEAD are very confusing!
--
Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/15899>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler
1
5
#15972: Test nofib tests for correctness in CI
-------------------------------------+-------------------------------------
Reporter: bgamari | Owner: bgamari
Type: bug | Status: new
Priority: high | Milestone: 8.9
Component: Continuous | Version: 8.6.2
Integration |
Keywords: | Operating System: Unknown/Multiple
Architecture: | Type of failure: None/Unknown
Unknown/Multiple |
Test Case: | Blocked By:
Blocking: | Related Tickets:
Differential Rev(s): | Wiki Page:
-------------------------------------+-------------------------------------
Apparently the result of the `spectral/fft2` nofib test changed at some
point in the last few months. The difference is likely acceptable given
the nature of the test but it's nevertheless worrying that we are only
finding this out now. We really should test nofib tests for correctness as
part of CI.
--
Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/15972>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler
1
1
#15976: Can't run nofib in parallel
-------------------------------------+-------------------------------------
Reporter: sgraf | Owner: (none)
Type: bug | Status: new
Priority: normal | Milestone: ⊥
Component: NoFib | Version:
benchmark suite |
Keywords: | Operating System: Unknown/Multiple
Architecture: | Type of failure: None/Unknown
Unknown/Multiple |
Test Case: | Blocked By:
Blocking: | Related Tickets:
Differential Rev(s): | Wiki Page:
-------------------------------------+-------------------------------------
I was under the impression that `make -j$n` within `nofib` would run
benchmarks in parallel, but it doesn't. The following warning is
indicative:
{{{
make[1]: warning: -jN forced in submake: disabling jobserver mode.
}}}
Whenever `make` is called recursively, any `-j` flags will lead to this
warning and consequently disable parallelisation (which would lead to a
number of jobs exponential in the depth of recursive calls).
Parallel benchmarks are useful to get deterministic metrics such as
allocations or counted instructions really fast.
--
Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/15976>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler
1
0

[GHC] #15974: QuantifiedConstraints: Spurious error involving superclass constraints
by GHC 30 Nov '18
by GHC 30 Nov '18
30 Nov '18
#15974: QuantifiedConstraints: Spurious error involving superclass constraints
-------------------------------------+-------------------------------------
Reporter: lexi.lambda | Owner: (none)
Type: bug | Status: new
Priority: normal | Milestone: 8.6.3
Component: Compiler | Version: 8.6.2
Keywords: | Operating System: Unknown/Multiple
QuantifiedConstraints |
Architecture: | Type of failure: GHC rejects
Unknown/Multiple | valid program
Test Case: | Blocked By:
Blocking: | Related Tickets:
Differential Rev(s): | Wiki Page:
-------------------------------------+-------------------------------------
{{{#!hs
{-# LANGUAGE KindSignatures, QuantifiedConstraints, UndecidableInstances
#-}
}}}
Consider the following datatype and two classes:
{{{#!hs
data X (f :: * -> *)
class A a
class A a => B a
}}}
If I create an instance `A (X f)` involving a quantified constraint
{{{#!hs
instance (forall a. A a => A (f a)) => A (X f)
}}}
then curiously, the following instance declaration for `B (X f)` is
rejected with the accompanying error message:
{{{#!hs
instance (forall a. B a => B (f a)) => B (X f)
}}}
{{{
/tmp/qc.hs:11:10: error:
• Could not deduce (B a)
arising from the superclasses of an instance declaration
from the context: forall a. B a => B (f a)
bound by the instance declaration at /tmp/qc.hs:11:10-46
or from: A a bound by a quantified context at /tmp/qc.hs:1:1
Possible fix: add (B a) to the context of a quantified context
• In the instance declaration for ‘B (X f)’
|
11 | instance (forall a. B a => B (f a)) => B (X f)
| ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^
}}}
Notably, if the instance declaration for `A (X f)` is altered to not use a
quantified constraint, as in
{{{#!hs
instance A (f (X f)) => A (X f)
}}}
or even just
{{{#!hs
instance A (X f)
}}}
then the above instance declaration for `B (X f)` is accepted.
I see no reason that the `B (X f)` declaration should be rejected, even
with the quantified constraint in the instance context for `A (X f)`. The
error message complains that the typechecker cannot deduce `B a`, and it
even suggests adding `B a` to the context of the quantified constraint,
but `B a` is //already// in that context.
--
Ticket URL: <http://ghc.haskell.org/trac/ghc/ticket/15974>
GHC <http://www.haskell.org/ghc/>
The Glasgow Haskell Compiler
1
3