Bas van Dijk writes:
> Should I file a bug for this:
see http://hackage.haskell.org/trac/ghc/ticket/5836
-- hvr
___
Glasgow-haskell-users mailing list
Glasgow-haskell-users@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-users
On Fri, Feb 10, 2012 at 12:49:56AM +0100, Bas van Dijk wrote:
> Should I file a bug for this:
It's already reported: http://hackage.haskell.org/trac/ghc/ticket/5836
Thanks
Ian
___
Glasgow-haskell-users mailing list
Glasgow-haskell-users@haskell.org
h
Should I file a bug for this:
GHCi 7.2.2:
> import I.Do.Not.Exist
:
Could not find module `I.Do.Not.Exist'
Use -v to see a list of the files searched for.
GHCi 7.4.1:
> import I.Do.Not.Exist
>
(and for the record: I.Do.Not.Exist does not exist)
Bas
__
Hello,
I have some code that compiled fine in GHC-7.2.2 but fails in
GHC-7.4.1 with a kind error.
{-# LANGUAGE MagicHash, NoImplicitPrelude, PackageImports #-}
import "base" Data.Function ( ($) )
import "base" GHC.Exts ( Int(I#) )
import "base" Prelude ( Integral, fromIntegral, toInteger )
impor