On 2 Apr 2008, at 14:27, [EMAIL PROTECTED] wrote:

It would be better to write a new Prelude. :-)

Oh, yes, our common dream...

One may not need to write a wholly new Prelude, by something like:

module NewPrelude where

import Prelude hiding -- Num, (+).

class AdditiveSemiMonoid a where
  (+) :: a -> a -> a

...

class (Eq a, Show a, AdditiveSemiMonoid a) => Num a where
    (+)  :: a -> a -> a

-- Stuff of Prelude using Num.

Then import NewPrelude instead, and

instance AdditiveSemiMonoid (a -> b) where
  f + g = \x -> f(x) + g(x)

or something.

  Hans


_______________________________________________
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe

Reply via email to