Repository : ssh://darcs.haskell.org//srv/darcs/testsuite

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/5e7349b8dcdd9c571f45ff026260aa4a185ad572

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

commit 5e7349b8dcdd9c571f45ff026260aa4a185ad572
Author: Simon Peyton Jones <simo...@microsoft.com>
Date:   Wed Jan 2 12:36:17 2013 +0000

    Test Trac #7541

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

 tests/typecheck/should_compile/T7541.hs |    9 +++++++++
 tests/typecheck/should_compile/all.T    |    1 +
 2 files changed, 10 insertions(+), 0 deletions(-)

diff --git a/tests/typecheck/should_compile/T7541.hs 
b/tests/typecheck/should_compile/T7541.hs
new file mode 100644
index 0000000..e0ae55a
--- /dev/null
+++ b/tests/typecheck/should_compile/T7541.hs
@@ -0,0 +1,9 @@
+{-# OPTIONS_GHC -fno-warn-duplicate-constraints #-}
+{-# LANGUAGE FlexibleContexts, Rank2Types #-}
+
+module Test where
+
+type Constrained x y r = (Eq x, Eq y) => x -> y -> r
+
+f :: Constrained String String ()
+f = undefined
diff --git a/tests/typecheck/should_compile/all.T 
b/tests/typecheck/should_compile/all.T
index 5905bb7..57c80f1 100644
--- a/tests/typecheck/should_compile/all.T
+++ b/tests/typecheck/should_compile/all.T
@@ -395,3 +395,4 @@ test('holes2', normal, compile, ['-fdefer-type-errors'])
 test('holes3', normal, compile_fail, [''])
 test('T7408', normal, compile, [''])
 test('UnboxStrictPrimitiveFields', normal, compile, [''])
+test('T7541', normal, compile, [''])



_______________________________________________
Cvs-ghc mailing list
Cvs-ghc@haskell.org
http://www.haskell.org/mailman/listinfo/cvs-ghc

Reply via email to