[commit: ghc] master: Add a test case for #15829 (331081b)

git at git.haskell.org git at git.haskell.org
Mon Oct 29 17:01:41 UTC 2018


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

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

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

commit 331081b03f67c94b908136339aebf36d07d45c21
Author: Ryan Scott <ryan.gl.scott at gmail.com>
Date:   Mon Oct 29 12:59:46 2018 -0400

    Add a test case for #15829
    
    This happened to get fixed as a consequence of commit
    5e45ad10ffca1ad175b10f6ef3327e1ed8ba25f3. This adds a test case
    to ensure that it stays fixed.


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

331081b03f67c94b908136339aebf36d07d45c21
 testsuite/tests/dependent/should_compile/T15829.hs | 9 +++++++++
 testsuite/tests/dependent/should_compile/all.T     | 1 +
 2 files changed, 10 insertions(+)

diff --git a/testsuite/tests/dependent/should_compile/T15829.hs b/testsuite/tests/dependent/should_compile/T15829.hs
new file mode 100644
index 0000000..ec6f5d1
--- /dev/null
+++ b/testsuite/tests/dependent/should_compile/T15829.hs
@@ -0,0 +1,9 @@
+{-# LANGUAGE DataKinds #-}
+{-# LANGUAGE PolyKinds #-}
+module T15829 where
+
+import Data.Kind
+
+data A :: Type -> Type
+data B a :: A a -> Type
+type C a = B a
diff --git a/testsuite/tests/dependent/should_compile/all.T b/testsuite/tests/dependent/should_compile/all.T
index 341a44c..632ef40 100644
--- a/testsuite/tests/dependent/should_compile/all.T
+++ b/testsuite/tests/dependent/should_compile/all.T
@@ -64,3 +64,4 @@ test('T15743e', normal, compile, ['-ddump-types -fprint-explicit-foralls'])
 test('T15076', normal, compile, [''])
 test('T15076b', normal, compile, [''])
 test('T15076c', normal, compile, [''])
+test('T15829', normal, compile, [''])



More information about the ghc-commits mailing list