flexible contexts and context reduction

Simon Peyton-Jones simonpj at microsoft.com
Thu Mar 27 05:05:11 EDT 2008


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


More information about the Glasgow-haskell-users mailing list