[GHC] #1680: Attempting to do foreign import with unboxed tuple return type causes GHC panic

2007-09-10 Thread GHC
#1680: Attempting to do foreign import with unboxed tuple return type causes GHC panic -+-- Reporter: sorear | Owner: Type: bug | Status: new Priority: normal

Bug: wrong ghc location in package.conf

2007-09-10 Thread Conal Elliott
In ghc-6.8 20070909, my package.conf contains some strange and incorrect paths, such as haddockInterfaces = ["/usr/local/doc/ghc/libraries\\html\\containers\\containers.haddock"], haddockHTMLs = ["/usr/local/doc/ghc/libraries\\html\\containers"] In fact, the installation location is c:/ghc/ghc-6.

Re: [GHC] #930: ghc-6.6: panic! (the 'impossible' happened) mkWWcpr: not a product GHC-Brian-6.5.1:IdInfo.IdInfo{tc rfD}

2007-09-10 Thread GHC
#930: ghc-6.6: panic! (the 'impossible' happened) mkWWcpr: not a product GHC- Brian-6.5.1:IdInfo.IdInfo{tc rfD} ---+ Reporter: briansmith |Owner: Type: bug | Status: closed Pr

Re: curiosity, bug, or just dead code?

2007-09-10 Thread Stefan O'Rear
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.

Re: [GHC] #1661: Can't use FFI anymore.

2007-09-10 Thread GHC
#1661: Can't use FFI anymore. -+-- Reporter: guest |Owner: Type: bug | Status: closed Priority: high |Milestone: 6.8 Component: Build System |

Re: curiosity, bug, or just dead code?

2007-09-10 Thread Ross Paterson
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

Re: curiosity, bug, or just dead code?

2007-09-10 Thread Tim Chevalier
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

curiosity, bug, or just dead code?

2007-09-10 Thread Claus Reinke
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

[GHC] #1679: ^C on zipperfs leads to crash

2007-09-10 Thread GHC
#1679: ^C on zipperfs leads to crash ---+ Reporter: sorear| Owner: Type: bug | Status: new Priority: normal| Milestone: Component: Compiler |Version:

Re: [GHC] #930: ghc-6.6: panic! (the 'impossible' happened) mkWWcpr: not a product GHC-Brian-6.5.1:IdInfo.IdInfo{tc rfD}

2007-09-10 Thread GHC
#930: ghc-6.6: panic! (the 'impossible' happened) mkWWcpr: not a product GHC- Brian-6.5.1:IdInfo.IdInfo{tc rfD} ---+ Reporter: briansmith |Owner: Type: bug | Status: closed Pr

[GHC] #1678: runIO does not catch userErrors, just causes code generation to fail silently

2007-09-10 Thread GHC
#1678: runIO does not catch userErrors, just causes code generation to fail silently ---+ Reporter: greenrd | Owner: Type: bug | Status: new Prior

Re: [GHC] #1630: error msg can be improved: : file name does not match module name `Main'

2007-09-10 Thread GHC
#1630: error msg can be improved: : file name does not match module name `Main' -+-- Reporter: guest |Owner: Type: bug | Status: closed Priority: normal|Milestone:

[GHC] #1677: Abysmal error message from `ghc -M`

2007-09-10 Thread GHC
#1677: Abysmal error message from `ghc -M` ---+ Reporter: simonpj | Owner: Type: bug | Status: new Priority: normal| Milestone: Component: Compiler |

Re: [GHC] #1669: GHCi debugger underlining is in the wrong place

2007-09-10 Thread GHC
#1669: GHCi debugger underlining is in the wrong place +--- Reporter: igloo|Owner: Type: bug | Status: closed Priority: normal |Milestone: 6.8 Component: GHCi

RE: bug in :browse (Re: ghci :browse! and type of class methods ([GHC] #1617))

2007-09-10 Thread Simon Peyton-Jones
Absolutely right! Thank you Claus, I will look into this. Simon | note that things are going wrong in this area even without my patch. | consider this module | -- | {-# OPTIONS_GHC -fglasgow-exts #-} | module Main where | class C a b where | c1 :: Num b => a -> b | c2

Re: [GHC] #930: ghc-6.6: panic! (the 'impossible' happened) mkWWcpr: not a product GHC-Brian-6.5.1:IdInfo.IdInfo{tc rfD}

2007-09-10 Thread GHC
#930: ghc-6.6: panic! (the 'impossible' happened) mkWWcpr: not a product GHC- Brian-6.5.1:IdInfo.IdInfo{tc rfD} ---+ Reporter: briansmith |Owner: Type: bug | Status: closed Pr

Re: [GHC] #1670: installPackage: error reading dist/setup-config;

2007-09-10 Thread GHC
#1670: installPackage: error reading dist/setup-config; --+- Reporter: [EMAIL PROTECTED] |Owner: Type: bug| Status: closed Priority: normal |Milestone

Re: [GHC] #1640: Bang patterns cause compilation error

2007-09-10 Thread GHC
#1640: Bang patterns cause compilation error --+- Reporter: [EMAIL PROTECTED] |Owner: Type: bug| Status: closed Priority: normal |Milestone:

Re: [GHC] #1676: Infinite loop

2007-09-10 Thread GHC
#1676: Infinite loop --+- Reporter: [EMAIL PROTECTED] |Owner: Type: bug| Status: closed Priority: normal |Milestone: Component:

Re: [GHC] #1675: Cabal problem during install Edison

2007-09-10 Thread GHC
#1675: Cabal problem during install Edison --+- Reporter: [EMAIL PROTECTED] |Owner: Type: bug| Status: closed Priority: normal |Milestone:

Re: [GHC] #964: Cross Compile and Universal Binary

2007-09-10 Thread GHC
#964: Cross Compile and Universal Binary +--- Reporter: [EMAIL PROTECTED] |Owner: Type: feature request | Status: new Priority: normal

Re: [GHC] #1540: GHC on Macs

2007-09-10 Thread GHC
#1540: GHC on Macs -+-- Reporter: guest |Owner: thorkilnaur Type: task | Status: new Priority: high |Milestone: 6.8 Component: Build System

Re: [GHC] #872: OSX universal binary distribution

2007-09-10 Thread GHC
#872: OSX universal binary distribution +--- Reporter: guest|Owner: Type: feature request | Status: new Priority: normal |Milestone: _|_ Componen

Re: [GHC] #1672: allow the use of import in the interpreter to load new modules

2007-09-10 Thread GHC
#1672: allow the use of import in the interpreter to load new modules +--- Reporter: guest|Owner: Type: feature request | Status: closed Priority: normal

Re: [GHC] #1671: Cannot ^C out of certain computations in GHCi

2007-09-10 Thread GHC
#1671: Cannot ^C out of certain computations in GHCi -+-- Reporter: [EMAIL PROTECTED] |Owner: Type: bug | Status: closed Priority: normal|Mi

Re: [GHC] #1546: maessen_hashtab is broken

2007-09-10 Thread GHC
#1546: maessen_hashtab is broken -+-- Reporter: igloo |Owner: simonpj Type: bug | Status: new Priority: high |Milestone: 6.8 Component: Compiler | Version

Re: [GHC] #1670: installPackage: error reading dist/setup-config;

2007-09-10 Thread GHC
#1670: installPackage: error reading dist/setup-config; --+- Reporter: [EMAIL PROTECTED] |Owner: Type: bug| Status: new Priority: normal |Milestone

Re: [GHC] #1674: Install still failing

2007-09-10 Thread GHC
#1674: Install still failing --+- Reporter: [EMAIL PROTECTED] |Owner: Type: bug| Status: new Priority: normal |Milestone: Component: C

Re: [GHC] #1675: Cabal problem during install Edison

2007-09-10 Thread GHC
#1675: Cabal problem during install Edison --+- Reporter: [EMAIL PROTECTED] |Owner: Type: bug| Status: new Priority: normal |Milestone:

Re: [GHC] #1676: Infinite loop

2007-09-10 Thread GHC
#1676: Infinite loop --+- Reporter: [EMAIL PROTECTED] |Owner: Type: bug| Status: new Priority: normal |Milestone: Component: Compiler

Re: [GHC] #1673: Template Haskell support for type families

2007-09-10 Thread GHC
#1673: Template Haskell support for type families ---+ Reporter: [EMAIL PROTECTED] |Owner: Type: feature request | Status: new Priority: low |

Re: [GHC] #1676: Infinite loop

2007-09-10 Thread GHC
#1676: Infinite loop --+- Reporter: [EMAIL PROTECTED] |Owner: Type: bug| Status: new Priority: high |Milestone: 6.8 Component: Compiler