Bugs item #904512, was opened at 2004-02-25 12:15
Message generated for change (Comment added) made by sigbjorn
You can respond by visiting: 
https://sourceforge.net/tracker/?func=detail&atid=108032&aid=904512&group_id=8032

Category: Compiler
Group: 6.0.1
Status: Closed
Resolution: Fixed
Priority: 5
Submitted By: Nobody/Anonymous (nobody)
Assigned to: Nobody/Anonymous (nobody)
Summary: hiding does not follow haskell report

Initial Comment:
Email: [EMAIL PROTECTED]

As understand hiding from the Haskell report, it should
hide only the unqualified name and not the qualified name,
e.g., hide head but not Prelude.head (or List.head).  This
is not the case with ghc 6.0.1:

[EMAIL PROTECTED]:/bug-2111> cat Main.hs 
module Main where

import Prelude hiding (head)

main = do print (Prelude.head [0..])
          head

head = print "head"

[EMAIL PROTECTED]:/bug-2112> ghc --version        
The Glorious Glasgow Haskell Compilation System,
version 6.0.1

[EMAIL PROTECTED]:/bug-2113> ghc -fglasgow-exts -o Main --make Main
Chasing modules from: Main
Compiling Main             ( Main.hs, ./Main.o )

Main.hs:5: Variable not in scope: `Prelude.head'

[EMAIL PROTECTED]:/bug-2114> ghc -o Main --make Main               
Chasing modules from: Main
Compiling Main             ( Main.hs, ./Main.o )

Main.hs:5: Variable not in scope: `Prelude.head'
[EMAIL PROTECTED]:/bug-2115> runhugs Main
0
"head"

as expected.


----------------------------------------------------------------------

>Comment By: Sigbjorn Finne (sigbjorn)
Date: 2004-02-26 07:20

Message:
Logged In: YES 
user_id=232905

This is not a bug, but expected behaviour. See the examples 
table in Section 5.3.4 of the Haskell 98 report.

----------------------------------------------------------------------

Comment By: Simon Peyton Jones (simonpj)
Date: 2004-02-26 04:38

Message:
Logged In: YES 
user_id=50165

Quite right!  Thus bug has been there for ages, but no one 
(including us) noticed.

I'm going to fix the HEAD.  It turns out to be more awkward 
to fix the 6.2 branch, so I'll let it lie.

----------------------------------------------------------------------

You can respond by visiting: 
https://sourceforge.net/tracker/?func=detail&atid=108032&aid=904512&group_id=8032
_______________________________________________
Glasgow-haskell-bugs mailing list
[EMAIL PROTECTED]
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs

Reply via email to