[Git][ghc/ghc][wip/T25647] update tests to reflect changes in error messages

Patrick (@soulomoon) gitlab at gitlab.haskell.org
Wed Mar 12 00:30:36 UTC 2025



Patrick pushed to branch wip/T25647 at Glasgow Haskell Compiler / GHC


Commits:
a3b1fedd by Patrick at 2025-03-12T08:29:52+08:00
update tests to reflect changes in error messages

- - - - -


9 changed files:

- testsuite/tests/indexed-types/should_fail/SimpleFail2a.hs
- testsuite/tests/indexed-types/should_fail/SimpleFail2a.stderr
- testsuite/tests/indexed-types/should_fail/SimpleFail9.hs
- testsuite/tests/indexed-types/should_fail/SimpleFail9.stderr
- testsuite/tests/indexed-types/should_fail/T14230a.hs
- testsuite/tests/indexed-types/should_fail/T14230a.stderr
- testsuite/tests/indexed-types/should_fail/T14246.stderr
- testsuite/tests/typecheck/should_compile/T25725.hs
- testsuite/tests/typecheck/should_fail/T18640b.stderr


Changes:

=====================================
testsuite/tests/indexed-types/should_fail/SimpleFail2a.hs
=====================================
@@ -8,7 +8,8 @@ class C a where
   type St a :: *
 
 instance C Int where
-  data    Sd a = MkSd -- :: *   -- Looks like a nullary data instance decl
+  data    forall a. Sd a = MkSd -- :: *   -- Looks like a nullary data instance decl
+  data    Sd a = MkSk -- same as: Sd Int = MkSk
   data    Sd Int = SdC Char
   newtype Sn Int = SnC Char
   type    St Int = Char


=====================================
testsuite/tests/indexed-types/should_fail/SimpleFail2a.stderr
=====================================
@@ -5,8 +5,13 @@ SimpleFail2a.hs:11:3: error: [GHC-95424]
     • In the associated data family instance declaration for ‘Sd’
       In the instance declaration for ‘C Int’
 
-SimpleFail2a.hs:11:11: error: [GHC-34447]
+SimpleFail2a.hs:11:21: error: [GHC-34447]
     Conflicting family instance declarations:
-      Sd a -- Defined at SimpleFail2a.hs:11:11
+      Sd a -- Defined at SimpleFail2a.hs:11:21
       Sd Int -- Defined at SimpleFail2a.hs:12:11
 
+SimpleFail2a.hs:11:21: error: [GHC-34447]
+    Conflicting family instance declarations:
+      Sd a -- Defined at SimpleFail2a.hs:11:21
+      Sd Int -- Defined at SimpleFail2a.hs:13:11
+


=====================================
testsuite/tests/indexed-types/should_fail/SimpleFail9.hs
=====================================
@@ -10,7 +10,12 @@ class C7 a b where
 instance C7 Char (a, Bool) where
   data S7 (a, Bool) = S7_1
 
+-- this is fine, b can represent any type
+instance C7 Char (a, String) where
+  data S7 (b, String) = S7_3
+
 -- Fails because the arg to S7 should be the
 -- same as that to C7
 instance C7 Char (a, Int) where
-  data S7 (b, Int) = S7_2
+  data forall b. S7 (b, Int) = S7_2
+


=====================================
testsuite/tests/indexed-types/should_fail/SimpleFail9.stderr
=====================================
@@ -1,4 +1,4 @@
-SimpleFail9.hs:16:3: error: [GHC-95424]
+SimpleFail9.hs:20:3: error: [GHC-95424]
     • Type indexes must match class instance head
       Expected: S7 (a, Int)
         Actual: S7 (b, Int)


=====================================
testsuite/tests/indexed-types/should_fail/T14230a.hs
=====================================
@@ -8,7 +8,7 @@ module T14230a where
 import Data.Kind
 
 class C a where
-  data CD k (a :: k) :: k -> *
+  data CD k (a :: k) :: k -> Type
 
 instance C (Maybe a) where
-  data CD k (a :: k -> *) :: (k -> *) -> *
+  data CD k (a :: Type) :: Type -> Type


=====================================
testsuite/tests/indexed-types/should_fail/T14230a.stderr
=====================================
@@ -1,7 +1,7 @@
 T14230a.hs:14:3: error: [GHC-95424]
     • Type indexes must match class instance head
       Expected: CD (*) (Maybe a)
-        Actual: CD k a
+        Actual: CD (*) a
     • In the associated data family instance declaration for ‘CD’
       In the instance declaration for ‘C (Maybe a)’
 


=====================================
testsuite/tests/indexed-types/should_fail/T14246.stderr
=====================================
@@ -1,11 +1,11 @@
-
 T14246.hs:20:5: error: [GHC-91510]
     • Illegal polymorphic type: forall (t :: v). f t
     • In the equations for closed type family ‘KLN’
       In the type family declaration for ‘KLN’
 
 T14246.hs:25:27: error: [GHC-83865]
-    • Couldn't match kind ‘*’ with ‘L’
+    • Couldn't match kind: S (KLN (f t))
+                     with: KLN f
       Expected kind ‘Vect (KLN f) L’,
         but ‘Cons (Label (t :: v)) l’ has kind ‘Vect (S (KLN (f t))) (*)’
     • In the second argument of ‘Reveal’, namely
@@ -25,3 +25,4 @@ T14246.hs:26:24: error: [GHC-83865]
       Expected kind ‘Vect (KLN a) L’, but ‘Nil’ has kind ‘Vect Z L’
     • In the second argument of ‘Reveal’, namely ‘Nil’
       In the type family declaration for ‘Reveal’
+


=====================================
testsuite/tests/typecheck/should_compile/T25725.hs
=====================================
@@ -1,4 +1,4 @@
-{-# LANGUAGE TypeFamilies, PolyKinds #-}
+{-# LANGUAGE TypeFamilies, PolyKinds, UnliftedNewtypes #-}
 
 module T25725 where
 
@@ -14,4 +14,19 @@ data family Dix4 :: Type -> k
 data instance Dix4 Int :: TYPE r -> Type where
   DIn4 :: p -> Dix4 Int p
 
+data family Dix5 :: TYPE r -> TYPE r
+newtype instance Dix5 f :: TYPE c where
+  DIn5 :: g -> (Dix5 g :: TYPE k)
+
+-- data family Dix6 :: TYPE r -> TYPE r
+-- newtype instance Dix6 f :: TYPE r where
+--   DIn6 :: l -> Dix6 l
+
+-- this one would be rejected
+--  in data con sig, we have (Dix6 f) :: Type,
+--  but in newtype instance, we have (Dix6 f) :: TYPE r
+--  we need coercion between Type and TYPE r
+--  which is not possible for newtypes
+
+
 


=====================================
testsuite/tests/typecheck/should_fail/T18640b.stderr
=====================================
@@ -1,12 +1,12 @@
-
 T18640b.hs:14:10: error: [GHC-25897]
-    • Couldn't match kind ‘k’ with ‘a’
+    • Couldn't match kind ‘a’ with ‘k’
       Expected kind ‘forall b -> a’, but ‘F1’ has kind ‘forall k -> k’
-      ‘k’ is a rigid type variable bound by
-        the type k
-        at T18640b.hs:14:3-11
       ‘a’ is a rigid type variable bound by
         a family instance declaration
         at T18640b.hs:14:6
+      ‘k’ is a rigid type variable bound by
+        the type k
+        at T18640b.hs:14:3-11
     • In the type ‘F1’
       In the type family declaration for ‘F3’
+



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

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


More information about the ghc-commits mailing list