Why "unfortunately"? Looks fine to me.

Simon

|
| Unfortunately, GHC accepts the following:
|
| {-# LANGUAGE FlexibleInstances #-}
| module Foo2 where
|
| data Foo = Foo
|   deriving Eq
|
| instance Ord (Foo, Foo) where
|   (Foo, Foo) < (Foo, Foo) = False
_______________________________________________
Glasgow-haskell-users mailing list
Glasgow-haskell-users@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-users

Reply via email to