RE: IS THIS A BUG ? "rename/RnEnv.lhs:238: Non-exhaustive patterns in function get_tycon_key"

2000-10-03 Thread Simon Peyton-Jones
| CODE THAT PRODUCES THE ERROR | | module Foo where | | import MutableArray | import ByteArray | import ST | import PrelArrExtra | | class Foo t where | | foo :: t -> ByteArray ix | | instance Ix ix => Foo (forall s. MutableByteArray s ix) where | | foo x = runST(unsafeFreezeB

IS THIS A BUG ? "rename/RnEnv.lhs:238: Non-exhaustive patterns in function get_tycon_key"

2000-09-29 Thread root
Hello, The following code, when compiled with GHC 4.08.1 under an i586 Archictecute with Red Hat Linux 6.2 produces this error message: ERROR MESSAGE: Compilation Dump for: /usr/local/lib/ghc-4.08.1/hsc /tmp/ghc1430.cpp 2>> erros -fg

Re: Is this a bug?

1998-03-06 Thread Carl R. Witty
Marc van Dongen= <[EMAIL PROTECTED]> writes: > [snip] > > : > > module Main( main ) where > : > > import List( genericLength ) > : > > main = putStr (show integral) >> > : > >putStr "\n">> > : > >return () > : > > where integral = genericLength [] > > [snip] >

Re: Is this a bug?

1998-03-01 Thread Sigbjorn Finne
Marc van Dongen= writes: > > : of the report), this means resolving `integral' to be a value of type > : Int. > > I think this ``resolving'' may lead to unwanted results. It took > me quite some time to discover that Integral was resolved to Int > in some program I had. Is there a possibility

Re: Is this a bug?

1998-03-01 Thread Marc van Dongen=
[snip] : > > module Main( main ) where : > > import List( genericLength ) : > > main = putStr (show integral) >> : > >putStr "\n">> : > >return () : > > where integral = genericLength [] [snip] : This is a legal Haskell program. The (ambiguous) type of `integra

Re: Is this a bug?

1998-03-01 Thread Sigbjorn Finne
Marc van Dongen= writes: > > I suspect the program included below is > incorrect. Nevertheless it compiles fine under > ghc-3.01 patchlevel 0. > > > module Main( main ) where > > import List( genericLength ) > > main = putStr (show integral) >> > >putStr "\n">> > >re

Is this a bug?

1998-03-01 Thread Marc van Dongen=
Hi there, I suspect the program included below is incorrect. Nevertheless it compiles fine under ghc-3.01 patchlevel 0. > module Main( main ) where > import List( genericLength ) > main = putStr (show integral) >> >putStr "\n">> >return () > where integral = gen

Re: is this a bug?

1998-02-26 Thread Simon Marlow
Marko Schuetz <[EMAIL PROTECTED]> writes: > ghc-3.01 complains about a syntax error in the following cut down > program: > > > module Fehler where > > > > data Constr > > = (:<-:) { expr :: LambdaCExpr, context :: ContextTerm } > > kinetic% ghc Fehler.hs > Fehler.hs:4:12: parse error on input

is this a bug?

1998-02-25 Thread Marko Schuetz
ghc-3.01 complains about a syntax error in the following cut down program: > module Fehler where > > data Constr > = (:<-:) { expr :: LambdaCExpr, context :: ContextTerm } kinetic% ghc Fehler.hs Fehler.hs:4:12: parse error on input: "{" Hugs 1.4 accepts the module and seems to do what was int

Re: Is this a bug???

1998-02-09 Thread Simon L Peyton Jones
> Test.hs:13: > Too many parameters for class `ParentWidget' > In the class declaration for `ParentWidget' I think you must have omitted -fglasow-exts as Sigbjorn says. The code that generates the error is this checkTc (opt_GlasgowExts || length tyvar_names == 1) (clas

Re: Is this a bug???

1998-02-07 Thread Sigbjorn Finne
Einar Wolfgang Karlsen writes: > > While experimenting with multiple parameter type classes for > modelling GUI operations of relevance to the packer, I > got the following: > > Test.hs:13: > Too many parameters for class `ParentWidget' > In the class declaration for `ParentWidget' >

Is this a bug???

1998-02-07 Thread Einar Wolfgang Karlsen
-- X-Sun-Data-Type: text X-Sun-Data-Description: text X-Sun-Data-Name: text X-Sun-Charset: us-ascii X-Sun-Content-Lines: 17 While experimenting with multiple parameter type classes for modelling GUI operations of relevance to the packer, I got the following: Test.hs:13: Too many par

Re: is this a bug? (fwd)

1998-01-30 Thread Marc van Dongen=
: Hi there, : : : : While using mkdependHS, I am getting errors because the : tool can not find .hi files for modules which are imported : from a library in some other directory than the one I'm : making in. : : Is this an error, and if not, how do I solve this? : This is embarrassing. As so

is this a bug?

1998-01-30 Thread Marc van Dongen=
Hi there, While using mkdependHS, I am getting errors because the tool can not find .hi files for modules which are imported from a library in some other directory than the one I'm making in. Is this an error, and if not, how do I solve this? Thanks in advance, Marc van Dongen