Hi,

I'm a bit confused about why the following program doesn't compile (in any of 6.6.1, 6.8.1 and 6.9.20080316). Shouldn't the Ord (a, b) context be reduced?

Cheers,

Ganesh

{-# LANGUAGE FlexibleContexts #-}

module Test2 where

foo :: Ord (a, b) => (a, b) -> (a, b)
foo = bar

bar :: (Ord a, Ord b) => (a, b) -> (a, b)
bar = id
_______________________________________________
Glasgow-haskell-users mailing list
Glasgow-haskell-users@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-users

Reply via email to