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

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/43f5127c80768da44c88206fd08fed47257f0a18

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

commit 43f5127c80768da44c88206fd08fed47257f0a18
Author: Simon Peyton Jones <[email protected]>
Date:   Fri Oct 12 16:34:13 2012 +0100

    Test Trac #7312

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

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

diff --git a/tests/typecheck/should_compile/T7312.hs 
b/tests/typecheck/should_compile/T7312.hs
new file mode 100644
index 0000000..85f1d42
--- /dev/null
+++ b/tests/typecheck/should_compile/T7312.hs
@@ -0,0 +1,9 @@
+module T7312 where
+
+-- this works
+mac :: Double -> (Double->Double) -> (Double-> Double)
+mac ac m = \ x -> ac + x * m x
+
+-- this doesn't
+mac2 :: Double -> (->) Double Double -> (->) Double Double
+mac2 ac m = \ x -> ac + x * m x
diff --git a/tests/typecheck/should_compile/all.T 
b/tests/typecheck/should_compile/all.T
index 8907143..74b0c29 100644
--- a/tests/typecheck/should_compile/all.T
+++ b/tests/typecheck/should_compile/all.T
@@ -387,3 +387,4 @@ test('T7171',normal,run_command,
 test('T7173', normal, compile, [''])
 test('T7196', normal, compile, [''])
 test('T7050', normal, compile, [''])
+test('T7312', normal, compile, [''])



_______________________________________________
Cvs-ghc mailing list
[email protected]
http://www.haskell.org/mailman/listinfo/cvs-ghc

Reply via email to