I have just started on my journey in learning Haskell.I have started off
reading wikibook,then will read yet another tutorial on haskell.Please guide
me if I am on right track
thks
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell
So I just coded up the approach. It compiles, so I assume it works as
intended. ;-)
Comments and clever obervations extremely welcome.
cheers,
T.
module W where
import Control.Concurrent.STM
import qualified Data.Map as M
import System.Mem.Weak
import GHC.Conc
makePtr tabPtr a
= do
Hi All,
I'm hacking some (external) B-Tree code, and amongst the numerous
interesting problems I've come up against[*], is to do with managing
which pages/nodes are in memory and which are not.
We use TVars to point from one (in-memory version of a) page to
another, so we have a type like the fo
On Tue, Feb 06, 2007 at 04:58:28PM +0100, Alfonso Acosta wrote:
> Hi all,
>
> Reading the sources of Lava (a Haskell Hardware Description DSL) I run
> into this definition ...
>
>
> unsafeCoerce :: a -> b
> unsafeCoerce a = unsafePerformIO $
> do writeIORef ref a
> readIORef ref
> where
>
Hi Chad
I think what you are after is Haskell All-In-One:
http://www.cs.utah.edu/~hal/HAllInOne/index.html
As it happens, since that date Yhc has moved on to the point where:
yhc Main.hs -linkcore
loadCore "Main.yca" >>= writeFile "Main.hs" . coreHaskell
Will get you a similar result - but
[EMAIL PROTECTED] wrote:
> Here are two surveys (somewhat outdated) on the use of formal methods in
> industry:
> http://citeseer.ifi.unizh.ch/39426.html
> http://citeseer.ifi.unizh.ch/craigen93international.html
Both of these links are dead. Could you post author and title?
Thanks
Ben
_
Maybe a year or so ago, I came across a tool for Haskell that takes a
collection of modules, does some name-mangling, and gives a single
module that only needs to export main. There were wonderful reductions
in the size of the resulting executable, and potentially more
optimizations available to G
On 2/8/07, Martin DeMello <[EMAIL PROTECTED]> wrote:
Code here: http://zem.novylen.net/anagrid.html
I've got an instance of IO appearing unexpectedly and I can't figure
out where from. It throws up the following error:
$ ghc --make test.hs
Chasing modules from: test.hs
Compiling Main
Martin DeMello wrote:
> Code here: http://zem.novylen.net/anagrid.html
>
> I've got an instance of IO appearing unexpectedly and I can't figure
> out where from. It throws up the following error:
>
> $ ghc --make test.hs
> Chasing modules from: test.hs
> Compiling Main ( test.hs, test
Code here: http://zem.novylen.net/anagrid.html
I've got an instance of IO appearing unexpectedly and I can't figure
out where from. It throws up the following error:
$ ghc --make test.hs
Chasing modules from: test.hs
Compiling Main ( test.hs, test.o )
test.hs:38:15:
Couldn't matc
Aaron McDaid wrote:
> Could seq be changed so that it will not give an error if it finds
> undefined? Am I right in thinking that seq is supposed to
> theoretically do nothing, but simply give a hint to the compiler so to
> speak? If that is true, it should merely attempt to evaluate it, but
> igno
Steve Downey wrote:
The primary goal of writing source code isn't to communicate to a
computer, but to communicate to a human being.
That implies that the communication should be at a high enough level
of abstraction to be easily understood by people, while not losing the
precision necessary for
Lennart Augustsson wrote:
I think seq is funny because it is not lambda definable.
Does the set of computable functions on the natural
numbers defined by the lambda calculus augmented
with seq have higher Turing degree than the
set of classical computable functions?
-Yitz
_
On Wed, 7 Feb 2007, Cale Gibbard wrote:
On 28/01/07, Alexy Khrabrov <[EMAIL PROTECTED]> wrote:
How do people stumble on Haskell?
I got referred to Haskell by an acquaintance when I happened to
mention that I was interested in algebraic approaches to music theory.
He referred me to Haskore.
14 matches
Mail list logo