[Haskell-cafe] Re: haskell blas bindings: does iomatrix gemv
transposing of matrix a?
Henning Thielemann
lemming at henning-thielemann.de
Wed Sep 24 04:38:07 EDT 2008
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 **'.
More information about the Haskell-Cafe
mailing list