Is this legal Haskell 98 Code:

module Test where

class A a where
  foo :: a -> a

class (A a) => B a where
  boo :: a -> a

  foo a = a

GHC compiles it just fine but the latest vesion of Hugs98 gives me
  ERROR "test.hs" (line 10): No member "foo" in class "B"

So I was wondering if giving default definitions for base member in a
derived class is legal is Haskell 98.  If it is not legal is it a
proposed extension that Hugs will eventually support?

-- 
Kevin Atkinson
[EMAIL PROTECTED]
http://metalab.unc.edu/kevina/


Reply via email to