IORef
s、MVar
s、およびTVar
s を使用して、同時コンテキストで共有変数をラップできます。私はしばらくの間並行ハスケルを研究してきましたが、今ではいくつかの質問に遭遇しました。stackoverflow を検索して関連する質問を読んだ後、私の質問は完全には解決されていません。
IORef
ドキュメント「Extending the atomity to multiple IORefs is problem」によると、単一の IORefIORef
が安全であるのに複数IORef
の s が問題である理由を誰かが説明してくれますか?modifyMVar
「例外セーフですが、このMVarの他のプロデューサーがない場合にのみアトミックです」。MVar
のドキュメントを参照してください。ソース コードは、 andmodifyMVar
のみを順次に構成することを示しており、別のプロデューサーが存在する場合にスレッド セーフではないことを示しています。しかし、プロデューサーがなく、すべてのスレッドが " then " のように動作する場合、単純に を使用するのはスレッドセーフですか?getMVar
putMVar
takeMVar
putMVar
modifyMVar
具体的な状況を示すために、実際の問題を示します。空にならない共有変数がいくつかあり、それらを変更可能な状態にして、一部のスレッドがこれらの変数を同時に変更できるようにします。
OK、TVar
すべてが明確に解決されたようです。しかし、私はそれに満足しておらず、上記の質問への回答を熱望しています. どんな助けでも大歓迎です。
-------------- re: @GabrielGonzalez BFS インターフェイス コード ------------------
以下のコードは、状態モナドを使用した私の BFS インターフェイスです。
{-# LANGUAGE TypeFamilies, FlexibleContexts #-}
module Data.Graph.Par.Class where
import Data.Ix
import Data.Monoid
import Control.Concurrent
import Control.Concurrent.MVar
import Control.Monad
import Control.Monad.Trans.State
class (Ix (Vertex g), Ord (Edge g), Ord (Path g)) => ParGraph g where
type Vertex g :: *
type Edge g :: *
-- type Path g :: * -- useless
type VertexProperty g :: *
type EdgeProperty g :: *
edges :: g a -> IO [Edge g]
vertexes :: g a -> IO [Vertex g]
adjacencies :: g a -> Vertex g -> IO [Vertex g]
vertexProperty :: Vertex g -> g a -> IO (VertexProperty g)
edgeProperty :: Edge g -> g a -> IO (EdgeProperty g)
atomicModifyVertexProperty :: (VertexProperty g -> IO (VertexProperty g)) ->
Vertex g -> g a -> IO (g a) -- fixed
spanForest :: ParGraph g => [Vertex g] -> StateT (g a) IO ()
spanForest roots = parallelise (map spanTree roots) -- parallel version
spanForestSeq :: ParGraph g => [Vertex g] -> StateT (g a) IO ()
spanForestSeq roots = forM_ roots spanTree -- sequencial version
spanTree :: ParGraph g => Vertex g -> StateT (g a) IO ()
spanTree root = spanTreeOneStep root >>= \res -> case res of
[] -> return ()
adjs -> spanForestSeq adjs
spanTreeOneStep :: ParGraph g => Vertex g -> StateT (g a) IO [Vertex g]
spanTreeOneStep v = StateT $ \g -> adjacencies g v >>= \adjs -> return (adjs, g)
parallelise :: (ParGraph g, Monoid b) => [StateT (g a) IO b] -> StateT (g a) IO b
parallelise [] = return mempty
parallelise ss = syncGraphOp $ map forkGraphOp ss
forkGraphOp :: (ParGraph g, Monoid b) => StateT (g a) IO b -> StateT (g a) IO (MVar b)
forkGraphOp t = do
s <- get
mv <- mapStateT (forkHelper s) t
return mv
where
forkHelper s x = do
mv <- newEmptyMVar
forkIO $ x >>= \(b, s) -> putMVar mv b
return (mv, s)
syncGraphOp :: (ParGraph g, Monoid b) => [StateT (g a) IO (MVar b)] -> StateT (g a) IO b
syncGraphOp [] = return mempty
syncGraphOp ss = collectMVars ss >>= waitResults
where
collectMVars [] = return []
collectMVars (x:xs) = do
mvx <- x
mvxs <- collectMVars xs
return (mvx:mvxs)
waitResults mvs = StateT $ \g -> forM mvs takeMVar >>= \res -> return ((mconcat res), g)