5

vector在处理 a ifunsafeUpdate_函数用于更新 a 的某些元素时,是否可以保持流融合vector?在我做的测试中,答案似乎是否定的。对于下面的代码,在upd函数中生成了临时向量,正如核心中所确认的:

module Main where
import Data.Vector.Unboxed as U

upd :: Vector Int -> Vector Int
upd v = U.unsafeUpdate_ v (U.fromList [0]) (U.fromList [2])

sum :: Vector Int -> Int
sum = U.sum . upd

main = print $ Main.sum $ U.fromList [1..3]

在核心中,$wupd函数用于sum- 如下所示,它生成新的bytearray

$wupd :: Vector Int -> Vector Int
$wupd =
  \ (w :: Vector Int) ->
    case w `cast` ... of _ { Vector ipv ipv1 ipv2 ->
    case main11 `cast` ... of _ { Vector ipv3 ipv4 ipv5 ->
    case main7 `cast` ... of _ { Vector ipv6 ipv7 ipv8 ->
    runSTRep
      (\ (@ s) (s :: State# s) ->
         case >=# ipv1 0 of _ {
           False -> case main6 ipv1 of wild { };
           True ->
             case newByteArray# (*# ipv1 8) (s `cast` ...)
             of _ { (# ipv9, ipv10 #) ->
             case (copyByteArray# ipv2 (*# ipv 8) ipv10 0 (*# ipv1 8) ipv9)
                  `cast` ...

在 for function 的核心中有一个很好的、紧密的循环,sum但就在那个循环之前,有一个$wupdfunction 调用,因此是一个临时生成。

在此处的示例中,有没有办法避免临时生成?我的想法是,更新索引 i 中的向量是解析流但仅作用于索引 i 中的流(跳过其余部分),并将那里的元素替换为另一个元素的情况。所以,在任意位置更新向量不应该破坏流融合,对吧?

4

2 回答 2

5

我不能 100% 确定,因为vector它一直是乌龟(你永远不会真正达到实际的实现,总是有另一个间接的),但据我所知,update变体通过克隆强制一个新的临时:

unsafeUpdate_ :: (Vector v a, Vector v Int) => v a -> v Int -> v a -> v a
{-# INLINE unsafeUpdate_ #-}
unsafeUpdate_ v is w
  = unsafeUpdate_stream v (Stream.zipWith (,) (stream is) (stream w))

unsafeUpdate_stream :: Vector v a => v a -> Stream (Int,a) -> v a
{-# INLINE unsafeUpdate_stream #-}
unsafeUpdate_stream = modifyWithStream M.unsafeUpdate

modifyWithStream调用clone(和new),

modifyWithStream :: Vector v a
                 => (forall s. Mutable v s a -> Stream b -> ST s ())
                 -> v a -> Stream b -> v a
{-# INLINE modifyWithStream #-}
modifyWithStream p v s = new (New.modifyWithStream p (clone v) s)

new :: Vector v a => New v a -> v a
{-# INLINE_STREAM new #-}
new m = m `seq` runST (unsafeFreeze =<< New.run m)

-- | Convert a vector to an initialiser which, when run, produces a copy of
-- the vector.
clone :: Vector v a => v a -> New v a
{-# INLINE_STREAM clone #-}
clone v = v `seq` New.create (
  do
    mv <- M.new (length v)
    unsafeCopy mv v
    return mv)

而且我认为没有办法再次vector摆脱这种情况unsafeCopy

于 2013-06-08T05:01:05.160 回答
1

如果您需要更改一个或很少的元素,库中有很好的解决repa方案yarr。它们保留了融合(我不确定repa)和 Haskell 惯用语。

Repa,使用fromFunction

upd arr = fromFunction (extent arr) ix
  where ix (Z .: 0) = 2
        ix i = index arr i

亚尔,使用Delayed

upd arr = Delayed (extent arr) (touchArray arr) (force arr) ix
  where ix 0 = return 2
        ix i = index arr i
于 2013-06-08T12:31:00.513 回答