Hello,
In a machine learning application I am currently playing with string
kernels which are recursively defined functions operating on strings.
In Haskell the implementation of these functions is very pleasing as
it is a one-to-one translation of the mathematical definition (see
code below [2]
Hallo Matthias,
> However, the runtime performance is less pleasing as certain
> subexpressions are computed over and over again
There is a Memo module included with Hugs. I justed
(profiling with ghc
> showed that the function k' (see code below) is called 1425291 times
> in a toy example).
>
Oops, previous message left too soon
> However, the runtime performance is less pleasing as certain
> subexpressions are computed over and over again (profiling with ghc
There is a Memo module in Hugs, which I just used for fib. It doesn't seem
to speed it up, though:
--
module Fib where
impor
"Arjan van IJzendoorn" <[EMAIL PROTECTED]> writes:
> There is a Memo module in Hugs, which I just used for fib. It doesn't
> seem to speed it up, though:
You need to call the memoised version in the recursive case.
> module Fib where
>
> import Memo
>
> slow 0 = 0
> slow 1 = 1
> slow n = slow
Malcolm Wallace wrote:
>
> You need to call the memoised version in the recursive case.
>
> > module Fib where
> >
> > import Memo
> >
> > slow 0 = 0
> > slow 1 = 1
> > slow n = slow (n-1) + slow (n-2)
>
> slow n = fast (n-1) + fast (n-2)
>
> > fast n = memo slow n
It would also seem that o
Sertifikam.Com Bilgisayar Eðitim MerkeziMicrosoft Certified Systems EngineerMicrosoft Certified Systems AdministratorMicrosoft Certified Database AdministratorMicrosoft Office User Web Designer Super Fiyatlar ! Ve http://www.sertifikam.com adresinden KAYIT olanlara %10 indirim
Sertifikam.Com Bilgisayar Eðitim MerkeziMicrosoft Certified Systems EngineerMicrosoft Certified Systems AdministratorMicrosoft Certified Database AdministratorMicrosoft Office User Web Designer Super Fiyatlar ! Ve http://www.sertifikam.com adresinden KAYIT olanlara %10 indirim
| Actually, I was also expecting "fast n = memo slow n"
| to work ?
In most lazy implementations, the idea is that sharing only
occurs between computations with the same name. A
computation declaration always has the form:
x = ...
So, if you want sharing to occur between different uses of
Ketil Z. Malde, you wrote:
>
> You have of course looked at http://haskell.org/? While development
Certainly. The links on the pages are very useful, comprehensive and
I would not be as far along without them. As you mention below however,
the development of these libraries is ever changing, an
HaskellDirect (or HDirect for short) is very much alive and
being actively maintained by Sigbjorn Finne.
http://www.haskell.org/hdirect/
It's built on top of the Haskell FFI, but it is much higher level.
Simon
| -Original Message-
| From: Jamie Love [mailto:[EMAIL PROTECTED]]
Yes, it's being looked after, so should you come across
problems using it, please let me know.
Re: HaskellDB, I added MySQL support to it a while ago,
which is one route to get it to work on non-Windows platform.
Releasing these changes would probably be a good idea.
Having said that, going thro
Title: Message
Folks
I plan
to push out a new draft H98 report this week. Here is one
suggested
clarification from Sigbjorn, arising from recent uncertainty about the
true
meaning of getLine.
I'll
incorporate it unless anyone yells.
Simon
-Original Message-From: Simon Marlo
> > Is HaskellDB dead? Is it worth extending?
> > Is HaskellDirect dead or superseeded by the Haskell FFI?
> > I am having difficulty discovering which FFI technology/package is
> > still useful, viable and alive,
>
> You have of course looked at http://haskell.org/? While development
> of libra
Sigbjorn Finne, you wrote:
>
> Re: HaskellDB, I added MySQL support to it a while ago,
> which is one route to get it to work on non-Windows platform.
> Releasing these changes would probably be a good idea.
>
That would be very good as I was expecting to use MySQL through
ODBC anyway. Having su
Janis Voigtlaender wrote:
>
> It would also seem that one needs to write
>
> fast = memo slow
>
> instead, because otherwise a new memo-version of slow might be created
> for every call with some n (subject to let-floating?).
> However, the version:
>
> module Fib where
>
> import Memo
>
At 2002-06-03 09:04, Simon Marlow wrote:
>I'm pleased to announce version 0.3 of Haddock, a documentation
>generation tool for Haskell source code.
Has trouble with this:
-- haddock -h -o Doc/ HaddockTest.hs
module HaddockTest where
{
-- |comment
class C a where
{
};
×ð¾´µÄÐÂÀϿͻ§£º
ÄúºÃ£¡
ӯͨԶº½(www.9dns.net)ΪÁË´ðлÄúÒÔ¼°¹ã´ó¿Í»§¶ÔÎÒ˾µÄÖ§³ÖºÍÐÅÈΣ¬ÎÒÃÇÔÙ´ÎÌá¸ßоɷþÎñÆ÷µÄÐÔÄÜ£¬ÈÃÄúµÄÍøÕ¾¿Õ¼äÔË×÷¸ü¿ì¡¢¸ü
Îȶ¨¡¢¸ü°²È«£¬Í¬Ê±ÎÒÃÇ»¹½µµÍÁ˲úÆ·
¼Û¸ñ£¬ÈÃÄúÏíÊܸüÓÅÖʵķþÎñ¡££¨ÎÒË¾ÍøÕ¾ÏÖÒÑȫиİ棺www.8dns.net£©
200M HTML¿Õ¼ä+1¸
17 matches
Mail list logo