[commit: ghc] master: Actually add test for #15859. (5693ddd)

git at git.haskell.org git at git.haskell.org
Tue Nov 6 03:53:01 UTC 2018


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

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

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

commit 5693ddd071033516a1804420a903cb7e3677682b
Author: Richard Eisenberg <rae at cs.brynmawr.edu>
Date:   Mon Nov 5 22:51:58 2018 -0500

    Actually add test for #15859.
    
    Oops. Forgot to `git add`.


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

5693ddd071033516a1804420a903cb7e3677682b
 testsuite/tests/dependent/should_fail/T15859.hs | 13 +++++++++++++
 1 file changed, 13 insertions(+)

diff --git a/testsuite/tests/dependent/should_fail/T15859.hs b/testsuite/tests/dependent/should_fail/T15859.hs
new file mode 100644
index 0000000..e8ffdf4
--- /dev/null
+++ b/testsuite/tests/dependent/should_fail/T15859.hs
@@ -0,0 +1,13 @@
+{-# Language PolyKinds          #-}
+{-# Language TypeApplications   #-}
+{-# Language ImpredicativeTypes #-}
+
+module T15859 where
+
+import Data.Kind
+
+data A k :: k -> Type
+
+type KindOf (a :: k) = k
+
+a = (undefined :: KindOf A) @Int



More information about the ghc-commits mailing list