Pepe,
But no, I did push the patch after all.
Manuel, does validate still fail there ?
Do you have the patch below?

Sun Dec  9 10:21:41 PST 2007  Pepe Iborra <[EMAIL PROTECTED]>
* Adapt to changes in :print (contents of references)

  M ./tests/ghc-regress/ghci.debugger/scripts/print028.stdout -2 +3


It's ok now - I probably pulled before you pushed to the test suite.

Todays failure is

  Unexpected failures:
     haddock.Test(normal)

Transcript attached.

Manuel

-=-

 =====> haddock.Test(normal)
cd ./haddock/haddock_examples && '/Users/chak/Code/ghc-test/compiler/ stage2/ghc-inplace' -no-recomp -dcore-lint -dcmm-lint - Di386_apple_darwin --make -o haddock.Test Test Hidden Visible - fglasgow-exts -haddock -ddump-parsed >haddock.Test.comp.stderr 2>&1
Actual stderr output differs from expected:
--- ./haddock/haddock_examples/haddock.Test.stderr.normalised 2007-12-11 13:22:12.000000000 +1100 +++ ./haddock/haddock_examples/haddock.Test.comp.stderr.normalised 2007-12-11 13:22:12.000000000 +1100
@@ -19,16 +19,16 @@
 ==================== Parser ====================
 <document comment>
 module Test (
- <IEGroup: 1>, <IEGroup: 2>, T(..), T2, T3(..), T4(..), T5(..), T6(..), N1(..), - N2(..), N3(..), N4, N5(..), N6(..), N7(..), <IEGroup: 2>, R(..), R1(..),
-       <document comment>, p, q, u, <IEGroup: 1>, C(a, b), D(..), E, F(..),
- <document comment>, a, <IEGroup: 1>, f, g, <IEGroup: 1>, <IEDocNamed: aux1>, - <IEDocNamed: aux2>, <IEDocNamed: aux3>, <IEDocNamed: aux4>, <IEDocNamed: aux5>, - <IEDocNamed: aux6>, <IEDocNamed: aux7>, <IEDocNamed: aux8>, <IEDocNamed: aux9>,
-       <IEDocNamed: aux10>, <IEDocNamed: aux11>, <IEDocNamed: aux12>,
- <document comment>, <IEGroup: 1>, module Hidden, <IEGroup: 1>, module Visible,
-       <document comment>, <IEGroup: 1>, Ex(..), <IEGroup: 1>, k, l, m, o,
-       <IEGroup: 1>, <IEGroup: 2>, <document comment>, f'
+ <IEGroup: 1>, <IEGroup: 2>, T(..), T2, T3(..), T4(..), T5(..), T6(..), N1(..), + N2(..), N3(..), N4, N5(..), N6(..), N7(..), <IEGroup: 2>, R(..), R1(..), + <document comment>, p, q, u, <IEGroup: 1>, C(a, b), D(..), E, F(..), + <document comment>, a, <IEGroup: 1>, f, g, <IEGroup: 1>, <IEDocNamed: aux1>, + <IEDocNamed: aux2>, <IEDocNamed: aux3>, <IEDocNamed: aux4>, <IEDocNamed: aux5>, + <IEDocNamed: aux6>, <IEDocNamed: aux7>, <IEDocNamed: aux8>, <IEDocNamed: aux9>,
+        <IEDocNamed: aux10>, <IEDocNamed: aux11>, <IEDocNamed: aux12>,
+ <document comment>, <IEGroup: 1>, module Hidden, <IEGroup: 1>, module Visible, + <document comment>, <IEGroup: 1>, Ex(..), <IEGroup: 1>, k, l, m, o,
+        <IEGroup: 1>, <IEGroup: 2>, <document comment>, f'
     ) where
 import Hidden
 import Visible
@@ -61,13 +61,9 @@
 class D a where { d :: T a b; e :: (a, a); }
 <document comment>
 instance D Int where
-    []
-    []
     { d = undefined
       e = undefined }
 instance Test.D Float where
-    []
-    []
     { d = undefined
       e = undefined }
 class E a where { ee :: a; }
@@ -77,19 +73,19 @@
 data R
     = <document comment>
       C1 {p :: Int <document comment>,
-         q :: forall a. a -> a <document comment>,
-         r :: Int <document comment>,
-         s :: Int <document comment>} |
+          q :: forall a. a -> a <document comment>,
+          r :: Int <document comment>,
+          s :: Int <document comment>} |
       <document comment>
C2 {t :: T1 -> (T2 Int Int) -> (T3 Bool Bool) -> (T4 Float Float) -> T5 () (),
-         u :: Int,
-         v :: Int}
+          u :: Int,
+          v :: Int}
 <document comment>
 data R1
     = <document comment>
       C3 {s1 :: Int <document comment>,
-         s2 :: Int <document comment>,
-         s3 :: Int <document comment>}
+          s2 :: Int <document comment>,
+          s3 :: Int <document comment>}
 <document comment>
 <document comment>
 <document comment>
@@ -123,7 +119,7 @@
   T () () <document comment>
   -> T2 Int Int <document comment>
      -> T3 Bool Bool -> T4 Float Float <document comment>
-       -> T5 () () <document comment> -> IO () <document comment>
+        -> T5 () () <document comment> -> IO () <document comment>
 l :: (Int, Int, Float) <document comment> -> Int <document comment>
 <document comment>
 m :: R -> N1 () <document comment> -> IO Int <document comment>
@@ -131,8 +127,8 @@
 newn :: R <document comment> -> N1 () <document comment> -> IO Int
 newn = undefined
 <document comment>
-foreign import ccall unsafe "static header.h &o" o :: Float <document comment>
-                                             -> IO Float <document comment>
+foreign import ccall unsafe "static header.h &o" o
+  :: Float <document comment> -> IO Float <document comment>
 <document comment>
 newp :: Int
 newp = undefined
*** unexpected failure for haddock.Test(normal)

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

Reply via email to