I encountered this problem when trying to compile NewBinary with ghc-6.7 -
here isolated it to a small test

$ cat Foo.hs
module Main where

main {- | num_bits == 0 = return ()
       | num_bits <  0 = error "putBits cannot write negative numbers of
bits"
       | num_bits >  8 = error "putBits cannot write more than 8 bits at a
time"
       | otherwise    -} = do
   putStrLn "Testing parse"


ghc --make Foo.hs
[1 of 1] Compiling Main             ( Foo.hs, Foo.o )

Foo.hs:3:5:
   parse error on input `{- | num_bits == 0 = return ()
       | num_bits <  0 = error "putBits cannot write negative numbers of
bits"
       | num_bits >  8 = error "putBits cannot write more than 8 bits at a
time"
       | otherwise    -}'
make: *** [Foo.exe] Error 1

This problem doesn't exist in 6.6 branch.

-Quan
_______________________________________________
Cvs-ghc mailing list
[EMAIL PROTECTED]
http://www.haskell.org/mailman/listinfo/cvs-ghc

Reply via email to