Re: [Haskell-cafe] GSoC proposal: Units for GHC

2012-04-04 Thread Roel van Dijk
2012/4/4 Richard Eisenberg e...@seas.upenn.edu: - A first crack at units in Haskell has already been done (by Bjorn Buckwalter) and made public at http://code.google.com/p/dimensional/ This implementation uses functional dependencies heavily and is restricted to only a specific 7 units. I am

Re: Kind error in GHC-7.4.1, works in GHC-7.2.2

2012-02-12 Thread Roel van Dijk
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 simo...@microsoft.com: It should not have worked before.  Consider        I#  $   3# ($) is a polymorphic function and takes two *pointer*

Kind error in GHC-7.4.1, works in GHC-7.2.2

2012-02-09 Thread Roel van Dijk
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 ) import

Re: Unicode alternative for '..' (ticket #3894)

2010-04-21 Thread Roel van Dijk
On Wed, Apr 21, 2010 at 12:51 AM, Yitzchak Gale g...@sefer.org wrote: Yes, sorry. Either use TWO DOT LEADER, or remove this Unicode alternative altogether (i.e. leave it the way it is *without* the UnicodeSyntax extension). I'm happy with either of those. I just don't like moving the dots up

Re: Unicode alternative for '..' (ticket #3894)

2010-04-15 Thread Roel van Dijk
That is very interesting. I didn't know the history of those characters. If we can't find a Unicode character that everyone agrees upon, I also don't see any problem with leaving it as two FULL STOP characters. I agree. I don't like the current Unicode variant for .., therefore I suggested an

Unicode alternative for '..' (ticket #3894)

2010-04-14 Thread Roel van Dijk
compatibility (even though it is a really small change). Regards, Roel van Dijk 1 - http://www.haskell.org/ghc/docs/latest/html/users_guide/syntax-extns.html#unicode-syntax 2 - http://en.wikipedia.org/wiki/Ellipsis#In_mathematical_notation 3 - http://hackage.haskell.org/trac/ghc/ticket/3894