[Git][ghc/ghc][master] Apply Note [Sensitivity to unique increment] to LargeRecord

Marge Bot (@marge-bot) gitlab at gitlab.haskell.org
Mon Jan 8 23:57:59 UTC 2024



Marge Bot pushed to branch master at Glasgow Haskell Compiler / GHC


Commits:
48720a07 by Matthew Craven at 2024-01-08T18:57:36-05:00
Apply Note [Sensitivity to unique increment] to LargeRecord

- - - - -


3 changed files:

- testsuite/tests/perf/compiler/LargeRecord.hs
- testsuite/tests/perf/compiler/T8095.hs
- testsuite/tests/perf/compiler/all.T


Changes:

=====================================
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
 


=====================================
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]


=====================================
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,



View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/48720a07607a4b88ef78d9afbf55115deffee2c5

-- 
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/48720a07607a4b88ef78d9afbf55115deffee2c5
You're receiving this email because of your account on gitlab.haskell.org.


-------------- next part --------------
An HTML attachment was scrubbed...
URL: <http://mail.haskell.org/pipermail/ghc-commits/attachments/20240108/4ffed9bd/attachment-0001.html>


More information about the ghc-commits mailing list