[Git][ghc/ghc][wip/spj-comments] Add test for #22238

Simon Peyton Jones (@simonpj) gitlab at gitlab.haskell.org
Fri Dec 8 10:43:33 UTC 2023



Simon Peyton Jones pushed to branch wip/spj-comments at Glasgow Haskell Compiler / GHC


Commits:
116e7b79 by Simon Peyton Jones at 2023-12-08T10:43:03+00:00
Add test for #22238

- - - - -


2 changed files:

- + testsuite/tests/quantified-constraints/T22238.hs
- testsuite/tests/quantified-constraints/all.T


Changes:

=====================================
testsuite/tests/quantified-constraints/T22238.hs
=====================================
@@ -0,0 +1,12 @@
+{-# LANGUAGE ImpredicativeTypes #-}
+{-# LANGUAGE GADTs #-}
+
+module T22238 where
+
+import Data.Kind (Constraint)
+
+data Dict (c :: Constraint) where
+    MkDict :: c => Dict c
+
+forallListEqDict :: Dict (forall a. Eq a => Eq [a])
+forallListEqDict = MkDict


=====================================
testsuite/tests/quantified-constraints/all.T
=====================================
@@ -44,3 +44,4 @@ test('T19690', normal, compile_fail, [''])
 test('T23143', normal, compile, [''])
 test('T23333', normal, compile, [''])
 test('T23323', normal, compile, [''])
+test('T22238', normal, compile, [''])



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

-- 
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/116e7b790c25b47877b6b1a7c47c0cbf0257fe1e
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/20231208/770128fb/attachment-0001.html>


More information about the ghc-commits mailing list