-
Notifications
You must be signed in to change notification settings - Fork 2
/
Copy pathTVarExperiment.hs
66 lines (56 loc) · 1.98 KB
/
TVarExperiment.hs
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
64
65
66
module Main
where
-- Testing interleaving on IORefs and TVars under contention. Most interested
-- in 2 competing HECs
import Control.Concurrent.STM
import Control.Concurrent
import Data.IORef
import Control.Monad
import Data.List
import System.Environment
main = do
[msgsS] <- getArgs
let msgs = read msgsS :: Int -- per thread (with 2 threads)
tmsgs <- testTVar msgs
iormsgs <- testIORef msgs
-- 69% mean
pprint $ analyze iormsgs
-- 9% mean
pprint $ analyze tmsgs
pprint (prefix, rest) =
putStrLn ( (show $ round $ (prefix*100))++"% of messages in constant prefix, with "++(show $ round (rest*100))++"% interleaving for rest" )
analyze :: [Int] -> (Float, Float)
analyze l@(a:as) =
-- strip off starting list
let lenL = length l
lSuff = dropWhile (/=a) as
lenPrefix = length (a:takeWhile (==a) as)
in ( fromIntegral lenPrefix / fromIntegral lenL
, fromIntegral (flops lSuff) / fromIntegral (lenL - lenPrefix - 1) )
flops = subtract 1 . length . group
testTVar :: Int -> IO [Int]
testTVar msgs = do
st <- newTVarIO []
start1 <- newEmptyMVar
start2 <- newEmptyMVar
vs <- mapM (\(n,start)-> do
v <- newEmptyMVar
forkIO $ takeMVar start >> (replicateM_ msgs $ atomically $ modifyTVar' st (n:)) >> putMVar v ()
return v
) [(1, start1),(2,start2)]
mapM_ (flip putMVar ()) [start2,start1]
mapM_ takeMVar vs -- wait
readTVarIO st
testIORef :: Int -> IO [Int]
testIORef msgs = do
st <- newIORef []
start1 <- newEmptyMVar
start2 <- newEmptyMVar
vs <- mapM (\(n,start)-> do
v <- newEmptyMVar
forkIO $ takeMVar start >> (replicateM_ msgs $ atomicModifyIORef' st (\st'-> (n:st',()))) >> putMVar v ()
return v
) [(1, start1),(2,start2)]
mapM_ (flip putMVar ()) [start2,start1]
mapM_ takeMVar vs -- wait
readIORef st