On Wed, 24 Sep 2008, Anatoly Yakovenko wrote:

is there anyway the modifyWith functions could work on uboxed types?

If they're inlined, the modify functions on boxed types may well end up
unboxed.

What's the particular problem you're having?

well, after inspecting a little further its not so bad actually.  i
was comparing

module Main where

import qualified Data.Vector.Dense.IO as Vector
import Control.Monad

e = exp 1.0
sigmoid xx = 1.0 / (1 + (e ** (1.0 * xx)))

I think 'exp' is generally more efficient and less ambiguous than 'e **'.
_______________________________________________
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe

Reply via email to