diff options
author | joe <joe@jerkface.net> | 2017-07-14 23:52:33 -0400 |
---|---|---|
committer | joe <joe@jerkface.net> | 2017-07-14 23:52:33 -0400 |
commit | 9d5b5512ce3b5b885c0e331d6fcefa0b9d3fc42b (patch) | |
tree | 1c83e304b1bf4fb604bb984c6e0e5d0ad54485a2 /Mainline.hs | |
parent | 29f369311408b5ed7823c9858257d1c948e24d28 (diff) |
Implemented more of the Mainline DHT rewrite.
Diffstat (limited to 'Mainline.hs')
-rw-r--r-- | Mainline.hs | 456 |
1 files changed, 418 insertions, 38 deletions
diff --git a/Mainline.hs b/Mainline.hs index d24b3376..12d1540b 100644 --- a/Mainline.hs +++ b/Mainline.hs | |||
@@ -4,32 +4,51 @@ | |||
4 | {-# LANGUAGE DeriveTraversable #-} | 4 | {-# LANGUAGE DeriveTraversable #-} |
5 | {-# LANGUAGE FlexibleInstances #-} | 5 | {-# LANGUAGE FlexibleInstances #-} |
6 | {-# LANGUAGE GeneralizedNewtypeDeriving #-} | 6 | {-# LANGUAGE GeneralizedNewtypeDeriving #-} |
7 | {-# LANGUAGE PatternSynonyms #-} | ||
8 | {-# LANGUAGE StandaloneDeriving #-} | ||
7 | module Mainline where | 9 | module Mainline where |
8 | 10 | ||
11 | import Control.Applicative | ||
9 | import Control.Arrow | 12 | import Control.Arrow |
10 | import Control.Concurrent.STM | 13 | import Control.Concurrent.STM |
11 | import Crypto.Random | 14 | import Crypto.Random |
12 | import Data.BEncode as BE | 15 | import Data.BEncode as BE |
13 | import Data.BEncode.BDict as BE | 16 | import qualified Data.BEncode.BDict as BE |
17 | ;import Data.BEncode.BDict (BKey) | ||
18 | import Data.Bits | ||
19 | import Data.Bits.ByteString | ||
14 | import Data.Bool | 20 | import Data.Bool |
15 | import Data.ByteArray | 21 | import qualified Data.ByteArray as BA |
16 | import Data.ByteString (ByteString) | 22 | ;import Data.ByteArray (ByteArrayAccess) |
17 | import Data.ByteString as B | 23 | import qualified Data.ByteString as B |
18 | import Data.ByteString.Lazy (toStrict) | 24 | ;import Data.ByteString (ByteString) |
25 | import Data.ByteString.Lazy (toStrict) | ||
19 | import Data.Data | 26 | import Data.Data |
27 | import Data.Default | ||
28 | import Data.Hashable | ||
20 | import Data.IP | 29 | import Data.IP |
30 | import Data.List | ||
21 | import Data.Maybe | 31 | import Data.Maybe |
22 | import Data.Monoid | 32 | import Data.Monoid |
23 | import qualified Data.Serialize as S | 33 | import qualified Data.Serialize as S |
34 | import Data.Set (Set) | ||
35 | import Data.Torrent | ||
24 | import Data.Typeable | 36 | import Data.Typeable |
25 | import Data.Word | 37 | import Data.Word |
26 | import Network.Address (Address, fromSockAddr, sockAddrPort, | 38 | import Network.Address (Address, fromSockAddr, setPort, |
27 | toSockAddr, withPort) | 39 | sockAddrPort, toSockAddr) |
40 | import Network.BitTorrent.DHT.ContactInfo as Peers | ||
41 | import Network.BitTorrent.DHT.Token as Token | ||
42 | import qualified Network.DHT.Routing as R | ||
43 | ;import Network.DHT.Routing (Info, Timestamp, getTimestamp) | ||
28 | import Network.QueryResponse | 44 | import Network.QueryResponse |
29 | import Network.Socket | 45 | import Network.Socket |
30 | 46 | ||
31 | newtype NodeId = NodeId ByteString | 47 | newtype NodeId = NodeId ByteString |
32 | deriving (Eq,Ord,Show,ByteArrayAccess, BEncode) | 48 | deriving (Eq,Ord,Show,ByteArrayAccess, BEncode, Bits) |
49 | |||
50 | instance FiniteBits NodeId where | ||
51 | finiteBitSize _ = 160 | ||
33 | 52 | ||
34 | data NodeInfo = NodeInfo | 53 | data NodeInfo = NodeInfo |
35 | { nodeId :: NodeId | 54 | { nodeId :: NodeId |
@@ -37,8 +56,44 @@ data NodeInfo = NodeInfo | |||
37 | , nodePort :: PortNumber | 56 | , nodePort :: PortNumber |
38 | } | 57 | } |
39 | 58 | ||
59 | instance Hashable NodeInfo where | ||
60 | hashWithSalt s ni = hashWithSalt s (nodeIP ni , nodePort ni) | ||
61 | {-# INLINE hashWithSalt #-} | ||
62 | |||
63 | |||
64 | |||
65 | {- | ||
66 | |||
67 | -- | KRPC 'compact list' compatible encoding: contact information for | ||
68 | -- nodes is encoded as a 26-byte string. Also known as "Compact node | ||
69 | -- info" the 20-byte Node ID in network byte order has the compact | ||
70 | -- IP-address/port info concatenated to the end. | ||
71 | get = NodeInfo <$> (NodeId <$> S.getBytes 20 ) <*> S.get <*> S.get | ||
72 | -} | ||
73 | |||
74 | getNodeInfo4 :: S.Get NodeInfo | ||
75 | getNodeInfo4 = NodeInfo <$> (NodeId <$> S.getBytes 20) | ||
76 | <*> (IPv4 <$> S.get) | ||
77 | <*> S.get | ||
78 | |||
79 | putNodeInfo4 :: NodeInfo -> S.Put | ||
80 | putNodeInfo4 (NodeInfo (NodeId nid) (IPv4 ip) port) | ||
81 | = S.putByteString nid >> S.put ip >> S.put port | ||
82 | putNodeInfo4 _ = return () | ||
83 | |||
84 | getNodeInfo6 :: S.Get NodeInfo | ||
85 | getNodeInfo6 = NodeInfo <$> (NodeId <$> S.getBytes 20) | ||
86 | <*> (IPv6 <$> S.get) | ||
87 | <*> S.get | ||
88 | |||
89 | putNodeInfo6 :: NodeInfo -> S.Put | ||
90 | putNodeInfo6 (NodeInfo (NodeId nid) (IPv6 ip) port) | ||
91 | = S.putByteString nid >> S.put ip >> S.put port | ||
92 | putNodeInfo6 _ = return () | ||
93 | |||
94 | |||
40 | nodeAddr :: NodeInfo -> SockAddr | 95 | nodeAddr :: NodeInfo -> SockAddr |
41 | nodeAddr (NodeInfo _ ip port) = toSockAddr ip `withPort` port | 96 | nodeAddr (NodeInfo _ ip port) = setPort port $ toSockAddr ip |
42 | 97 | ||
43 | nodeInfo :: NodeId -> SockAddr -> Either String NodeInfo | 98 | nodeInfo :: NodeId -> SockAddr -> Either String NodeInfo |
44 | nodeInfo nid saddr | 99 | nodeInfo nid saddr |
@@ -110,7 +165,7 @@ instance BE.BEncode (Message BValue) where | |||
110 | 165 | ||
111 | encodeMessage (Q origin tid a meth ro) | 166 | encodeMessage (Q origin tid a meth ro) |
112 | = case a of | 167 | = case a of |
113 | BDict args -> encodeQuery tid meth (BDict $ genericArgs origin ro `union` args) | 168 | BDict args -> encodeQuery tid meth (BDict $ genericArgs origin ro `BE.union` args) |
114 | _ -> encodeQuery tid meth a -- XXX: Not really a valid query. | 169 | _ -> encodeQuery tid meth a -- XXX: Not really a valid query. |
115 | encodeMessage (R origin tid v ip) | 170 | encodeMessage (R origin tid v ip) |
116 | = case v of | 171 | = case v of |
@@ -148,6 +203,60 @@ encodePacket :: Message BValue -> NodeInfo -> (ByteString, SockAddr) | |||
148 | encodePacket msg ni = ( toStrict $ BE.encode msg | 203 | encodePacket msg ni = ( toStrict $ BE.encode msg |
149 | , nodeAddr ni ) | 204 | , nodeAddr ni ) |
150 | 205 | ||
206 | classify :: Message BValue -> MessageClass String Method TransactionId | ||
207 | classify (Q { msgID = tid, qryMethod = meth }) = IsQuery meth tid | ||
208 | classify (R { msgID = tid }) = IsResponse tid | ||
209 | |||
210 | encodePayload :: BEncode a => TransactionId -> NodeInfo -> NodeInfo -> a -> Message BValue | ||
211 | encodePayload tid self dest b = R (nodeId self) tid (Right $ BE.toBEncode b) (Just $ nodeAddr dest) | ||
212 | |||
213 | errorPayload :: TransactionId -> NodeInfo -> NodeInfo -> Error -> Message a | ||
214 | errorPayload tid self dest e = R (nodeId self) tid (Left e) (Just $ nodeAddr dest) | ||
215 | |||
216 | decodePayload :: BEncode a => Message BValue -> Either String a | ||
217 | decodePayload msg = BE.fromBEncode $ qryPayload msg | ||
218 | |||
219 | type Handler = MethodHandler String TransactionId NodeInfo (Message BValue) | ||
220 | |||
221 | handler :: ( BEncode a | ||
222 | , BEncode b | ||
223 | ) => | ||
224 | (NodeInfo -> a -> IO b) -> Maybe Handler | ||
225 | handler f = Just $ MethodHandler decodePayload encodePayload f | ||
226 | |||
227 | |||
228 | handlerE :: ( BEncode a | ||
229 | , BEncode b | ||
230 | ) => | ||
231 | (NodeInfo -> a -> IO (Either Error b)) -> Maybe Handler | ||
232 | handlerE f = Just $ MethodHandler decodePayload enc f | ||
233 | where | ||
234 | enc tid self dest (Left e) = errorPayload tid self dest e | ||
235 | enc tid self dest (Right b) = encodePayload tid self dest b | ||
236 | |||
237 | type AnnounceSet = Set (InfoHash, PortNumber) | ||
238 | |||
239 | data SwarmsDatabase = SwarmsDatabase | ||
240 | { contactInfo :: !( TVar PeerStore ) -- ^ Published by other nodes. | ||
241 | , sessionTokens :: !( TVar SessionTokens ) -- ^ Query session IDs. | ||
242 | , announceInfo :: !( TVar AnnounceSet ) -- ^ To publish by this node. | ||
243 | } | ||
244 | |||
245 | newSwarmsDatabase :: IO SwarmsDatabase | ||
246 | newSwarmsDatabase = do | ||
247 | toks <- nullSessionTokens | ||
248 | atomically | ||
249 | $ SwarmsDatabase <$> newTVar def | ||
250 | <*> newTVar toks | ||
251 | <*> newTVar def | ||
252 | |||
253 | type RoutingInfo = Info NodeInfo NodeId | ||
254 | |||
255 | data Routing = Routing | ||
256 | { routing4 :: !( TVar (Maybe RoutingInfo) ) | ||
257 | , routing6 :: !( TVar (Maybe RoutingInfo) ) | ||
258 | } | ||
259 | |||
151 | newClient :: | 260 | newClient :: |
152 | SockAddr -> IO (Client String Method TransactionId NodeInfo (Message BValue)) | 261 | SockAddr -> IO (Client String Method TransactionId NodeInfo (Message BValue)) |
153 | newClient addr = do | 262 | newClient addr = do |
@@ -156,13 +265,26 @@ newClient addr = do | |||
156 | self <- atomically $ newTVar | 265 | self <- atomically $ newTVar |
157 | $ NodeInfo nid (fromMaybe (toEnum 0) $ fromSockAddr addr) | 266 | $ NodeInfo nid (fromMaybe (toEnum 0) $ fromSockAddr addr) |
158 | (fromMaybe 0 $ sockAddrPort addr) | 267 | (fromMaybe 0 $ sockAddrPort addr) |
159 | -- drg <- getSystemDRG | 268 | routing <- atomically $ Routing <$> newTVar Nothing <*> newTVar Nothing |
160 | let net = layerTransport parsePacket encodePacket udp | 269 | swarms <- newSwarmsDatabase |
270 | let net = onInbound grok $ layerTransport parsePacket encodePacket udp | ||
271 | grok _ _ = do | ||
272 | -- TODO Update kademlia table. | ||
273 | -- TODO Update external ip address and update BEP-42 node id. | ||
274 | return () | ||
161 | dispatch tbl = DispatchMethods | 275 | dispatch tbl = DispatchMethods |
162 | { classifyInbound = classify | 276 | { classifyInbound = classify |
163 | , lookupHandler = handlers | 277 | , lookupHandler = handlers |
164 | , tableMethods = tbl | 278 | , tableMethods = tbl |
165 | } | 279 | } |
280 | |||
281 | handlers :: Method -> Maybe Handler | ||
282 | handlers ( Method "ping" ) = handler pingH | ||
283 | handlers ( Method "find_node" ) = handler $ findNodeH routing | ||
284 | handlers ( Method "get_peers" ) = handler $ getPeersH routing swarms | ||
285 | handlers ( Method "announce_peer" ) = handlerE $ announceH swarms | ||
286 | handlers ( Method meth ) = Just $ defaultHandler meth | ||
287 | |||
166 | mapT = transactionMethods mapMethods gen | 288 | mapT = transactionMethods mapMethods gen |
167 | gen :: Word16 -> (TransactionId, Word16) | 289 | gen :: Word16 -> (TransactionId, Word16) |
168 | gen cnt = (TransactionId $ S.encode cnt, cnt+1) | 290 | gen cnt = (TransactionId $ S.encode cnt, cnt+1) |
@@ -176,29 +298,287 @@ newClient addr = do | |||
176 | , clientResponseId = return | 298 | , clientResponseId = return |
177 | } | 299 | } |
178 | 300 | ||
179 | classify :: Message BValue -> MessageClass String Method TransactionId | 301 | defaultHandler :: ByteString -> Handler |
180 | classify (Q { msgID = tid, qryMethod = meth }) = IsQuery meth tid | 302 | defaultHandler meth = MethodHandler decodePayload errorPayload returnError |
181 | classify (R { msgID = tid }) = IsResponse tid | 303 | where |
182 | 304 | returnError :: NodeInfo -> BValue -> IO Error | |
183 | encodePayload tid self dest b = R (nodeId self) tid (Right $ BE.toBEncode b) (Just $ nodeAddr dest) | 305 | returnError _ _ = return $ Error MethodUnknown ("Unknown method " <> meth) |
184 | 306 | ||
185 | errorPayload tid self dest e = R (nodeId self) tid (Left e) (Just $ nodeAddr dest) | 307 | |
186 | 308 | data Ping = Ping deriving Show | |
187 | decodePayload :: BEncode a => Message BValue -> Either String a | 309 | |
188 | decodePayload msg = BE.fromBEncode $ qryPayload msg | 310 | -- Pong is the same as Ping. |
189 | 311 | type Pong = Ping | |
190 | handler f = Just $ MethodHandler decodePayload encodePayload f | 312 | pattern Pong = Ping |
191 | 313 | ||
192 | handlers :: Method -> Maybe (MethodHandler String TransactionId NodeInfo (Message BValue)) | 314 | instance BEncode Ping where |
193 | handlers (Method "ping" ) = error "handler pingH" | 315 | toBEncode Ping = toDict endDict |
194 | handlers (Method "find_node") = error "find_node" | 316 | fromBEncode _ = pure Ping |
195 | handlers (Method "get_peers") = error "get_peers" | 317 | |
196 | handlers (Method meth ) = Just $ MethodHandler decodePayload errorPayload (defaultH meth) | 318 | data WantIP = Want_IP4 | Want_IP6 | Want_Both |
197 | 319 | deriving (Eq, Enum, Ord, Show) | |
198 | data Ping = Ping | 320 | |
321 | wantList :: WantIP -> [ByteString] | ||
322 | wantList Want_IP4 = ["ip4"] | ||
323 | wantList Want_IP6 = ["ip6"] | ||
324 | wantList Want_Both = ["ip4","ip6"] | ||
325 | |||
326 | instance BEncode WantIP where | ||
327 | toBEncode w = toBEncode $ wantList w | ||
328 | fromBEncode bval = do | ||
329 | wants <- fromBEncode bval | ||
330 | let _ = wants :: [ByteString] | ||
331 | case (elem "ip4" wants, elem "ip6" wants) of | ||
332 | (True,True) -> Right Want_Both | ||
333 | (True,False) -> Right Want_IP4 | ||
334 | (False,True) -> Right Want_IP6 | ||
335 | _ -> Left "Unrecognized IP type." | ||
336 | |||
337 | data FindNode = FindNode NodeId (Maybe WantIP) | ||
338 | |||
339 | instance BEncode FindNode where | ||
340 | toBEncode (FindNode nid iptyp) = toDict $ target_key .=! nid | ||
341 | .: want_key .=? iptyp | ||
342 | .: endDict | ||
343 | fromBEncode = fromDict $ FindNode <$>! target_key | ||
344 | <*>? want_key | ||
345 | |||
346 | data NodeFound = NodeFound | ||
347 | { nodes4 :: [NodeInfo] | ||
348 | , nodes6 :: [NodeInfo] | ||
349 | } | ||
350 | |||
351 | instance BEncode NodeFound where | ||
352 | toBEncode (NodeFound ns ns6) = toDict $ | ||
353 | nodes_key .=? | ||
354 | (if Prelude.null ns then Nothing | ||
355 | else Just (S.runPut (mapM_ putNodeInfo4 ns))) | ||
356 | .: nodes6_key .=? | ||
357 | (if Prelude.null ns6 then Nothing | ||
358 | else Just (S.runPut (mapM_ putNodeInfo6 ns6))) | ||
359 | .: endDict | ||
199 | 360 | ||
200 | pingH :: NodeInfo -> Ping -> IO Ping | 361 | fromBEncode bval = NodeFound <$> ns4 <*> ns6 |
201 | pingH = error "pingH" | 362 | where |
363 | ns4 = fromDict (binary getNodeInfo4 nodes_key) bval | ||
364 | ns6 = fromDict (binary getNodeInfo6 nodes6_key) bval | ||
365 | |||
366 | binary :: S.Get a -> BKey -> BE.Get [a] | ||
367 | binary get k = field (req k) >>= either (fail . format) return . | ||
368 | S.runGet (many get) | ||
369 | where | ||
370 | format str = "fail to deserialize " ++ show k ++ " field: " ++ str | ||
371 | |||
372 | pingH :: NodeInfo -> Ping -> IO Pong | ||
373 | pingH _ Ping = return Pong | ||
374 | |||
375 | -- | True if the argument is an IPv4-mapped address with prefix ::FFFF:0:0/96 | ||
376 | -- as defined in RFC 4291. | ||
377 | is4mapped :: IPv6 -> Bool | ||
378 | is4mapped ip | ||
379 | | [0,0,0,0,0,0,0xffff,_] <- fromIPv6 ip | ||
380 | = True | ||
381 | | otherwise = False | ||
382 | |||
383 | prefer4or6 :: NodeInfo -> Maybe WantIP -> WantIP | ||
384 | prefer4or6 addr iptyp = fromMaybe unspecified iptyp | ||
385 | where | ||
386 | unspecified = case nodeIP addr of | ||
387 | IPv4 _ -> Want_IP4 | ||
388 | IPv6 a | is4mapped a -> Want_IP4 | ||
389 | | otherwise -> Want_IP6 | ||
390 | |||
391 | findNodeH :: Routing -> NodeInfo -> FindNode -> IO NodeFound | ||
392 | findNodeH routing addr (FindNode node iptyp) = do | ||
393 | let preferred = prefer4or6 addr iptyp | ||
394 | ks <- bool (return []) (go $ routing4 routing) (preferred /= Want_IP6) | ||
395 | ks6 <- bool (return []) (go $ routing6 routing) (preferred /= Want_IP4) | ||
396 | return $ NodeFound ks ks6 | ||
397 | where | ||
398 | go var = do | ||
399 | let myid = error "TODO myid" :: NodeId | ||
400 | k = error "TODO k" :: Int | ||
401 | nobkts = error "TODO nobkts" :: Int | ||
402 | nfo <- atomically $ readTVar var | ||
403 | let tbl = maybe (R.nullTable myid nobkts) R.myBuckets nfo | ||
404 | return $ R.kclosest nodeId k node tbl | ||
405 | |||
406 | data GetPeers = GetPeers InfoHash (Maybe WantIP) | ||
407 | |||
408 | instance BEncode GetPeers where | ||
409 | toBEncode (GetPeers ih iptyp) | ||
410 | = toDict $ info_hash_key .=! ih | ||
411 | .: want_key .=? iptyp | ||
412 | .: endDict | ||
413 | fromBEncode = fromDict $ GetPeers <$>! info_hash_key <*>? want_key | ||
414 | |||
415 | |||
416 | type PeerList = Either [NodeInfo] [PeerAddr] | ||
417 | |||
418 | data GotPeers = GotPeers | ||
419 | { -- | If the queried node has no peers for the infohash, returned | ||
420 | -- the K nodes in the queried nodes routing table closest to the | ||
421 | -- infohash supplied in the query. | ||
422 | peers :: PeerList | ||
423 | |||
424 | -- | The token value is a required argument for a future | ||
425 | -- announce_peer query. | ||
426 | , grantedToken :: Token | ||
427 | } -- deriving (Show, Eq, Typeable) | ||
428 | |||
429 | nodeIsIPv6 :: NodeInfo -> Bool | ||
430 | nodeIsIPv6 (NodeInfo _ (IPv6 _) _) = True | ||
431 | nodeIsIPv6 _ = False | ||
432 | |||
433 | instance BEncode GotPeers where | ||
434 | toBEncode GotPeers {..} = toDict $ | ||
435 | case peers of | ||
436 | Left ns | ||
437 | | let (ns6,ns4) = partition nodeIsIPv6 ns | ||
438 | -> | ||
439 | nodes_key .=? (if null ns4 then Nothing | ||
440 | else Just $ S.runPut (mapM_ putNodeInfo4 ns4)) | ||
441 | .: nodes6_key .=? (if null ns6 then Nothing | ||
442 | else Just $ S.runPut (mapM_ putNodeInfo4 ns6)) | ||
443 | .: token_key .=! grantedToken | ||
444 | .: endDict | ||
445 | Right ps -> | ||
446 | token_key .=! grantedToken | ||
447 | .: peers_key .=! map S.encode ps -- TODO: Spec says we shouldn't mix ip4/ip6 here. | ||
448 | -- (We could filter in MethodHandler.) | ||
449 | .: endDict | ||
202 | 450 | ||
203 | defaultH :: ByteString -> NodeInfo -> BValue -> IO Error | 451 | fromBEncode = fromDict $ do |
204 | defaultH meth _ _ = return $ Error MethodUnknown ("Unknown method " <> meth) | 452 | mns4 <- optional (binary getNodeInfo4 nodes_key) -- "nodes" |
453 | mns6 <- optional (binary getNodeInfo6 nodes6_key) -- "nodes6" | ||
454 | let mns = ((++) <$> mns4 <*> mns6) | ||
455 | <|> mns4 | ||
456 | <|> mns6 | ||
457 | tok <- field (req token_key) -- "token" | ||
458 | mps <- optional (field (req peers_key) >>= decodePeers) -- "values" | ||
459 | case (Right <$> mps) <|> (Left <$> mns) of | ||
460 | Nothing -> fail "get_peers: neihter peers nor nodes key is valid" | ||
461 | Just xs -> pure $ GotPeers xs tok | ||
462 | where | ||
463 | decodePeers = either fail pure . mapM S.decode | ||
464 | |||
465 | getPeersH :: Routing -> SwarmsDatabase -> NodeInfo -> GetPeers -> IO GotPeers | ||
466 | getPeersH routing (SwarmsDatabase peers toks _) naddr (GetPeers ih iptyp) = do | ||
467 | ps <- do | ||
468 | tm <- getTimestamp | ||
469 | ps <- atomically $ do | ||
470 | (ps,store') <- Peers.freshPeers ih tm <$> readTVar peers | ||
471 | writeTVar peers store' | ||
472 | return ps | ||
473 | if null ps | ||
474 | then Left <$> error "TODO: getClosest ih" | ||
475 | else return (Right ps) | ||
476 | tok <- grantToken toks naddr | ||
477 | return $ GotPeers ps tok | ||
478 | |||
479 | -- | Announce that the peer, controlling the querying node, is | ||
480 | -- downloading a torrent on a port. | ||
481 | data Announce = Announce | ||
482 | { -- | If set, the 'port' field should be ignored and the source | ||
483 | -- port of the UDP packet should be used as the peer's port | ||
484 | -- instead. This is useful for peers behind a NAT that may not | ||
485 | -- know their external port, and supporting uTP, they accept | ||
486 | -- incoming connections on the same port as the DHT port. | ||
487 | impliedPort :: Bool | ||
488 | |||
489 | -- | infohash of the torrent; | ||
490 | , topic :: InfoHash | ||
491 | |||
492 | -- | some clients announce the friendly name of the torrent here. | ||
493 | , announcedName :: Maybe ByteString | ||
494 | |||
495 | -- | the port /this/ peer is listening; | ||
496 | , port :: PortNumber | ||
497 | |||
498 | -- TODO: optional boolean "seed" key | ||
499 | |||
500 | -- | received in response to a previous get_peers query. | ||
501 | , sessionToken :: Token | ||
502 | |||
503 | } deriving (Show, Eq, Typeable) | ||
504 | |||
505 | peer_ip_key = "ip" | ||
506 | peer_id_key = "peer id" | ||
507 | peer_port_key = "port" | ||
508 | msg_type_key = "msg_type" | ||
509 | piece_key = "piece" | ||
510 | total_size_key = "total_size" | ||
511 | node_id_key :: BKey | ||
512 | node_id_key = "id" | ||
513 | read_only_key :: BKey | ||
514 | read_only_key = "ro" | ||
515 | want_key :: BKey | ||
516 | want_key = "want" | ||
517 | target_key :: BKey | ||
518 | target_key = "target" | ||
519 | nodes_key :: BKey | ||
520 | nodes_key = "nodes" | ||
521 | nodes6_key :: BKey | ||
522 | nodes6_key = "nodes6" | ||
523 | info_hash_key :: BKey | ||
524 | info_hash_key = "info_hash" | ||
525 | peers_key :: BKey | ||
526 | peers_key = "values" | ||
527 | token_key :: BKey | ||
528 | token_key = "token" | ||
529 | name_key :: BKey | ||
530 | name_key = "name" | ||
531 | port_key :: BKey | ||
532 | port_key = "port" | ||
533 | implied_port_key :: BKey | ||
534 | implied_port_key = "implied_port" | ||
535 | |||
536 | instance BEncode Announce where | ||
537 | toBEncode Announce {..} = toDict $ | ||
538 | implied_port_key .=? flagField impliedPort | ||
539 | .: info_hash_key .=! topic | ||
540 | .: name_key .=? announcedName | ||
541 | .: port_key .=! port | ||
542 | .: token_key .=! sessionToken | ||
543 | .: endDict | ||
544 | where | ||
545 | flagField flag = if flag then Just (1 :: Int) else Nothing | ||
546 | |||
547 | fromBEncode = fromDict $ do | ||
548 | Announce <$> (boolField <$> optional (field (req implied_port_key))) | ||
549 | <*>! info_hash_key | ||
550 | <*>? name_key | ||
551 | <*>! port_key | ||
552 | <*>! token_key | ||
553 | where | ||
554 | boolField = maybe False (/= (0 :: Int)) | ||
555 | |||
556 | |||
557 | |||
558 | -- | The queried node must verify that the token was previously sent | ||
559 | -- to the same IP address as the querying node. Then the queried node | ||
560 | -- should store the IP address of the querying node and the supplied | ||
561 | -- port number under the infohash in its store of peer contact | ||
562 | -- information. | ||
563 | data Announced = Announced | ||
564 | deriving (Show, Eq, Typeable) | ||
565 | |||
566 | instance BEncode Announced where | ||
567 | toBEncode _ = toBEncode Ping | ||
568 | fromBEncode _ = pure Announced | ||
569 | |||
570 | announceH :: SwarmsDatabase -> NodeInfo -> Announce -> IO (Either Error Announced) | ||
571 | announceH (SwarmsDatabase peers toks _) naddr announcement = do | ||
572 | checkToken toks naddr (sessionToken announcement) | ||
573 | >>= bool (Left <$> return (Error ProtocolError "invalid parameter: token")) | ||
574 | (Right <$> go) | ||
575 | where | ||
576 | go = do | ||
577 | let annPort = if impliedPort announcement | ||
578 | then nodePort naddr | ||
579 | else port announcement | ||
580 | peerAddr = PeerAddr Nothing (nodeIP naddr) annPort | ||
581 | atomically | ||
582 | $ modifyTVar' peers | ||
583 | $ insertPeer (topic announcement) (announcedName announcement) peerAddr | ||
584 | return Announced | ||