[Git][ghc/ghc][wip/refactor-demand] Update test outputs

Sebastian Graf gitlab at gitlab.haskell.org
Mon Nov 9 18:19:31 UTC 2020



Sebastian Graf pushed to branch wip/refactor-demand at Glasgow Haskell Compiler / GHC


Commits:
c887ca0d by Sebastian Graf at 2020-11-09T19:19:23+01:00
Update test outputs

- - - - -


28 changed files:

- testsuite/tests/arityanal/should_compile/Arity01.stderr
- testsuite/tests/arityanal/should_compile/Arity03.stderr
- testsuite/tests/arityanal/should_compile/Arity04.stderr
- testsuite/tests/arityanal/should_compile/Arity05.stderr
- testsuite/tests/arityanal/should_compile/Arity11.stderr
- testsuite/tests/arityanal/should_compile/Arity14.stderr
- testsuite/tests/arityanal/should_compile/T18793.stderr
- testsuite/tests/numeric/should_compile/T7116.stdout
- testsuite/tests/simplCore/should_compile/T13143.stderr
- testsuite/tests/simplCore/should_compile/T13543.stderr
- testsuite/tests/simplCore/should_compile/T3717.stderr
- testsuite/tests/simplCore/should_compile/T3772.stdout
- testsuite/tests/simplCore/should_compile/T4908.stderr
- testsuite/tests/simplCore/should_compile/T4930.stderr
- testsuite/tests/simplCore/should_compile/spec-inline.stderr
- testsuite/tests/stranal/should_compile/T10694.stderr
- testsuite/tests/stranal/should_compile/T18903.stderr
- testsuite/tests/stranal/sigs/BottomFromInnerLambda.stderr
- testsuite/tests/stranal/sigs/CaseBinderCPR.stderr
- testsuite/tests/stranal/sigs/DmdAnalGADTs.stderr
- testsuite/tests/stranal/sigs/HyperStrUse.stderr
- testsuite/tests/stranal/sigs/NewtypeArity.stderr
- testsuite/tests/stranal/sigs/T12370.stderr
- testsuite/tests/stranal/sigs/T13380f.stderr
- testsuite/tests/stranal/sigs/T17932.stderr
- testsuite/tests/stranal/sigs/T5075.stderr
- testsuite/tests/stranal/sigs/T8598.stderr
- testsuite/tests/stranal/sigs/UnsatFun.stderr


Changes:

=====================================
testsuite/tests/arityanal/should_compile/Arity01.stderr
=====================================
@@ -47,7 +47,7 @@ F1.s1 = 3
 s :: forall {t1} {t2}. Num t1 => (t1 -> t2) -> t2
 [GblId,
  Arity=2,
- Str=<1(A,A,A,A,A,A,1C1(U))><SCS(U)>,
+ Str=<1P(A,A,A,A,A,A,1C1(U))><SCS(U)>,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True, WorkFree=True, Expandable=True, Guidance=ALWAYS_IF(arity=2,unsat_ok=True,boring_ok=False)
          Tmpl= \ (@t) (@t1) ($dNum [Occ=Once1] :: Num t) (f [Occ=Once1!] :: t -> t1) -> f (fromInteger @t $dNum F1.s1)}]
 s = \ (@t) (@t1) ($dNum :: Num t) (f :: t -> t1) -> f (fromInteger @t $dNum F1.s1)


=====================================
testsuite/tests/arityanal/should_compile/Arity03.stderr
=====================================
@@ -18,7 +18,7 @@ end Rec }
 fac [InlPrag=[2]] :: Int -> Int
 [GblId,
  Arity=1,
- Str=<S(SU)>,
+ Str=<SP(SU)>,
  Cpr=m1,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True, WorkFree=True, Expandable=True, Guidance=ALWAYS_IF(arity=1,unsat_ok=True,boring_ok=False)
          Tmpl= \ (w [Occ=Once1!] :: Int) -> case w of { GHC.Types.I# ww1 [Occ=Once1] -> case F3.$wfac ww1 of ww2 [Occ=Once1] { __DEFAULT -> GHC.Types.I# ww2 } }}]
@@ -28,7 +28,7 @@ fac = \ (w :: Int) -> case w of { GHC.Types.I# ww1 -> case F3.$wfac ww1 of ww2 {
 f3 :: Int -> Int
 [GblId,
  Arity=1,
- Str=<S(SU)>,
+ Str=<SP(SU)>,
  Cpr=m1,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True, WorkFree=True, Expandable=True, Guidance=ALWAYS_IF(arity=1,unsat_ok=True,boring_ok=True)
          Tmpl= fac}]


=====================================
testsuite/tests/arityanal/should_compile/Arity04.stderr
=====================================
@@ -6,7 +6,7 @@ Result size of Tidy Core = {terms: 39, types: 24, coercions: 0, joins: 0/0}
 f4g :: Int -> Int
 [GblId,
  Arity=1,
- Str=<S(U)>,
+ Str=<SP(U)>,
  Cpr=m1,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True, WorkFree=True, Expandable=True, Guidance=ALWAYS_IF(arity=1,unsat_ok=True,boring_ok=False)
          Tmpl= \ (y [Occ=Once1!] :: Int) -> case y of { GHC.Types.I# x [Occ=Once1] -> GHC.Types.I# (GHC.Prim.+# x 1#) }}]
@@ -33,7 +33,7 @@ end Rec }
 f4h [InlPrag=[2]] :: (Int -> Int) -> Int -> Int
 [GblId,
  Arity=2,
- Str=<SCS(U)><S(SU)>,
+ Str=<SCS(U)><SP(SU)>,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True, WorkFree=True, Expandable=True, Guidance=ALWAYS_IF(arity=2,unsat_ok=True,boring_ok=False)
          Tmpl= \ (w [Occ=Once1] :: Int -> Int) (w1 [Occ=Once1!] :: Int) -> case w1 of { GHC.Types.I# ww1 [Occ=Once1] -> F4.$wf4h w ww1 }}]
 f4h = \ (w :: Int -> Int) (w1 :: Int) -> case w1 of { GHC.Types.I# ww1 -> F4.$wf4h w ww1 }


=====================================
testsuite/tests/arityanal/should_compile/Arity05.stderr
=====================================
@@ -11,7 +11,7 @@ F5.f5g1 = 1
 f5g :: forall {a} {t}. Num a => (t -> a) -> t -> a
 [GblId,
  Arity=3,
- Str=<M(SCS(CS(U)),A,A,A,A,A,1C1(U))><1C1(U)><U>,
+ Str=<MP(SCS(CS(U)),A,A,A,A,A,1C1(U))><1C1(U)><U>,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True, WorkFree=True, Expandable=True, Guidance=ALWAYS_IF(arity=3,unsat_ok=True,boring_ok=False)
          Tmpl= \ (@a) (@t) ($dNum :: Num a) (h [Occ=Once1!] :: t -> a) (z [Occ=Once1] :: t) -> + @a $dNum (h z) (fromInteger @a $dNum F5.f5g1)}]
 f5g = \ (@a) (@t) ($dNum :: Num a) (h :: t -> a) (z :: t) -> + @a $dNum (h z) (fromInteger @a $dNum F5.f5g1)
@@ -25,7 +25,7 @@ F5.$wf5h = \ (@a) (@t) (ww :: a -> a -> a) (ww1 :: Integer -> a) (w :: t -> a) (
 f5h [InlPrag=[2]] :: forall {a} {t}. Num a => (t -> a) -> t -> (t -> a) -> a
 [GblId,
  Arity=4,
- Str=<S(MCM(CS(U)),A,A,A,A,A,1C1(U))><1C1(U)><U><1C1(U)>,
+ Str=<SP(MCM(CS(U)),A,A,A,A,A,1C1(U))><1C1(U)><U><1C1(U)>,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True, WorkFree=True, Expandable=True, Guidance=ALWAYS_IF(arity=4,unsat_ok=True,boring_ok=False)
          Tmpl= \ (@a) (@t) (w [Occ=Once1!] :: Num a) (w1 [Occ=Once1] :: t -> a) (w2 [Occ=Once1] :: t) (w3 [Occ=Once1] :: t -> a) -> case w of { GHC.Num.C:Num ww1 [Occ=Once1] _ [Occ=Dead] _ [Occ=Dead] _ [Occ=Dead] _ [Occ=Dead] _ [Occ=Dead] ww7 [Occ=Once1] -> F5.$wf5h @a @t ww1 ww7 w1 w2 w3 }}]
 f5h = \ (@a) (@t) (w :: Num a) (w1 :: t -> a) (w2 :: t) (w3 :: t -> a) -> case w of { GHC.Num.C:Num ww1 ww2 ww3 ww4 ww5 ww6 ww7 -> F5.$wf5h @a @t ww1 ww7 w1 w2 w3 }


=====================================
testsuite/tests/arityanal/should_compile/Arity11.stderr
=====================================
@@ -35,7 +35,7 @@ end Rec }
 
 -- RHS size: {terms: 52, types: 28, coercions: 0, joins: 0/5}
 F11.$wfib [InlPrag=[2]] :: forall {a} {p}. (a -> a -> Bool) -> (Num a, Num p) => a -> p
-[GblId, Arity=4, Str=<MCM(CS(U))><U(A,UCU(CS(U)),A,A,A,A,UCU(U))><U(UCU(CS(U)),A,A,A,A,A,1C1(U))><U>, Unf=Unf{Src=<vanilla>, TopLvl=True, Value=True, ConLike=True, WorkFree=True, Expandable=True, Guidance=IF_ARGS [60 150 60 0] 460 0}]
+[GblId, Arity=4, Str=<MCM(CS(U))><UP(A,UCU(CS(U)),A,A,A,A,UCU(U))><UP(UCU(CS(U)),A,A,A,A,A,1C1(U))><U>, Unf=Unf{Src=<vanilla>, TopLvl=True, Value=True, ConLike=True, WorkFree=True, Expandable=True, Guidance=IF_ARGS [60 150 60 0] 460 0}]
 F11.$wfib
   = \ (@a) (@p) (ww :: a -> a -> Bool) (w :: Num a) (w1 :: Num p) (w2 :: a) ->
       let {
@@ -73,7 +73,7 @@ F11.$wfib
 fib [InlPrag=[2]] :: forall {a} {p}. (Eq a, Num a, Num p) => a -> p
 [GblId,
  Arity=4,
- Str=<S(MCM(CS(U)),A)><U(A,UCU(CS(U)),A,A,A,A,UCU(U))><U(UCU(CS(U)),A,A,A,A,A,UCU(U))><U>,
+ Str=<SP(MCM(CS(U)),A)><UP(A,UCU(CS(U)),A,A,A,A,UCU(U))><UP(UCU(CS(U)),A,A,A,A,A,UCU(U))><U>,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True, WorkFree=True, Expandable=True, Guidance=ALWAYS_IF(arity=4,unsat_ok=True,boring_ok=False)
          Tmpl= \ (@a) (@p) (w [Occ=Once1!] :: Eq a) (w1 [Occ=Once1] :: Num a) (w2 [Occ=Once1] :: Num p) (w3 [Occ=Once1] :: a) -> case w of { GHC.Classes.C:Eq ww1 [Occ=Once1] _ [Occ=Dead] -> F11.$wfib @a @p ww1 w1 w2 w3 }}]
 fib = \ (@a) (@p) (w :: Eq a) (w1 :: Num a) (w2 :: Num p) (w3 :: a) -> case w of { GHC.Classes.C:Eq ww1 ww2 -> F11.$wfib @a @p ww1 w1 w2 w3 }


=====================================
testsuite/tests/arityanal/should_compile/Arity14.stderr
=====================================
@@ -18,7 +18,7 @@ F14.f2 = 1
 
 -- RHS size: {terms: 35, types: 24, coercions: 0, joins: 0/3}
 F14.$wf14 [InlPrag=[2]] :: forall {t}. (t -> t -> Bool) -> Num t => t -> t -> t -> t
-[GblId, Arity=4, Str=<MCM(CS(U))><U(UCU(CS(U)),A,A,A,A,A,1C1(U))><U><U>, Unf=Unf{Src=<vanilla>, TopLvl=True, Value=True, ConLike=True, WorkFree=True, Expandable=True, Guidance=IF_ARGS [60 90 0 0] 300 0}]
+[GblId, Arity=4, Str=<MCM(CS(U))><UP(UCU(CS(U)),A,A,A,A,A,1C1(U))><U><U>, Unf=Unf{Src=<vanilla>, TopLvl=True, Value=True, ConLike=True, WorkFree=True, Expandable=True, Guidance=IF_ARGS [60 90 0 0] 300 0}]
 F14.$wf14
   = \ (@t) (ww :: t -> t -> Bool) (w :: Num t) (w1 :: t) (w2 :: t) ->
       let {
@@ -45,7 +45,7 @@ F14.$wf14
 f14 [InlPrag=[2]] :: forall {t}. (Ord t, Num t) => t -> t -> t -> t
 [GblId,
  Arity=4,
- Str=<S(A,A,MCM(CS(U)),A,A,A,A,A)><U(UCU(CS(U)),A,A,A,A,A,UCU(U))><U><U>,
+ Str=<SP(A,A,MCM(CS(U)),A,A,A,A,A)><UP(UCU(CS(U)),A,A,A,A,A,UCU(U))><U><U>,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True, WorkFree=True, Expandable=True, Guidance=ALWAYS_IF(arity=4,unsat_ok=True,boring_ok=False)
          Tmpl= \ (@t) (w [Occ=Once1!] :: Ord t) (w1 [Occ=Once1] :: Num t) (w2 [Occ=Once1] :: t) (w3 [Occ=Once1] :: t) -> case w of { GHC.Classes.C:Ord _ [Occ=Dead] _ [Occ=Dead] ww3 [Occ=Once1] _ [Occ=Dead] _ [Occ=Dead] _ [Occ=Dead] _ [Occ=Dead] _ [Occ=Dead] -> F14.$wf14 @t ww3 w1 w2 w3 }}]
 f14 = \ (@t) (w :: Ord t) (w1 :: Num t) (w2 :: t) (w3 :: t) -> case w of { GHC.Classes.C:Ord ww1 ww2 ww3 ww4 ww5 ww6 ww7 ww8 -> F14.$wf14 @t ww3 w1 w2 w3 }


=====================================
testsuite/tests/arityanal/should_compile/T18793.stderr
=====================================
@@ -4,14 +4,14 @@ Result size of Tidy Core = {terms: 81, types: 74, coercions: 0, joins: 0/0}
 
 -- RHS size: {terms: 20, types: 13, coercions: 0, joins: 0/0}
 T18793.$wstuff [InlPrag=NOINLINE] :: Int -> (# Int, [Int] #)
-[GblId, Arity=1, Str=<U(U)>, Unf=OtherCon []]
+[GblId, Arity=1, Str=<UP(U)>, Unf=OtherCon []]
 T18793.$wstuff = \ (w :: Int) -> (# w, GHC.Types.: @Int (case w of { GHC.Types.I# x -> GHC.Types.I# (GHC.Prim.+# x 1#) }) (GHC.Types.: @Int (case w of { GHC.Types.I# x -> GHC.Types.I# (GHC.Prim.+# x 2#) }) (GHC.Types.[] @Int)) #)
 
 -- RHS size: {terms: 8, types: 11, coercions: 0, joins: 0/0}
 stuff [InlPrag=[final]] :: Int -> [Int]
 [GblId,
  Arity=1,
- Str=<U(U)>,
+ Str=<UP(U)>,
  Cpr=m2,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True, WorkFree=True, Expandable=True, Guidance=ALWAYS_IF(arity=1,unsat_ok=True,boring_ok=False)
          Tmpl= \ (w [Occ=Once1] :: Int) -> case T18793.$wstuff w of { (# ww1 [Occ=Once1], ww2 [Occ=Once1] #) -> GHC.Types.: @Int ww1 ww2 }}]
@@ -39,7 +39,7 @@ end Rec }
 T18793.f_go1 [InlPrag=[2]] :: [Int] -> Int -> Int
 [GblId,
  Arity=2,
- Str=<SU><S(U)>,
+ Str=<SU><SP(U)>,
  Cpr=m1,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True, WorkFree=True, Expandable=True, Guidance=ALWAYS_IF(arity=2,unsat_ok=True,boring_ok=False)
          Tmpl= \ (w [Occ=Once1] :: [Int]) (w1 [Occ=Once1!] :: Int) -> case w1 of { GHC.Types.I# ww1 [Occ=Once1] -> case T18793.$wgo1 w ww1 of ww2 [Occ=Once1] { __DEFAULT -> GHC.Types.I# ww2 } }}]
@@ -59,7 +59,7 @@ T18793.f1 = case T18793.$wstuff T18793.f2 of { (# ww1, ww2 #) -> GHC.Types.: @In
 f :: Int -> Int
 [GblId,
  Arity=1,
- Str=<S(U)>,
+ Str=<SP(U)>,
  Cpr=m1,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True, WorkFree=True, Expandable=True, Guidance=ALWAYS_IF(arity=0,unsat_ok=True,boring_ok=False)
          Tmpl= \ (eta [Occ=Once1] :: Int) -> T18793.f_go1 T18793.f1 eta}]


=====================================
testsuite/tests/numeric/should_compile/T7116.stdout
=====================================
@@ -43,7 +43,7 @@ T7116.$trModule
 dr :: Double -> Double
 [GblId,
  Arity=1,
- Str=<S(U)>,
+ Str=<SP(U)>,
  Cpr=m1,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True,
          WorkFree=True, Expandable=True,
@@ -60,7 +60,7 @@ dr
 dl :: Double -> Double
 [GblId,
  Arity=1,
- Str=<S(U)>,
+ Str=<SP(U)>,
  Cpr=m1,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True,
          WorkFree=True, Expandable=True,
@@ -73,7 +73,7 @@ dl = dr
 fr :: Float -> Float
 [GblId,
  Arity=1,
- Str=<S(U)>,
+ Str=<SP(U)>,
  Cpr=m1,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True,
          WorkFree=True, Expandable=True,
@@ -92,7 +92,7 @@ fr
 fl :: Float -> Float
 [GblId,
  Arity=1,
- Str=<S(U)>,
+ Str=<SP(U)>,
  Cpr=m1,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True,
          WorkFree=True, Expandable=True,


=====================================
testsuite/tests/simplCore/should_compile/T13143.stderr
=====================================
@@ -89,7 +89,7 @@ end Rec }
 g [InlPrag=[2]] :: Bool -> Bool -> Int -> Int
 [GblId,
  Arity=3,
- Str=<SU><SU><S(U)>,
+ Str=<SU><SU><SP(U)>,
  Cpr=m1,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True,
          WorkFree=True, Expandable=True,


=====================================
testsuite/tests/simplCore/should_compile/T13543.stderr
=====================================
@@ -1,8 +1,8 @@
 
 ==================== Strictness signatures ====================
 Foo.$trModule:
-Foo.f: <S(SU)><S(U)><S(U)>
-Foo.g: <S(S(U),S(U))>
+Foo.f: <SP(SU)><SP(U)><SP(U)>
+Foo.g: <SP(SP(U),SP(U))>
 
 
 
@@ -15,7 +15,7 @@ Foo.g: m1
 
 ==================== Strictness signatures ====================
 Foo.$trModule:
-Foo.f: <S(SU)><S(U)><S(U)>
-Foo.g: <S(S(U),S(U))>
+Foo.f: <SP(SU)><SP(U)><SP(U)>
+Foo.g: <SP(SP(U),SP(U))>
 
 


=====================================
testsuite/tests/simplCore/should_compile/T3717.stderr
=====================================
@@ -56,7 +56,7 @@ end Rec }
 foo [InlPrag=[2]] :: Int -> Int
 [GblId,
  Arity=1,
- Str=<S(SU)>,
+ Str=<SP(SU)>,
  Cpr=m1,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True,
          WorkFree=True, Expandable=True,


=====================================
testsuite/tests/simplCore/should_compile/T3772.stdout
=====================================
@@ -65,7 +65,7 @@ T3772.$wfoo
 foo [InlPrag=[final]] :: Int -> ()
 [GblId,
  Arity=1,
- Str=<S(U)>,
+ Str=<SP(U)>,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True,
          WorkFree=True, Expandable=True,
          Guidance=ALWAYS_IF(arity=1,unsat_ok=True,boring_ok=False)


=====================================
testsuite/tests/simplCore/should_compile/T4908.stderr
=====================================
@@ -59,7 +59,7 @@ end Rec }
 T4908.$wf [InlPrag=[2]] :: Int# -> (Int, Int) -> Bool
 [GblId,
  Arity=2,
- Str=<SU><1(A,1(1U))>,
+ Str=<SU><1P(A,1P(1U))>,
  Unf=Unf{Src=<vanilla>, TopLvl=True, Value=True, ConLike=True,
          WorkFree=True, Expandable=True, Guidance=IF_ARGS [30 20] 101 20}]
 T4908.$wf
@@ -81,7 +81,7 @@ T4908.$wf
 f [InlPrag=[2]] :: Int -> (Int, Int) -> Bool
 [GblId,
  Arity=2,
- Str=<S(SU)><1(A,1(1U))>,
+ Str=<SP(SU)><1P(A,1P(1U))>,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True,
          WorkFree=True, Expandable=True,
          Guidance=ALWAYS_IF(arity=2,unsat_ok=True,boring_ok=False)


=====================================
testsuite/tests/simplCore/should_compile/T4930.stderr
=====================================
@@ -56,7 +56,7 @@ end Rec }
 foo [InlPrag=[2]] :: Int -> Int
 [GblId,
  Arity=1,
- Str=<S(U)>,
+ Str=<SP(U)>,
  Cpr=m1,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True,
          WorkFree=True, Expandable=True,


=====================================
testsuite/tests/simplCore/should_compile/spec-inline.stderr
=====================================
@@ -143,7 +143,7 @@ Roman.foo1 = GHC.Maybe.Just @Int Roman.foo2
 foo :: Int -> Int
 [GblId,
  Arity=1,
- Str=<S(U)>,
+ Str=<SP(U)>,
  Cpr=m1,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True,
          WorkFree=True, Expandable=True,


=====================================
testsuite/tests/stranal/should_compile/T10694.stderr
=====================================
@@ -4,32 +4,32 @@ Result size of Tidy Core = {terms: 74, types: 65, coercions: 0, joins: 0/4}
 
 -- RHS size: {terms: 39, types: 25, coercions: 0, joins: 0/4}
 T10694.$wpm [InlPrag=NOINLINE] :: Int -> Int -> (# Int, Int #)
-[GblId, Arity=2, Str=<U(U)><U(U)>, Unf=OtherCon []]
+[GblId, Arity=2, Str=<UP(U)><UP(U)>, Unf=OtherCon []]
 T10694.$wpm
   = \ (w :: Int) (w1 :: Int) ->
       let {
-        lvl :: Int
+        l :: Int
         [LclId]
-        lvl = case w of { GHC.Types.I# x -> case w1 of { GHC.Types.I# y -> GHC.Types.I# (GHC.Prim.+# x y) } } } in
+        l = case w of { GHC.Types.I# x -> case w1 of { GHC.Types.I# y -> GHC.Types.I# (GHC.Prim.+# x y) } } } in
       let {
-        lvl1 :: Int
+        l1 :: Int
         [LclId]
-        lvl1 = case w of { GHC.Types.I# x -> case w1 of { GHC.Types.I# y -> GHC.Types.I# (GHC.Prim.-# x y) } } } in
+        l1 = case w of { GHC.Types.I# x -> case w1 of { GHC.Types.I# y -> GHC.Types.I# (GHC.Prim.-# x y) } } } in
       let {
-        l :: [Int]
+        l2 :: [Int]
         [LclId, Unf=OtherCon []]
-        l = GHC.Types.: @Int lvl1 (GHC.Types.[] @Int) } in
+        l2 = GHC.Types.: @Int l1 (GHC.Types.[] @Int) } in
       let {
-        l1 :: [Int]
+        l3 :: [Int]
         [LclId, Unf=OtherCon []]
-        l1 = GHC.Types.: @Int lvl l } in
-      (# GHC.List.$w!! @Int l1 0#, GHC.List.$w!! @Int l1 1# #)
+        l3 = GHC.Types.: @Int l l2 } in
+      (# GHC.List.$w!! @Int l3 0#, GHC.List.$w!! @Int l3 1# #)
 
 -- RHS size: {terms: 10, types: 11, coercions: 0, joins: 0/0}
 pm [InlPrag=[final]] :: Int -> Int -> (Int, Int)
 [GblId,
  Arity=2,
- Str=<U(U)><U(U)>,
+ Str=<UP(U)><UP(U)>,
  Cpr=m1,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True, WorkFree=True, Expandable=True,
          Guidance=ALWAYS_IF(arity=2,unsat_ok=True,boring_ok=False)
@@ -41,7 +41,7 @@ pm = \ (w :: Int) (w1 :: Int) -> case T10694.$wpm w w1 of { (# ww1, ww2 #) -> (w
 m :: Int -> Int -> Int
 [GblId,
  Arity=2,
- Str=<U(U)><U(U)>,
+ Str=<UP(U)><UP(U)>,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True, WorkFree=True, Expandable=True,
          Guidance=ALWAYS_IF(arity=2,unsat_ok=True,boring_ok=False)
          Tmpl= \ (x [Occ=Once1] :: Int) (y [Occ=Once1] :: Int) -> case pm x y of { (_ [Occ=Dead], mr [Occ=Once1]) -> mr }}]


=====================================
testsuite/tests/stranal/should_compile/T18903.stderr
=====================================
@@ -57,13 +57,13 @@ T18903.h2 = GHC.Types.I# -2#
 T18903.$wh [InlPrag=[2]] :: GHC.Prim.Int# -> Int
 [GblId,
  Arity=1,
- Str=<S*U>,
+ Str=<MU>,
  Unf=Unf{Src=<vanilla>, TopLvl=True, Value=True, ConLike=True,
          WorkFree=True, Expandable=True, Guidance=IF_ARGS [70] 262 10}]
 T18903.$wh
   = \ (ww :: GHC.Prim.Int#) ->
       let {
-        $wg [InlPrag=NOINLINE, Dmd=1C1((1(U),S(U)))]
+        $wg [InlPrag=NOINLINE, Dmd=1C1(P(1P(U),SP(U)))]
           :: GHC.Prim.Int# -> (# Int, Int #)
         [LclId, Arity=1, Str=<SU>, Unf=OtherCon []]
         $wg
@@ -96,7 +96,7 @@ T18903.$wh
 h [InlPrag=[2]] :: Int -> Int
 [GblId,
  Arity=1,
- Str=<S(S*U)>,
+ Str=<SP(MU)>,
  Unf=Unf{Src=InlineStable, TopLvl=True, Value=True, ConLike=True,
          WorkFree=True, Expandable=True,
          Guidance=ALWAYS_IF(arity=1,unsat_ok=True,boring_ok=False)


=====================================
testsuite/tests/stranal/sigs/BottomFromInnerLambda.stderr
=====================================
@@ -1,8 +1,8 @@
 
 ==================== Strictness signatures ====================
 BottomFromInnerLambda.$trModule:
-BottomFromInnerLambda.expensive: <S(MU)>
-BottomFromInnerLambda.f: <S(MU)>
+BottomFromInnerLambda.expensive: <SP(MU)>
+BottomFromInnerLambda.f: <SP(MU)>
 
 
 
@@ -15,7 +15,7 @@ BottomFromInnerLambda.f:
 
 ==================== Strictness signatures ====================
 BottomFromInnerLambda.$trModule:
-BottomFromInnerLambda.expensive: <S(SU)>
-BottomFromInnerLambda.f: <S(SU)>
+BottomFromInnerLambda.expensive: <SP(SU)>
+BottomFromInnerLambda.f: <SP(SU)>
 
 


=====================================
testsuite/tests/stranal/sigs/CaseBinderCPR.stderr
=====================================
@@ -1,7 +1,7 @@
 
 ==================== Strictness signatures ====================
 CaseBinderCPR.$trModule:
-CaseBinderCPR.f_list_cmp: <UCU(CS((MU)))><SU><SU>
+CaseBinderCPR.f_list_cmp: <UCU(CS(P(MU)))><SU><SU>
 
 
 
@@ -13,6 +13,6 @@ CaseBinderCPR.f_list_cmp: m1
 
 ==================== Strictness signatures ====================
 CaseBinderCPR.$trModule:
-CaseBinderCPR.f_list_cmp: <UCU(CS((SU)))><SU><SU>
+CaseBinderCPR.f_list_cmp: <UCU(CS(P(SU)))><SU><SU>
 
 


=====================================
testsuite/tests/stranal/sigs/DmdAnalGADTs.stderr
=====================================
@@ -9,7 +9,7 @@ DmdAnalGADTs.f: <SU>
 DmdAnalGADTs.f': <SU>
 DmdAnalGADTs.g: <SU>
 DmdAnalGADTs.hasCPR:
-DmdAnalGADTs.hasStrSig: <S(U)>
+DmdAnalGADTs.hasStrSig: <SP(U)>
 
 
 
@@ -37,6 +37,6 @@ DmdAnalGADTs.f: <SU>
 DmdAnalGADTs.f': <SU>
 DmdAnalGADTs.g: <SU>
 DmdAnalGADTs.hasCPR:
-DmdAnalGADTs.hasStrSig: <S(U)>
+DmdAnalGADTs.hasStrSig: <SP(U)>
 
 


=====================================
testsuite/tests/stranal/sigs/HyperStrUse.stderr
=====================================
@@ -1,7 +1,7 @@
 
 ==================== Strictness signatures ====================
 HyperStrUse.$trModule:
-HyperStrUse.f: <S(S(U),A)><SU>
+HyperStrUse.f: <SP(SP(U),A)><SU>
 
 
 
@@ -13,6 +13,6 @@ HyperStrUse.f: m1
 
 ==================== Strictness signatures ====================
 HyperStrUse.$trModule:
-HyperStrUse.f: <S(S(U),A)><SU>
+HyperStrUse.f: <SP(SP(U),A)><SU>
 
 


=====================================
testsuite/tests/stranal/sigs/NewtypeArity.stderr
=====================================
@@ -3,8 +3,8 @@
 Test.$tc'MkT:
 Test.$tcT:
 Test.$trModule:
-Test.t: <S(U)><S(U)>
-Test.t2: <S(U)><S(U)>
+Test.t: <SP(U)><SP(U)>
+Test.t2: <SP(U)><SP(U)>
 
 
 
@@ -21,7 +21,7 @@ Test.t2: m1
 Test.$tc'MkT:
 Test.$tcT:
 Test.$trModule:
-Test.t: <S(U)><S(U)>
-Test.t2: <S(U)><S(U)>
+Test.t: <SP(U)><SP(U)>
+Test.t2: <SP(U)><SP(U)>
 
 


=====================================
testsuite/tests/stranal/sigs/T12370.stderr
=====================================
@@ -1,8 +1,8 @@
 
 ==================== Strictness signatures ====================
 T12370.$trModule:
-T12370.bar: <S(U)><S(U)>
-T12370.foo: <S(S(U),S(U))>
+T12370.bar: <SP(U)><SP(U)>
+T12370.foo: <SP(SP(U),SP(U))>
 
 
 
@@ -15,7 +15,7 @@ T12370.foo: m1
 
 ==================== Strictness signatures ====================
 T12370.$trModule:
-T12370.bar: <S(U)><S(U)>
-T12370.foo: <S(S(U),S(U))>
+T12370.bar: <SP(U)><SP(U)>
+T12370.foo: <SP(SP(U),SP(U))>
 
 


=====================================
testsuite/tests/stranal/sigs/T13380f.stderr
=====================================
@@ -1,9 +1,9 @@
 
 ==================== Strictness signatures ====================
 T13380f.$trModule:
-T13380f.f: <S(U)><S(U)><U>
-T13380f.g: <S(U)><1(U)><U>
-T13380f.h: <S(U)><1(U)><U>
+T13380f.f: <SP(U)><SP(U)><U>
+T13380f.g: <SP(U)><1P(U)><U>
+T13380f.h: <SP(U)><1P(U)><U>
 T13380f.interruptibleCall: <U>
 T13380f.safeCall: <U>
 T13380f.unsafeCall: <U>
@@ -23,9 +23,9 @@ T13380f.unsafeCall:
 
 ==================== Strictness signatures ====================
 T13380f.$trModule:
-T13380f.f: <S(U)><S(U)><U>
-T13380f.g: <S(U)><1(U)><U>
-T13380f.h: <S(U)><1(U)><U>
+T13380f.f: <SP(U)><SP(U)><U>
+T13380f.g: <SP(U)><1P(U)><U>
+T13380f.h: <SP(U)><1P(U)><U>
 T13380f.interruptibleCall: <U>
 T13380f.safeCall: <U>
 T13380f.unsafeCall: <U>


=====================================
testsuite/tests/stranal/sigs/T17932.stderr
=====================================
@@ -5,7 +5,7 @@ T17932.$tc'X:
 T17932.$tcOptions:
 T17932.$tcX:
 T17932.$trModule:
-T17932.flags: <S(SU,SU)>
+T17932.flags: <SP(SU,SU)>
 
 
 
@@ -25,6 +25,6 @@ T17932.$tc'X:
 T17932.$tcOptions:
 T17932.$tcX:
 T17932.$trModule:
-T17932.flags: <S(SU,SU)>
+T17932.flags: <SP(SU,SU)>
 
 


=====================================
testsuite/tests/stranal/sigs/T5075.stderr
=====================================
@@ -1,7 +1,7 @@
 
 ==================== Strictness signatures ====================
 T5075.$trModule:
-T5075.loop: <M(A,A,MCM(CS(U)),A,A,A,A,A)><U(A,A,UCU(CS(U)),A,A,A,UCU(U))><U>
+T5075.loop: <MP(A,A,MCM(CS(U)),A,A,A,A,A)><UP(A,A,UCU(CS(U)),A,A,A,UCU(U))><U>
 
 
 
@@ -13,6 +13,6 @@ T5075.loop:
 
 ==================== Strictness signatures ====================
 T5075.$trModule:
-T5075.loop: <S(A,A,MCM(CS(U)),A,A,A,A,A)><U(A,A,UCU(CS(U)),A,A,A,UCU(U))><U>
+T5075.loop: <SP(A,A,MCM(CS(U)),A,A,A,A,A)><UP(A,A,UCU(CS(U)),A,A,A,UCU(U))><U>
 
 


=====================================
testsuite/tests/stranal/sigs/T8598.stderr
=====================================
@@ -1,7 +1,7 @@
 
 ==================== Strictness signatures ====================
 T8598.$trModule:
-T8598.fun: <S(U)>
+T8598.fun: <SP(U)>
 
 
 
@@ -13,6 +13,6 @@ T8598.fun: m1
 
 ==================== Strictness signatures ====================
 T8598.$trModule:
-T8598.fun: <S(U)>
+T8598.fun: <SP(U)>
 
 


=====================================
testsuite/tests/stranal/sigs/UnsatFun.stderr
=====================================
@@ -1,10 +1,10 @@
 
 ==================== Strictness signatures ====================
 UnsatFun.$trModule:
-UnsatFun.f: <S(M)><B>b
-UnsatFun.g: <S(M)>b
-UnsatFun.g': <1(U)>
-UnsatFun.g3: <U(U)>
+UnsatFun.f: <SP(M)><B>b
+UnsatFun.g: <SP(M)>b
+UnsatFun.g': <1P(U)>
+UnsatFun.g3: <UP(U)>
 UnsatFun.h: <SCS(U)>
 UnsatFun.h2: <SU><1C1(U)>
 UnsatFun.h3: <SCS(U)>
@@ -25,10 +25,10 @@ UnsatFun.h3: m1
 
 ==================== Strictness signatures ====================
 UnsatFun.$trModule:
-UnsatFun.f: <S(M)><B>b
-UnsatFun.g: <S(M)>b
-UnsatFun.g': <1(U)>
-UnsatFun.g3: <U(U)>
+UnsatFun.f: <SP(M)><B>b
+UnsatFun.g: <SP(M)>b
+UnsatFun.g': <1P(U)>
+UnsatFun.g3: <UP(U)>
 UnsatFun.h: <SCS(U)>
 UnsatFun.h2: <SU><1C1(U)>
 UnsatFun.h3: <SCS(U)>



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

-- 
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/c887ca0d764e30a1c86ce6e4ec011b7a7e3dd407
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/20201109/e7006627/attachment-0001.html>


More information about the ghc-commits mailing list