是否有等效于 NumPyargsort
函数的标准 Haskell?
我正在使用HMatrix,因此,想要一个与之兼容的函数,Vector R
它是Data.Vector.Storable.Vector Double
. 下面的argSort
函数是我目前正在使用的实现:
{-# LANGUAGE NoImplicitPrelude #-}
module Main where
import qualified Data.List as L
import qualified Data.Vector as V
import qualified Data.Vector.Storable as VS
import Prelude (($), Double, IO, Int, compare, print, snd)
a :: VS.Vector Double
a = VS.fromList [40.0, 20.0, 10.0, 11.0]
argSort :: VS.Vector Double -> V.Vector Int
argSort xs = V.fromList (L.map snd $ L.sortBy (\(x0, _) (x1, _) -> compare x0 x1) (L.zip (VS.toList xs) [0..]))
main :: IO ()
main = print $ argSort a -- yields [2,3,1,0]
我使用显式限定import
的 s 只是为了清楚每种类型和函数的来源。
这种实现并不是非常有效,因为它将输入向量转换为列表,并将结果转换回向量。这样的东西(但更有效)是否存在于某处?
更新
@leftaroundabout 有一个很好的解决方案。这是我最终得到的解决方案:
module LAUtil.Sorting
( IndexVector
, argSort
)
where
import Control.Monad
import Control.Monad.ST
import Data.Ord
import qualified Data.Vector.Algorithms.Intro as VAI
import qualified Data.Vector.Storable as VS
import qualified Data.Vector.Unboxed as VU
import qualified Data.Vector.Unboxed.Mutable as VUM
import Numeric.LinearAlgebra
type IndexVector = VU.Vector Int
argSort :: Vector R -> IndexVector
argSort xs = runST $ do
let l = VS.length xs
t0 <- VUM.new l
forM_ [0..l - 1] $
\i -> VUM.unsafeWrite t0 i (i, (VS.!) xs i)
VAI.sortBy (comparing snd) t0
t1 <- VUM.new l
forM_ [0..l - 1] $
\i -> VUM.unsafeRead t0 i >>= \(x, _) -> VUM.unsafeWrite t1 i x
VU.freeze t1
这更直接可用,Numeric.LinearAlgebra
因为数据向量是 a Storable
。这对索引使用未装箱的向量。