diff options
author | Sam Truzjan <pxqr.sta@gmail.com> | 2014-02-16 02:50:07 +0400 |
---|---|---|
committer | Sam Truzjan <pxqr.sta@gmail.com> | 2014-02-16 02:50:07 +0400 |
commit | 48cbf1244b762d3a52e15d16ba0c3391f095501c (patch) | |
tree | 60aeadb9c1be34acea022e432ebe86f1f2fa0640 /tests/Network | |
parent | f76c503499da778392874195675fba893636ce27 (diff) |
Add 2 more behaviours for routing table
Diffstat (limited to 'tests/Network')
-rw-r--r-- | tests/Network/BitTorrent/DHT/RoutingSpec.hs | 59 |
1 files changed, 58 insertions, 1 deletions
diff --git a/tests/Network/BitTorrent/DHT/RoutingSpec.hs b/tests/Network/BitTorrent/DHT/RoutingSpec.hs index e032e27d..a92fec38 100644 --- a/tests/Network/BitTorrent/DHT/RoutingSpec.hs +++ b/tests/Network/BitTorrent/DHT/RoutingSpec.hs | |||
@@ -1,12 +1,69 @@ | |||
1 | {-# LANGUAGE ScopedTypeVariables #-} | ||
1 | module Network.BitTorrent.DHT.RoutingSpec (spec) where | 2 | module Network.BitTorrent.DHT.RoutingSpec (spec) where |
3 | import Control.Applicative | ||
4 | import Control.Monad.State | ||
2 | import Data.Default | 5 | import Data.Default |
6 | import Data.List as L | ||
7 | import Data.Maybe | ||
3 | import Test.Hspec | 8 | import Test.Hspec |
9 | import Test.QuickCheck | ||
4 | 10 | ||
5 | import Network.BitTorrent.Core | 11 | import Network.BitTorrent.Core |
6 | import Network.BitTorrent.DHT.Routing as T | 12 | import Network.BitTorrent.DHT.Routing as T |
7 | 13 | ||
14 | import Network.BitTorrent.CoreSpec hiding (spec) | ||
15 | |||
16 | |||
17 | type Network ip = [NodeAddr ip] | ||
18 | |||
19 | data Env ip = Env | ||
20 | { currentTime :: Timestamp | ||
21 | , network :: Network ip | ||
22 | } deriving Show | ||
23 | |||
24 | type Simulation ip = State (Env ip) | ||
25 | |||
26 | runSimulation :: Eq ip => Env ip -> Routing ip a -> Maybe a | ||
27 | runSimulation e m = evalState (runRouting ping closest timestamp m) e | ||
28 | where | ||
29 | ping addr = gets (L.elem addr . network) | ||
30 | closest nid = undefined | ||
31 | timestamp = gets currentTime | ||
32 | |||
33 | instance Arbitrary ip => Arbitrary (Env ip) where | ||
34 | arbitrary = Env <$> arbitrary <*> arbitrary | ||
35 | |||
36 | instance (Arbitrary ip, Eq ip) => Arbitrary (Table ip) where | ||
37 | arbitrary = do | ||
38 | thisId <- arbitrary | ||
39 | bucketN <- choose (1, 20) | ||
40 | let table = nullTable thisId bucketN | ||
41 | |||
42 | -- nodeN <- (`mod` bucketN) <$> arbitrary | ||
43 | -- nodes <- vector nodeN | ||
44 | |||
45 | node <- arbitrary | ||
46 | mt <- runSimulation <$> arbitrary | ||
47 | <*> pure (T.insert node table) | ||
48 | --(foldM (flip fillTable) table nodes) | ||
49 | return (fromJust mt) | ||
50 | where | ||
51 | fillTable x t = do | ||
52 | t' <- T.insert x t | ||
53 | return $ if T.full t' then t else t' | ||
54 | |||
8 | spec :: Spec | 55 | spec :: Spec |
9 | spec = do | 56 | spec = do |
10 | describe "size" $ do | 57 | describe "size" $ do |
11 | it "null table is empty" $ do | 58 | it "null table is empty" $ do |
12 | T.size (nullTable def 2 :: Table IPv4) `shouldBe` 0 \ No newline at end of file | 59 | T.size (nullTable def 2 :: Table IPv4) `shouldBe` 0 |
60 | |||
61 | it "the same node never appear in different buckets" $ property $ \ t -> do | ||
62 | let xss = T.toList (t :: Table Int) | ||
63 | let justOnce x = L.length (L.filter (L.elem x) xss) == 1 | ||
64 | L.all justOnce (L.concat xss) | ||
65 | |||
66 | it "insert is idemponent" $ property $ \ (e :: Env Int) n t -> do | ||
67 | let t1 = runSimulation e (T.insert n t) | ||
68 | let t2 = runSimulation e (T.insert n t >>= T.insert n) | ||
69 | t1 `shouldBe` t2 \ No newline at end of file | ||