On Tue, Sep 11, 2007 at 12:02:26AM +0100, Claus Reinke wrote:
> consider this module, which is accepted by ghci-6.6.1:
>
>module T where
>import qualified Prelude as T(length)
>import Prelude(length)
>length = 0
>
> there is no way to refer to either length, as both 'length' and 'T.
On Tue, Sep 11, 2007 at 12:02:26AM +0100, Claus Reinke wrote:
> consider this module, which is accepted by ghci-6.6.1:
>
>module T where
>import qualified Prelude as T(length)
>import Prelude(length)
>length = 0
All the GHC behaviour described above follows the Haskell 98 Report.
T
On 9/10/07, Claus Reinke <[EMAIL PROTECTED]> wrote:
> consider this module, which is accepted by ghci-6.6.1:
>
> module T where
> import qualified Prelude as T(length)
> import Prelude(length)
> length = 0
>
> there is no way to refer to either length, as both 'length'
> and 'T.leng
consider this module, which is accepted by ghci-6.6.1:
module T where
import qualified Prelude as T(length)
import Prelude(length)
length = 0
there is no way to refer to either length, as both 'length'
and 'T.length' are ambiguous (ghci complains on uses
of either name). but is it