I am compiling the following inoffensive source file, dubbed finterp.lhs:
'''Interpreter for factors'''
> module FactorInterp where
> import Ast (Sym)
> import Value ()
> import Factor
> result = "*"
> exp (Sym s) = Vee [result `eq` Value.Sym s :@: 1.0]
Hugs reports:
ERROR "finterp.lhs" (line 10): Definition of variable "exp" clashes with import
But there is no explicit `exp' in any of my other modules:
: nr@labrador 1337 ; grep -w exp *.lhs
finterp.lhs:> exp (Sym s) = Vee [result `eq` Value.Sym s :@: 1.0]
Can anyone help me to find an expunge this error?
Thanks,
Norman
_______________________________________________
Haskell mailing list
[EMAIL PROTECTED]
http://www.haskell.org/mailman/listinfo/haskell