[commit: ghc] master: Add test for #11319 (b7dfbb4)

git at git.haskell.org git at git.haskell.org
Fri Feb 12 02:04:53 UTC 2016


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

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

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

commit b7dfbb45b6ac7849dbb7cf414d507fd65d1e7ed4
Author: Reid Barton <rwbarton at gmail.com>
Date:   Thu Feb 11 21:04:17 2016 -0500

    Add test for #11319


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

b7dfbb45b6ac7849dbb7cf414d507fd65d1e7ed4
 testsuite/tests/typecheck/should_compile/T11319.hs | 6 ++++++
 testsuite/tests/typecheck/should_compile/all.T     | 1 +
 2 files changed, 7 insertions(+)

diff --git a/testsuite/tests/typecheck/should_compile/T11319.hs b/testsuite/tests/typecheck/should_compile/T11319.hs
new file mode 100644
index 0000000..5f09d22
--- /dev/null
+++ b/testsuite/tests/typecheck/should_compile/T11319.hs
@@ -0,0 +1,6 @@
+{-# LANGUAGE ImpredicativeTypes #-}
+
+module T11319 where
+
+f :: Monad m => m (Maybe a)
+f = return Nothing
diff --git a/testsuite/tests/typecheck/should_compile/all.T b/testsuite/tests/typecheck/should_compile/all.T
index 9584c84..f7c5644 100644
--- a/testsuite/tests/typecheck/should_compile/all.T
+++ b/testsuite/tests/typecheck/should_compile/all.T
@@ -500,6 +500,7 @@ test('T11462',
 test('T11480', normal, compile, [''])
 test('RebindHR', normal, compile, [''])
 test('RebindNegate', normal, compile, [''])
+test('T11319', expect_broken(11319), compile, [''])
 test('T11397', normal, compile, [''])
 test('T11458', normal, compile, [''])
 test('T11524', normal, compile, [''])



More information about the ghc-commits mailing list