Thank you for the explanation. I now understand the problem. I have
rewritten the code using some parenthesis.
Thanks,
Roel
2012/2/10 Simon Peyton-Jones :
> It should not have worked before. Consider
>
> I# $ 3#
>
> ($) is a polymorphic function and takes two *pointer* arguments. If w
| Subject: Kind error in GHC-7.4.1, works in GHC-7.2.2
|
| 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 "
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 ( Int
rom: [EMAIL PROTECTED] [mailto:[EMAIL PROTECTED] On
| Behalf Of Brammert Ottens
| Sent: 23 October 2007 12:30
| To: glasgow-haskell-users@haskell.org
| Subject: kind error
|
| Hello,
|
| I am trying to recompile some haskell code. I have previously compiled
| it with ghc 6.4 and that went fine. The
Hi,
First of all I must say that the code that I am compiling is not my own
code. So I cannot be a 100% sure of what the original author meant. But
I think that what was meant is
type FastClause = MH.Min (US.Set DecoratedFormula)
However, if I try this I get an error further down the line
i
Hi,
> Hello,
> data DecoratedFormula = DF{formula :: Formula,
> iformula :: IFormula}
>
> type FastClause = MH.Min US.Set DecoratedFormula
> FastClause.hs:71:25:
>`US.Set' is not applied to enough type arguments
>Expected kind `*', but `US.Set' has kind `* ->
Hello,
I am trying to recompile some haskell code. I have previously compiled
it with ghc 6.4 and that went fine. The lines that give the trouble are
import qualified Data.Edison.Coll.UnbalancedSet as US
import qualified Data.Edison.Coll.MinHeap as MH
data DecoratedFormula = DF{formula :: F