Dear Juanma,
thanks for your remarks.
Juanma Barranquero (Mon, Nov 10, 2003 at 10:54:22AM +0100):
> On Fri, 7 Nov 2003 19:55:47 +0100
> Stefan Karrmann <[EMAIL PROTECTED]> wrote:
>
> > I've inserted 'convert = (uncurry cFromTai) . cToTai'.
>
> Great, thanks.
>
> > A fixed and checked version i
On Fri, Nov 14, 2003 at 12:22:00AM +0100, Tomasz Zielonka wrote:
>
> There is more to it. Let's define
>
> t2 :: IO ()
> t2 = sequence_ $ repeat $ return ()
>
> t2 behaves in the same way. However, if you compile the module with
> GHC
> with optimisations turned on, both t and t2 run in con
I apologize for the frequency, but based on initial feedback I made some
interface-breaking changes and thought it wise to release. The major
changes are:
* use functions instead of a datatype for Property construction. From the
user's point of view, this just means the colon goes at the end ins
On Thu, Nov 13, 2003 at 05:19:28PM -0500, Wojtek Moczydlowski wrote:
> Consider the following program:
>
> module A where
>
> import Control.Monad.State
>
> f :: StateT Int IO ()
> f = (sequence_ $ repeat $ return ())
>
> t = runStateT f 0
>
>
> When t is evaluated under ghci or hugs, the pro
wojtek:
> Consider the following program:
>
> module A where
>
> import Control.Monad.State
>
> f :: StateT Int IO ()
> f = (sequence_ $ repeat $ return ())
>
> t = runStateT f 0
>
> When t is evaluated under ghci or hugs, the program quickly runs out
> of heap memory. What's going on here? Is
Consider the following program:
module A where
import Control.Monad.State
f :: StateT Int IO ()
f = (sequence_ $ repeat $ return ())
t = runStateT f 0
When t is evaluated under ghci or hugs, the program quickly runs out of heap
memory. What's going on here? Is this inherent in StateT monad? I
On Thu, 13 Nov 2003 16:06:24 -0500
"Abraham Egnor" <[EMAIL PROTECTED]> wrote:
Sorry that I'm too lazy to download the the tar.bz2 and see for myself,
but...
> that applies those functions to a monadic reference. Instances for
> MRef are provided for both IORef and STRef.
Assuming MRef is li
Attribute is a library for storing and retrieving named values from
haskell datatypes in arbitrary monads.
Many of the haskell GUI libraries have implemented something similar; in
one of my current projects, I discovered that such a thing would be
useful. However, I didn't want to tie it to my sp
"Marcin 'Qrczak' Kowalczyk" writes:
> W li¶cie z ¶ro, 12-11-2003, godz. 11:06, Graham Klyne pisze:
>
> > I've sometimes thought that a functional language would be the ideal
> > platform to usher in a purely graphical style of programming;
>
> I don't understand why so many people talk about gra
Frustrating.
Its been 4 years since I seriously looked at
Haskell. I would have expected that over this
time, someone here would have consolidated it into
a language useful for real world applications.
The Haskell in Practice page is shockingly short
and many of the examples are not actually Ha
Stefan wrote:
[snip]
> > Isn't it O(min(m,n))? You don't have to look at all
> elements for the
> > intersection. Eg:
> >
> > {0,1,10}
> > {0,3,98,183,398,1038,5319,7642,9811,13893,93123}
>
> O(f) describes the worst case of the algorithm. It is O((m,n)->m+n).
> The average cost may be
11 matches
Mail list logo