Skip to content
Snippets Groups Projects
Commit 48720a07 authored by Matthew Craven's avatar Matthew Craven Committed by Marge Bot
Browse files

Apply Note [Sensitivity to unique increment] to LargeRecord

parent d471d445
No related branches found
No related tags found
No related merge requests found
......@@ -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
......
{-# 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]
......
......@@ -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,
......
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment