Re: [Haskell-cafe] GRIN and Urban Boquist's thesis

2011-02-24 Thread Lemmih
. [1] http://lhc-compiler.blogspot.com/2010/06/mirroring-boquists-grin-papers.html#comments You can find them here: http://mirror.seize.it/papers/ They will also be in the lhc repository once I restore it on code.haskell.org. -- Cheers,   Lemmih

Re: [Haskell-cafe] GRIN and Urban Boquist's thesis

2011-02-24 Thread Lemmih
On Thu, Feb 24, 2011 at 9:36 PM, David Waern david.wa...@gmail.com wrote: 2011/2/24 Lemmih lem...@gmail.com: They will also be in the lhc repository once I restore it on code.haskell.org. Lemmih, while you're here, what's the status of LHC? It's an interesting project but we haven't heard

Re: [Haskell-cafe] Package Woes

2009-11-13 Thread Lemmih
to building the base libraries for LHC. I recommend waiting for the next stable release. -- Cheers, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Package Woes

2009-11-13 Thread Lemmih
On Fri, Nov 13, 2009 at 7:37 PM, Daniel Fischer daniel.is.fisc...@web.de wrote: Am Freitag 13 November 2009 18:58:22 schrieb Lemmih: We no longer use libffi and I've removed the dependency. However, you're most likely to hit further obstacles when it comes to building the base libraries

Re: [Haskell-cafe] GHC core packages: same core?

2009-10-14 Thread Lemmih
. -- Cheers, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] How to think about this? (profiling)

2008-12-16 Thread Lemmih
On Tue, Dec 16, 2008 at 1:07 PM, Magnus Therning mag...@therning.org wrote: On Mon, Dec 15, 2008 at 11:33 PM, Lemmih lem...@gmail.com wrote: 2008/12/16 Magnus Therning mag...@therning.org: This behaviour by Haskell seems to go against my intuition, I'm sure I just need an update of my

Re: [Haskell-cafe] How to think about this? (profiling)

2008-12-15 Thread Lemmih
. Saving intermediate results is the right thing to do but arrays aren't the right way to do it. In this case, a lazy list will perform much better. ack n = ackList !! n where ackList = 0:1:2:zipWith3 (\a b c - a+b+c) ackList (drop 1 ackList) (drop 2 ackList) -- Cheers, Lemmih

Re: [Haskell-cafe] Re: ANNOUNCE: haskell-src-exts 0.4.4

2008-12-10 Thread Lemmih
there are more just waiting to be developed. -- Cheers, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] nested maybes

2007-02-04 Thread Lemmih
) -- Cheers, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] The usage of runghc ?

2007-02-03 Thread Lemmih
://www.fastcgi.com/ -- Cheers, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Problems using Storable.poke* from separate OS thread.

2007-01-21 Thread Lemmih
a hack and I'm a beginner so comments are scarce and some code may be strange. ;-) - Assumes ghc 6.6 is installed to /usr/local Do you have a smaller test case? I couldn't reproduce the error after I pulled out the MacOS stuff. -- Cheers, Lemmih

Re: [Haskell-cafe] Re: Resending: MissingH: profiler support?

2007-01-12 Thread Lemmih
, that the convenience of having --enable-library-profiling on by default is worth the doubled build time. -- Cheers, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] STM and random numbers

2007-01-12 Thread Lemmih
not allowed, right?), but I would need to be sure it doesn't get inlined. You could use GHC.Conc.unsafeIOToSTM. Just be aware that your transaction may be re-executed an arbitrary number of times. -- Cheers, Lemmih ___ Haskell-Cafe mailing list Haskell

Re: [Haskell-cafe] Versioning

2006-12-21 Thread Lemmih
that goes out to disk. [1] also supports infinite data structures No, it only supports cyclic data structures. -- Cheers, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] greencard and cabal, how to do it right?

2006-12-17 Thread Lemmih
shows.. (Greencard.hs exists then) That's the odd thing I can't cope with at the moment.. And Greencard.hs isn't just empty? -- Cheers, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Dynamic types through unsafeCoerce

2006-12-12 Thread Lemmih
On 12/12/06, Alfonso Acosta [EMAIL PROTECTED] wrote: On 12/10/06, Lemmih [EMAIL PROTECTED] wrote: How about using a StablePtr to a Dynamic? Uhm, that's a good idea cause no Typeable context will then be required and thus the function can be exported by the FFI. On the other hand, using

Re: [Haskell-cafe] Dynamic types through unsafeCoerce

2006-12-09 Thread Lemmih
certainly cannot invalidate them. You want a StablePtr. I'm using StablePtrs already, what made you assume I wasn't using them? How about using a StablePtr to a Dynamic? -- Cheers, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http

Re: [Haskell-cafe] computational time always 0.0 in this example...

2006-12-07 Thread Lemmih
, have a look at ':set +s' in ghci (http://www.haskell.org/ghc/docs/latest/html/users_guide/ghci-set.html). -- Cheers, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] computational time always 0.0 in this example...

2006-12-07 Thread Lemmih
wordList2) `seq` return () or time $ length (doTest wordList2 wordList2) `seq` return () or time $ trace (doTest wordList2 wordList2) `seq` return () didn't work. Am desperated... Try: time $ evaluate (sum (doTest wordList2 wordList2)) -- Cheers, Lemmih

Re: [Haskell-cafe] Haskell source transformer?

2006-12-01 Thread Lemmih
://www.cs.chalmers.se/~d00nibro/haskell-src-exts/ ). -- Cheers, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] SimonPJ and Tim Harris explain STM - video

2006-11-24 Thread Lemmih
tried yet) Worked for me with mplayer+w32codecs. -- Cheers, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] importing Distribution.Compat.FilePath fails

2006-11-18 Thread Lemmih
-- Cheers, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] How to improve speed? (MersenneTwister is several times slower than C version)

2006-11-01 Thread Lemmih
on its own. -- Cheers, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] How to improve speed? (MersenneTwister is several times slower than C version)

2006-11-01 Thread Lemmih
they're all compiled to unchecked primitives (GHC.Prim.uncheckedShiftRL#). -- Cheers, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Re: Best way to write endsWith

2006-10-21 Thread Lemmih
) - (length suffix) I thinks that's what List.isSuffixOf does. isSuffixOf x y = reverse x `isPrefixOf` reverse y -- Cheers, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] how to create new repository on darcs.haskell.org?

2006-10-04 Thread Lemmih
Just copy your local darcs repository to cvs.haskell.org: scp -r mylibdir cvs.haskell.org:/home/darcs/mylib Or: darcs put [EMAIL PROTECTED]:public_html/repo -- Cheers, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http

Re: [Haskell-cafe] foreach

2006-09-12 Thread Lemmih
- getArgs flip mapM_ args $ \arg - flip mapM_ [1..3] $ \n - putStrLn $ show n ++ ) ++ arg -- Cheers, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] HaXml and ghci unresolved symbol

2006-09-10 Thread Lemmih
(x:xs) = do putStrLn $ showContent x showDoc xs main = showDoc cont ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe -- Cheers, Lemmih

Re: [Haskell-cafe] The Q Programming Language can do symbolic manipulation -- Haskell?

2006-08-15 Thread Lemmih
) -- Cheers, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Apache HTTP Server And Haskell

2006-07-31 Thread Lemmih
, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Trace parser

2006-07-07 Thread Lemmih
-- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Library Repository?

2006-06-03 Thread Lemmih
://hackage.haskell.org/trac/hackage/ticket/65 and various TODO files. -- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] calling haskell from C++

2006-05-23 Thread Lemmih
/ using hsplugins, which compiles haskell code at runtime.. There is an example how to compile/call such a haskell method from C. Hs-plugins just calls GHC. Going through Haskell to execute GHC is overkill in the extremes. -- Friendly, Lemmih ___ Haskell

Re: [Haskell-cafe] Trouble with Cabal

2006-05-22 Thread Lemmih
not obvious (to me) how to specify that everything should be installed locally. Any suggestions? Install locally after configuring this way: ./Setup.lhs configure --user --prefix=$HOME/yourlocalhaskelllibsdir The --user flag to 'configure' isn't necessary. -- Friendly, Lemmih

Re: [Haskell-cafe] Trouble with Cabal

2006-05-22 Thread Lemmih
to registering the package, which I don't permission for. Any way around this? Run: ./Setup.lhs install --user -- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] need help please [HOpenGL]

2006-04-23 Thread Lemmih
a variety of formats and blit them via OpenGL. This binding even contains relevant example code: http://darcs.haskell.org/~lemmih/hsSDL -- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo

Re: [Haskell-cafe] (Newbie Question) How to get the value of an IO String Monad?

2006-02-17 Thread Lemmih
- Socket.recv sock 1 case received of - error ... \n | endswith bulk \r\n\r - ... _ - recv_headers' sock (bulk ++ received) -- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org

Re: [Haskell-cafe] Can I use Haskell for web programming

2006-01-23 Thread Lemmih
it gets looked for by haskell-fastcgi... From the README: Requirements for building: - The cgi package from: http://www.cs.chalmers.se/~bringert/darcs/haskell-cgi/ -- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http

Re: [Haskell-cafe] expanding do notation / StateMonad example from tutorial all about monads

2005-12-31 Thread Lemmih
ok _ = fail 1 in get = ok But I get this compile error in at the line marked by a trailing --: The last statement in a 'do' construct must be an expression Can you help me? Omit the 'do' in 'do let ok2'. -- Friendly, Lemmih

Re: [Haskell-cafe] Proper way to write this

2005-12-25 Thread Lemmih
with 'runDaytimeServer'. -- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] First steps in Haskell

2005-12-18 Thread Lemmih
'. Otherwise just load the file in ghci (`ghci fac.hs`). -- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Barrier implementation

2005-12-16 Thread Lemmih
On 12/16/05, Peter Eriksen [EMAIL PROTECTED] wrote: threadDelay (10*10^6) 10*10^6 == 10e6, btw. -- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Barrier implementation

2005-12-16 Thread Lemmih
On 12/16/05, Marcin Tustin [EMAIL PROTECTED] wrote: On Fri, Dec 16, 2005 at 06:51:12PM +0100, Lemmih wrote: On 12/16/05, Peter Eriksen [EMAIL PROTECTED] wrote: threadDelay (10*10^6) 10*10^6 == 10e6, btw. 10e7. Prelude 10*10^6 == 10e6 True Prelude 10*10^6 == 10e7 False 10

Re: [Haskell-cafe] Re: Differences in optimisiation with interactive and compiled mo

2005-12-10 Thread Lemmih
but example search replace program runs more then 50% faster with my implementation. Greetings, Bane. That's probably because Lemmih's is polymorphic. Didn't Henning Thielemann write it? -- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe

Re: [Haskell-cafe] Learning Haskell

2005-12-05 Thread Lemmih
FastPackedString library: http://www.cse.unsw.edu.au/~dons/fps.html | I am also hoping to use it for web development. Wonder how `links' is coming along. (Hope they figured out a better name, anyway.) Got an url for the project? -- Friendly, Lemmih

Re: [Haskell-cafe] Please explain behavior of setBit

2005-11-12 Thread Lemmih
-Bits.html 'setBit (bit 0) 4' = 'setBit 1 4' = (binary) 10001 = (dec) 17 You're setting the fifth bit in '1' instead of setting the seconded bit in '4'. -- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman

Re: [Haskell-cafe] Nice way to calculate character frequency in a string

2005-10-25 Thread Lemmih
str $ \c - do r - unsafeRead arr (ord c) unsafeWrite arr (ord c) (r+1) liftM (filter (\(c,n) - n0)) (getAssocs arr) -- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe

Re: [Haskell-cafe] List of functions

2005-08-30 Thread Lemmih
and then call mapIO forkIO just once, (of course, a new rule should be attached to the list as well) ? Thanks a lot TuanAnh Something like (untested)... xs - zipWith ($) forkIO (map (\f - f x y) funs) tids - sequence xs or: 'mapM_ [ f x y | f - rules ]' -- Friendly, Lemmih

Re: [Haskell-cafe] Newbie question

2005-08-12 Thread Lemmih
(and reads the contents lazily). Try removing the hClose (replacing it with (return ()). Lazy IO is nice, but gets tricky at times. Or better yet, use 'readFile'. -- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http

Re: [Haskell-cafe] Re: FFI and callbacks

2005-07-21 Thread Lemmih
GHC.Prim.ThreadId# -- Imported from GHC.Conc instance Eq ThreadId-- Imported from Control.Concurrent instance Ord ThreadId -- Imported from Control.Concurrent instance Show ThreadId -- Imported from Control.Concurrent -- Friendly, Lemmih ___ Haskell

Re: [Haskell-cafe] Haskell, SDL, OpenGL

2005-07-20 Thread Lemmih
/platform peculiarities. 'sdl-config' is used to set 'ld-options'. Hard coding it is not an option. -- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Best way to build strings?

2005-07-20 Thread Lemmih
does an implicit convert to string, btw). Is there a facility like this in Haskell? Or something else I should be using, other than lots of ++ ? There's Text.Printf: Prelude Text.Printf printf (%s [] %s) hello world :: String (hello [] world) -- Friendly, Lemmih

Re: [Haskell-cafe] Haskell, SDL, OpenGL

2005-07-18 Thread Lemmih
On 7/18/05, yin [EMAIL PROTECTED] wrote: Hello, I'm trying to write a 3D renderer in Haskell using SDL bindings (Lemmih) and OpenGL bindings. When I try to compile my work, ghc runs collect2: /usr/libexec/gcc/i686-pc-linux-gnu/3.4.3-20050110/collect2 --eh-frame-hdr -m elf_i386 -dynamic

Re: [Haskell-cafe] hawiki Haskell SDL openGl example works strange

2005-07-18 Thread Lemmih
idea how to resolve this little problem? Ops, my bad. The example should be fixed now. -- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] can't build module with ffi 'wrapper' by cabal (or ghc): unknown symbol

2005-07-05 Thread Lemmih
be cleaner. -- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Cabal with Alex and and Happy

2005-06-13 Thread Lemmih
any way of passing options to preprocessors using Cabal. In particular, how do you pass options to Happy? I am using GHC and Cabal from the CVS head, built about two weeks ago. You probably forgot to add 'base' to Build-Depends. -- Friendly, Lemmih

Re: [Haskell-cafe] Cabal with Alex and and Happy

2005-06-13 Thread Lemmih
GHC-6.4 with -hide-all-packages. -- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Ord type on lists

2005-04-02 Thread Lemmih
and everything will be good. But why don't you just derive Eq and Ord for List? -- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] New user, pardon what may be a dumb question

2005-03-31 Thread Lemmih
1655838864) -- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Parse error

2005-03-17 Thread Lemmih
_a lot_ prettier when using the layout to structure the program. -- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] how do I avoid excessive constructor application?

2005-03-02 Thread Lemmih
. (: -- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] how do I avoid excessive constructor application?

2005-03-02 Thread Lemmih
On Wed, 2 Mar 2005 15:54:51 +0100, Stefan Holdermans [EMAIL PROTECTED] wrote: Lemmih, And you can fix it with some unsafeCoerce# magic. (: Actually, as I pointed out, the required coercion in perfectly safe, though not implicit: coerceRight :: Either a b - Either c b coerceRight

Re: [Haskell-cafe] GHC compilation with postres libs

2005-02-25 Thread Lemmih
a postgresql binding. -- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] GUI components for displaying Html pages

2005-02-22 Thread Lemmih
which caters for this purpose. Is this what you're looking for: http://wxhaskell.sourceforge.net/doc/Graphics.UI.WXCore.WxcClassesAL.html#88 ? -- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman

Re: [Haskell-cafe] Problems with building GCJNI 1.2

2005-02-18 Thread Lemmih
, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Problems with building GCJNI 1.2

2005-02-17 Thread Lemmih
On Thu, 17 Feb 2005 11:52:46 +0100, Dmitri Pissarenko [EMAIL PROTECTED] wrote: Hello! Thanks for your answer! Did you import Foreign.GreenCard? No. I just followed the building manual of GCJNI. It may be out of date. -- Friendly, Lemmih

Re: [Haskell-cafe] Problems with building GCJNI 1.2

2005-02-15 Thread Lemmih
-3.01/greencard-bin --target ghc - i /cygdrive/c/Programme/GreenCard/lib/greencard-3.01/imports -- libdir=/cygdrive/c/ Programme/GreenCard/lib/greencard-3.01/ GCJNI.gc Warning: unable to find StdDIS along the import Did you import Foreign.GreenCard? -- Friendly, Lemmih

Re: [Haskell-cafe] Is it possible to print out types of instances in scope

2005-01-16 Thread Lemmih
IOException -- Imported from `GHC.IOBase' instance Show IOErrorType -- Imported from `GHC.IOBase' instance Show HandleType-- Imported from `GHC.IOBase' [...] -- Friendly, Lemmih ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http

Re: [Haskell-cafe] Is it possible to print out types of instances in scope

2005-01-16 Thread Lemmih
On Sun, 16 Jan 2005 10:07:14 -0800, Jeremy Shaw [EMAIL PROTECTED] wrote: At Sun, 16 Jan 2005 12:09:43 +0100, Lemmih wrote: On Sun, 16 Jan 2005 00:13:08 -0800, Jeremy Shaw [EMAIL PROTECTED] wrote: Hello, Is it possible to write a function that would display all the instances