
11 Jan
2009
11 Jan
'09
8:12 a.m.
Hi, Is it possible to write something like this:
{-# LANGUAGE FlexibleInstances, UndecidableInstances #-}
import Control.Monad (liftM)
instance (Monad a) => Functor a where fmap = liftM
without having to use UndecidableInstances (and preferably, other type system extensions too)?