[Git][ghc/ghc][wip/T25647] fix up T25647_fail
Patrick (@soulomoon)
gitlab at gitlab.haskell.org
Thu Feb 6 12:34:59 UTC 2025
Patrick pushed to branch wip/T25647 at Glasgow Haskell Compiler / GHC
Commits:
17ff8a1c by Patrick at 2025-02-06T20:34:01+08:00
fix up T25647_fail
- - - - -
2 changed files:
- testsuite/tests/typecheck/should_compile/T25647_fail.hs
- testsuite/tests/typecheck/should_compile/T25647_fail.stderr
Changes:
=====================================
testsuite/tests/typecheck/should_compile/T25647_fail.hs
=====================================
@@ -1,6 +1,6 @@
{-# LANGUAGE DataKinds, UnliftedNewtypes, TypeFamilies, PolyKinds, MagicHash #-}
-module T25647 where
+module T25647_fail where
import GHC.Exts
import Data.Kind
=====================================
testsuite/tests/typecheck/should_compile/T25647_fail.stderr
=====================================
@@ -1 +1,13 @@
-
\ No newline at end of file
+T25647_fail.hs:12:4: [GHC-89498]
+ A newtype must not be a GADT
+ In2 :: forall (ff :: * -> *).
+ ff (Fix2 @LiftedRep ff) -> Fix2 @LiftedRep ff
+ In the definition of data constructor ‘In2’
+ In the newtype declaration for ‘Fix2’
+
+T25647_fail.hs:17:3: [GHC-89498]
+ A newtype must not be a GADT
+ In4a :: forall (ff :: * -> *).
+ ff (Fix4a @LiftedRep ff) -> Fix4a @LiftedRep ff
+ In the definition of data constructor ‘In4a’
+ In the newtype declaration for ‘Fix4a’
\ No newline at end of file
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/17ff8a1c012673df292216174cb3ce5b845063f9
--
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/17ff8a1c012673df292216174cb3ce5b845063f9
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/20250206/d4511888/attachment-0001.html>
More information about the ghc-commits
mailing list