diff --git a/testsuite/tests/perf/compiler/LargeRecord.hs b/testsuite/tests/perf/compiler/LargeRecord.hs index c31ef0ed0866aee207f9ac9c170c2e8e32ce3139..b70367a98ae09dc9b1fb495a685d25b9fb3a8ca3 100644 --- a/testsuite/tests/perf/compiler/LargeRecord.hs +++ b/testsuite/tests/perf/compiler/LargeRecord.hs @@ -11,6 +11,9 @@ {- Notes on LargeRecord ~~~~~~~~~~~~~~~~~~~~~~~ +Subject to Note [Sensitivity to unique increment] in T12545.hs with spread of 2.2% + + I noticed that in GHC of July 2022, when compiling this module I got lots of "SPEC" rules diff --git a/testsuite/tests/perf/compiler/T8095.hs b/testsuite/tests/perf/compiler/T8095.hs index bed4dff72671098d10622af3fee0b8921d35bc4f..5c0cf5cae814c1cb6c9f46a1f44b8db23f352075 100644 --- a/testsuite/tests/perf/compiler/T8095.hs +++ b/testsuite/tests/perf/compiler/T8095.hs @@ -1,6 +1,6 @@ {-# OPTIONS_GHC -freduction-depth=1000 #-} {-# LANGUAGE TypeOperators,DataKinds,KindSignatures,TypeFamilies,PolyKinds,UndecidableInstances #-} --- Subject to Note [Sensitivity to unique increment] with spread of 1.7% +-- Subject to Note [Sensitivity to unique increment] in T12545.hs with spread of 1.7% import GHC.TypeLits data Nat1 = Zero | Succ Nat1 type family Replicate1 (n :: Nat1) (x::a) :: [a] diff --git a/testsuite/tests/perf/compiler/all.T b/testsuite/tests/perf/compiler/all.T index bf06a5dd9b3ab57fbe71069c60c6e6e6de6db1cd..4c19400b8899abc24e3050247f43f6119c49ada3 100644 --- a/testsuite/tests/perf/compiler/all.T +++ b/testsuite/tests/perf/compiler/all.T @@ -206,9 +206,11 @@ test('CoOpt_Singletons', ######### +# LargeRecord is subject to Note [Sensitivity to unique increment] in T12545.hs +# observed spread was 2.2% test ('LargeRecord', [ only_ways(['normal']), - collect_compiler_stats('bytes allocated',1) + collect_compiler_stats('bytes allocated',5) , extra_files(['SuperRecord.hs']) ], multimod_compile,