diff options
author | Sam Truzjan <pxqr.sta@gmail.com> | 2014-02-08 07:31:23 +0400 |
---|---|---|
committer | Sam Truzjan <pxqr.sta@gmail.com> | 2014-02-08 07:31:23 +0400 |
commit | 240f025f6e631a7b3b14173472028ae5f225fc7b (patch) | |
tree | e6ae54cf9ee71e9526abb941a78bb8eb278f00a3 /src/Network/BitTorrent/Client.hs | |
parent | c197ad8fde170d414bdd869df20f28a48ac475e6 (diff) |
Redesign core of client
Diffstat (limited to 'src/Network/BitTorrent/Client.hs')
-rw-r--r-- | src/Network/BitTorrent/Client.hs | 137 |
1 files changed, 44 insertions, 93 deletions
diff --git a/src/Network/BitTorrent/Client.hs b/src/Network/BitTorrent/Client.hs index fd830239..d8c3ee91 100644 --- a/src/Network/BitTorrent/Client.hs +++ b/src/Network/BitTorrent/Client.hs | |||
@@ -1,4 +1,5 @@ | |||
1 | {-# LANGUAGE GeneralizedNewtypeDeriving #-} | 1 | {-# LANGUAGE GeneralizedNewtypeDeriving #-} |
2 | {-# LANGUAGE TemplateHaskell #-} | ||
2 | module Network.BitTorrent.Client | 3 | module Network.BitTorrent.Client |
3 | ( -- * Options | 4 | ( -- * Options |
4 | Options (..) | 5 | Options (..) |
@@ -15,142 +16,92 @@ module Network.BitTorrent.Client | |||
15 | , newClient | 16 | , newClient |
16 | , closeClient | 17 | , closeClient |
17 | , withClient | 18 | , withClient |
19 | , simpleClient | ||
18 | 20 | ||
19 | -- * BitTorrent monad | 21 | -- * BitTorrent monad |
22 | , MonadBitTorrent (..) | ||
20 | , BitTorrent | 23 | , BitTorrent |
21 | , runBitTorrent | 24 | , runBitTorrent |
22 | , MonadBitTorrent (..) | ||
23 | , getClient | 25 | , getClient |
24 | 26 | ||
25 | -- * Operations | 27 | -- * Handle |
26 | , addTorrent | 28 | , openTorrent |
29 | , openMagnet | ||
30 | , closeHandle | ||
27 | ) where | 31 | ) where |
28 | 32 | ||
29 | import Control.Exception | 33 | import Control.Exception |
30 | import Control.Concurrent.STM | 34 | import Control.Concurrent |
31 | import Control.Monad.Logger | ||
32 | import Control.Monad.Reader | ||
33 | import Control.Monad.Trans.Resource | 35 | import Control.Monad.Trans.Resource |
36 | |||
34 | import Data.Default | 37 | import Data.Default |
35 | import Data.Function | ||
36 | import Data.HashMap.Strict as HM | 38 | import Data.HashMap.Strict as HM |
37 | import Data.Maybe | 39 | import Data.Maybe |
38 | import Data.Ord | ||
39 | import Data.Text | 40 | import Data.Text |
40 | import Network | 41 | import Network |
41 | import System.Log.FastLogger | ||
42 | 42 | ||
43 | import Data.Torrent | 43 | import Network.BitTorrent.Client.Types |
44 | import Data.Torrent.InfoHash | 44 | import Network.BitTorrent.Client.Handle |
45 | import Network.BitTorrent.Client.Swarm | ||
46 | import Network.BitTorrent.Core | 45 | import Network.BitTorrent.Core |
47 | import Network.BitTorrent.DHT | 46 | import Network.BitTorrent.DHT |
47 | import Network.BitTorrent.Tracker as Tracker hiding (Options) | ||
48 | import Network.BitTorrent.Exchange.Message | 48 | import Network.BitTorrent.Exchange.Message |
49 | 49 | ||
50 | 50 | ||
51 | data Options = Options | 51 | data Options = Options |
52 | { fingerprint :: Fingerprint | 52 | { optFingerprint :: Fingerprint |
53 | , name :: Text | 53 | , optName :: Text |
54 | , port :: PortNumber | 54 | , optPort :: PortNumber |
55 | , extensions :: [Extension] | 55 | , optExtensions :: [Extension] |
56 | , nodeAddr :: NodeAddr IPv4 | 56 | , optNodeAddr :: NodeAddr IPv4 |
57 | , bootNode :: Maybe (NodeAddr IPv4) | 57 | , optBootNode :: Maybe (NodeAddr IPv4) |
58 | } | 58 | } |
59 | 59 | ||
60 | instance Default Options where | 60 | instance Default Options where |
61 | def = Options | 61 | def = Options |
62 | { fingerprint = def | 62 | { optFingerprint = def |
63 | , name = "hs-bittorrent" | 63 | , optName = "hs-bittorrent" |
64 | , port = 6882 | 64 | , optPort = 6882 |
65 | , extensions = [] | 65 | , optExtensions = [] |
66 | , nodeAddr = "0.0.0.0:6882" | 66 | , optNodeAddr = "0.0.0.0:6882" |
67 | , bootNode = Nothing | 67 | , optBootNode = Nothing |
68 | } | 68 | } |
69 | 69 | ||
70 | data Client = Client | ||
71 | { clientPeerId :: !PeerId | ||
72 | , clientListenerPort :: !PortNumber | ||
73 | , allowedExtensions :: !Caps | ||
74 | , clientNode :: !(Node IPv4) | ||
75 | , clientTorrents :: !(TVar (HashMap InfoHash Swarm)) | ||
76 | , clientLogger :: !LogFun | ||
77 | -- , trackerClient :: !(Manager) | ||
78 | } | ||
79 | |||
80 | instance Eq Client where | ||
81 | (==) = (==) `on` clientPeerId | ||
82 | |||
83 | instance Ord Client where | ||
84 | compare = comparing clientPeerId | ||
85 | |||
86 | newClient :: Options -> LogFun -> IO Client | 70 | newClient :: Options -> LogFun -> IO Client |
87 | newClient Options {..} logger = do | 71 | newClient Options {..} logger = do |
88 | pid <- genPeerId | 72 | pid <- genPeerId |
89 | ts <- newTVarIO HM.empty | 73 | ts <- newMVar HM.empty |
74 | let peerInfo = PeerInfo pid Nothing optPort | ||
75 | mgr <- Tracker.newManager def peerInfo | ||
90 | node <- runResourceT $ do | 76 | node <- runResourceT $ do |
91 | node <- startNode handlers def nodeAddr logger | 77 | node <- startNode handlers def optNodeAddr logger |
92 | runDHT node $ bootstrap (maybeToList bootNode) | 78 | runDHT node $ bootstrap (maybeToList optBootNode) |
93 | return node | 79 | return node |
94 | 80 | ||
95 | return Client | 81 | return Client |
96 | { clientPeerId = pid | 82 | { clientPeerId = pid |
97 | , clientListenerPort = port | 83 | , clientListenerPort = optPort |
98 | , allowedExtensions = toCaps extensions | 84 | , allowedExtensions = toCaps optExtensions |
99 | , clientTorrents = ts | 85 | , trackerManager = mgr |
100 | , clientNode = node | 86 | , clientNode = node |
87 | , clientTorrents = ts | ||
101 | , clientLogger = logger | 88 | , clientLogger = logger |
102 | } | 89 | } |
103 | 90 | ||
104 | closeClient :: Client -> IO () | 91 | closeClient :: Client -> IO () |
105 | closeClient Client {..} = do | 92 | closeClient Client {..} = do |
93 | Tracker.closeManager trackerManager | ||
106 | return () | 94 | return () |
107 | -- closeNode clientNode | 95 | -- closeNode clientNode |
108 | 96 | ||
109 | withClient :: Options -> LogFun -> (Client -> IO a) -> IO a | 97 | withClient :: Options -> LogFun -> (Client -> IO a) -> IO a |
110 | withClient opts log action = bracket (newClient opts log) closeClient action | 98 | withClient opts lf action = bracket (newClient opts lf) closeClient action |
111 | 99 | ||
112 | {----------------------------------------------------------------------- | 100 | -- | Run bittorrent client with default options and log to @stderr@. |
113 | -- BitTorrent monad | 101 | -- |
114 | -----------------------------------------------------------------------} | 102 | -- For testing purposes only. |
115 | 103 | -- | |
116 | class MonadBitTorrent m where | 104 | simpleClient :: BitTorrent () -> IO () |
117 | liftBT :: BitTorrent a -> m a | 105 | simpleClient m = withClient def logger (`runBitTorrent` m) |
118 | 106 | where | |
119 | newtype BitTorrent a = BitTorrent | 107 | logger _ _ _ _ = return () \ No newline at end of file |
120 | { unBitTorrent :: ReaderT Client (ResourceT IO) a | ||
121 | } deriving (Monad, MonadIO) | ||
122 | |||
123 | instance MonadBitTorrent BitTorrent where | ||
124 | liftBT = id | ||
125 | |||
126 | instance MonadDHT BitTorrent where | ||
127 | liftDHT action = BitTorrent $ do | ||
128 | node <- asks clientNode | ||
129 | liftIO $ runResourceT $ runDHT node action | ||
130 | |||
131 | instance MonadLogger BitTorrent where | ||
132 | monadLoggerLog loc src lvl msg = BitTorrent $ do | ||
133 | logger <- asks clientLogger | ||
134 | liftIO $ logger loc src lvl (toLogStr msg) | ||
135 | |||
136 | runBitTorrent :: Client -> BitTorrent a -> IO a | ||
137 | runBitTorrent client action = runResourceT $ | ||
138 | runReaderT (unBitTorrent action) client | ||
139 | {-# INLINE runBitTorrent #-} | ||
140 | |||
141 | getClient :: BitTorrent Client | ||
142 | getClient = BitTorrent ask | ||
143 | |||
144 | {----------------------------------------------------------------------- | ||
145 | -- Operations | ||
146 | -----------------------------------------------------------------------} | ||
147 | -- All operations should be non blocking! | ||
148 | |||
149 | addTorrent :: Torrent -> BitTorrent () | ||
150 | addTorrent t = do | ||
151 | Client {..} <- getClient | ||
152 | liftIO $ do | ||
153 | leecher <- newLeecher clientPeerId clientListenerPort t | ||
154 | let ih = idInfoHash (tInfoDict t) | ||
155 | atomically $ modifyTVar' clientTorrents (HM.insert ih leecher) | ||
156 | askPeers leecher >>= print \ No newline at end of file | ||