Simon Peyton-Jones wrote:
> 
> Gentle Haskellers,
> 
> Here's a Haskell98-typo question.
> 
> Consider this program:
> 
>         module M where
> 
>         reverse xs = Prelude.reverse (tail xs)
> 
>         foo ys = M.reverse ys
> 
> This is legal Haskell98.

OK, I believe you that it's legal Haskell98, but Hugs98-sep99 doesn't
accept it.  Maybe the report should read that if you're going to define
reverse in your module, you must "import Prelude hiding (reverse)", and
leave it at that.  It eliminates the ambiguity by making it explicit
that Prelude.reverse cannot be referred to unqualified.  And you don't
have to change Hugs.

Thanks,
Matt Harden

Reply via email to