Simon Peyton-Jones <[EMAIL PROTECTED]> writes:

> I don't think this would be too hard to implement in GHC.  Now I think
> about it, it's rather attractive. I wonder what other people think?
> Perhaps {-# SYNTAX #-} is a bit noisy -- but Haskell's philosophy is
> to signal very clearly when something non-Prelude is going on.

Any reason for not simply requiring overridden operators to be
explicitly qualified? E.g.

    module Foo where
    import Prelude ()

    data [a] = ...

    x = Foo.[1, 2, 3] -- the local definition
    y = [1, 2, 3]     -- a list from the Prelude

-kzm
-- 
If I haven't seen further, it is by standing in the footprints of giants

Reply via email to