Hi,
I've encountered an interesting issue with GHC 6.12.1 and 2 in which a
small program compiles quickly without using loads of memory with
optimization turned off, but with optimization (-O1) turned on, GHC's
memory usage becomes very high (and compilation takes much much
longer).
$ time ghc -c
The *splicing* of patterns is considered tricky, see:
http://hackage.haskell.org/trac/ghc/ticket/1476
Implementing pattern quotations might be less tricky, but I would
imagine to make them useful, you'd have to allow splicing things
*into* them, which requires implementing pattern splicing. That
>
> A variant of your suggestion would be: for any quote [|..blah..|] behave as
> if the programmer had written [quasiQuoter| ...blah...|]. That is, simply
> pick up whatever record named "quasiQuoter" is in scope. Then you'd say
>import Pads( quasiQuoter )
> and away you go. But you ca
I like (1) quite a lot. If radical suggestions for QQ noise reduction
are being entertained, here's another:
quotations of the form [| |] (i.e. no 'language' specified) will
use an implicit parameter* ('quasi', say) of type QuasiQuoter, if in
scope. Otherwise, they will behave as they curre
Now that type-splicing works in TH, and TH has type-family support, I
was wondering if the following example should compile (with 6.12.1):
> {-# LANGUAGE TemplateHaskell, MultiParamTypeClasses, TypeFamilies,
> FlexibleInstances, OverlappingInstances #-}
> module Sample where
> impor
On Mon, Dec 21, 2009 at 6:03 AM, Bas van Dijk wrote:
> Hello,
>
> In my usb-safe[1] library I make extensive use of the ViewPatterns[2]
> language extension. However I get strange warnings when using them.
>
> See for example the following function:
>
> resetDevice ∷ (pr `ParentOf` cr, MonadIO cr
On Mon, Dec 21, 2009 at 2:49 PM, Robert Greayer wrote:
>
> On Mon, Dec 21, 2009 at 2:32 PM, Bulat Ziganshin <
> bulat.zigans...@gmail.com> wrote:
>
>> Hello glasgow-haskell-users,
>>
>> i compile my program for linux using ghc 6.6.1 (32-bit)
>>
>>
On Mon, Dec 21, 2009 at 2:32 PM, Bulat Ziganshin
wrote:
> Hello glasgow-haskell-users,
>
> i compile my program for linux using ghc 6.6.1 (32-bit)
>
> user of my program asks: "any plans of making a static build for
> linux? that one does not work under x86-64 due to dependencies,
> missing libgmp
On Mon, May 18, 2009 at 4:00 PM, Norman Ramsey wrote:
> P.S. The exhaustiveness checker does need improvement...
Is it documented somewhere what deficiencies the exhaustiveness
checker has (where it can report problems that don't exist or fails to
report problems that do...), and which deficienci