[commit: ghc] master: Test Trac #11640 (f6e58be)

git at git.haskell.org git at git.haskell.org
Tue May 10 14:11:10 UTC 2016


Repository : ssh://git@git.haskell.org/ghc

On branch  : master
Link       : http://ghc.haskell.org/trac/ghc/changeset/f6e58be297f97e8871396f80a81fe3a9984d77b9/ghc

>---------------------------------------------------------------

commit f6e58be297f97e8871396f80a81fe3a9984d77b9
Author: Simon Peyton Jones <simonpj at microsoft.com>
Date:   Tue May 10 15:14:11 2016 +0100

    Test Trac #11640


>---------------------------------------------------------------

f6e58be297f97e8871396f80a81fe3a9984d77b9
 testsuite/tests/polykinds/T11640.hs | 7 +++++++
 testsuite/tests/polykinds/all.T     | 1 +
 2 files changed, 8 insertions(+)

diff --git a/testsuite/tests/polykinds/T11640.hs b/testsuite/tests/polykinds/T11640.hs
new file mode 100644
index 0000000..16d9f7c
--- /dev/null
+++ b/testsuite/tests/polykinds/T11640.hs
@@ -0,0 +1,7 @@
+{-# LANGUAGE RankNTypes, TypeInType #-}
+
+module T11640 where
+
+import Data.Kind
+
+data HEq :: forall k1. k1 -> forall k2. k2 -> Type where
diff --git a/testsuite/tests/polykinds/all.T b/testsuite/tests/polykinds/all.T
index f2e274b..2c3d1df 100644
--- a/testsuite/tests/polykinds/all.T
+++ b/testsuite/tests/polykinds/all.T
@@ -147,3 +147,4 @@ test('T11648', normal, compile, [''])
 test('T11648b', normal, compile_fail, [''])
 test('KindVType', normal, compile_fail, [''])
 test('T11821', normal, compile, [''])
+test('T11640', normal, compile, [''])



More information about the ghc-commits mailing list