> Unlike previous versions, last Friday's GHC 4.03 doesn't like the
> following code anymore:
> 
>    module Foo where
>    class Bar a where bar :: a -> Int
>    data Baz = forall a . (Bar a) => MkBaz a
>    boo (MkBaz _) = return ()
> 
> panne@liesl:~ > ghc -fglasgow-exts -O -c Foo.hs
> DsUtils.lhs:241: Non-exhaustive patterns in function rebuildConArgs

Fixed; should be in tomorrow's CVS.

Cheers,
        Simon

Reply via email to