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

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/c0a060c7bdfc67d472dec393c1c40826e3e510cb

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

commit c0a060c7bdfc67d472dec393c1c40826e3e510cb
Author: Simon Peyton Jones <simo...@microsoft.com>
Date:   Tue Jan 8 12:13:02 2013 +0000

    Ambiguous-type wibbles

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

 tests/annotations/should_fail/annfail10.stderr |    2 --
 tests/perf/compiler/T5837.hs                   |    2 +-
 2 files changed, 1 insertions(+), 3 deletions(-)

diff --git a/tests/annotations/should_fail/annfail10.stderr 
b/tests/annotations/should_fail/annfail10.stderr
index 3813d71..c5b0356 100644
--- a/tests/annotations/should_fail/annfail10.stderr
+++ b/tests/annotations/should_fail/annfail10.stderr
@@ -2,7 +2,6 @@
 annfail10.hs:9:1:
     No instance for (Data.Data.Data a0) arising from an annotation
     The type variable `a0' is ambiguous
-    Possible fix: add a type signature that fixes these type variable(s)
     Note: there are several potential instances:
       instance Data.Data.Data () -- Defined in `Data.Data'
       instance (Data.Data.Data a, Data.Data.Data b) =>
@@ -18,7 +17,6 @@ annfail10.hs:9:1:
 annfail10.hs:9:11:
     No instance for (Num a0) arising from the literal `1'
     The type variable `a0' is ambiguous
-    Possible fix: add a type signature that fixes these type variable(s)
     Note: there are several potential instances:
       instance Num Double -- Defined in `GHC.Float'
       instance Num Float -- Defined in `GHC.Float'
diff --git a/tests/perf/compiler/T5837.hs b/tests/perf/compiler/T5837.hs
index 90b3af1..c2d0f10 100644
--- a/tests/perf/compiler/T5837.hs
+++ b/tests/perf/compiler/T5837.hs
@@ -1,4 +1,4 @@
-{-# LANGUAGE TypeFamilies #-}
+{-# LANGUAGE AllowAmbiguousTypes, TypeFamilies #-}
 
 module T5837 where
 



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

Reply via email to