summaryrefslogtreecommitdiff
path: root/P2P/Annex.hs
diff options
context:
space:
mode:
Diffstat (limited to 'P2P/Annex.hs')
-rw-r--r--P2P/Annex.hs128
1 files changed, 128 insertions, 0 deletions
diff --git a/P2P/Annex.hs b/P2P/Annex.hs
new file mode 100644
index 000000000..4105abe32
--- /dev/null
+++ b/P2P/Annex.hs
@@ -0,0 +1,128 @@
+{- P2P protocol, Annex implementation
+ -
+ - Copyright 2016 Joey Hess <id@joeyh.name>
+ -
+ - Licensed under the GNU GPL version 3 or higher.
+ -}
+
+{-# LANGUAGE RankNTypes, FlexibleContexts #-}
+
+module P2P.Annex
+ ( RunMode(..)
+ , P2PConnection(..)
+ , runFullProto
+ ) where
+
+import Annex.Common
+import Annex.Content
+import Annex.Transfer
+import P2P.Protocol
+import P2P.IO
+import Logs.Location
+import Types.NumCopies
+
+import Control.Monad.Free
+import qualified Data.ByteString.Lazy as L
+
+-- When we're serving a peer, we know their uuid, and can use it to update
+-- transfer logs.
+data RunMode
+ = Serving UUID
+ | Client
+
+-- Full interpreter for Proto, that can receive and send objects.
+runFullProto :: RunMode -> P2PConnection -> Proto a -> Annex (Maybe a)
+runFullProto runmode conn = go
+ where
+ go :: RunProto Annex
+ go (Pure v) = pure (Just v)
+ go (Free (Net n)) = runNet conn go n
+ go (Free (Local l)) = runLocal runmode go l
+
+runLocal :: RunMode -> RunProto Annex -> LocalF (Proto a) -> Annex (Maybe a)
+runLocal runmode runner a = case a of
+ TmpContentSize k next -> do
+ tmp <- fromRepo $ gitAnnexTmpObjectLocation k
+ size <- liftIO $ catchDefaultIO 0 $ getFileSize tmp
+ runner (next (Len size))
+ FileSize f next -> do
+ size <- liftIO $ catchDefaultIO 0 $ getFileSize f
+ runner (next (Len size))
+ ContentSize k next -> do
+ let getsize = liftIO . catchMaybeIO . getFileSize
+ size <- inAnnex' isJust Nothing getsize k
+ runner (next (Len <$> size))
+ -- TODO transfer log not updated
+ ReadContent k af (Offset o) next -> do
+ v <- tryNonAsync $ prepSendAnnex k
+ case v of
+ -- The check can detect a problem after the
+ -- content is sent, but we don't use it.
+ -- Instead, the receiving peer must AlwaysVerify
+ -- the content it receives.
+ Right (Just (f, _check)) -> do
+ v' <- tryNonAsync $ -- transfer upload k af $
+ liftIO $ do
+ h <- openBinaryFile f ReadMode
+ when (o /= 0) $
+ hSeek h AbsoluteSeek o
+ L.hGetContents h
+ case v' of
+ Left _ -> return Nothing
+ Right b -> runner (next b)
+ _ -> return Nothing
+ StoreContent k af o l b next -> do
+ ok <- flip catchNonAsync (const $ return False) $
+ transfer download k af $
+ getViaTmp AlwaysVerify k $ \tmp ->
+ unVerified $ storefile tmp o l b
+ runner (next ok)
+ StoreContentTo dest o l b next -> do
+ ok <- flip catchNonAsync (const $ return False) $
+ storefile dest o l b
+ runner (next ok)
+ SetPresent k u next -> do
+ v <- tryNonAsync $ logChange k u InfoPresent
+ case v of
+ Left _ -> return Nothing
+ Right () -> runner next
+ CheckContentPresent k next -> do
+ v <- tryNonAsync $ inAnnex k
+ case v of
+ Left _ -> return Nothing
+ Right result -> runner (next result)
+ RemoveContent k next -> do
+ v <- tryNonAsync $ lockContentForRemoval k $ \contentlock -> do
+ removeAnnex contentlock
+ logStatus k InfoMissing
+ return True
+ case v of
+ Left _ -> return Nothing
+ Right result -> runner (next result)
+ TryLockContent k protoaction next -> do
+ v <- tryNonAsync $ lockContentShared k $ \verifiedcopy ->
+ case verifiedcopy of
+ LockedCopy _ -> runner (protoaction True)
+ _ -> runner (protoaction False)
+ -- If locking fails, lockContentShared throws an exception.
+ -- Let the peer know it failed.
+ case v of
+ Left _ -> runner $ do
+ protoaction False
+ next
+ Right _ -> runner next
+ where
+ transfer mk k af ta = case runmode of
+ -- Update transfer logs when serving.
+ Serving theiruuid ->
+ mk theiruuid k af noRetry (const ta) noNotification
+ -- Transfer logs are updated higher in the stack when
+ -- a client.
+ Client -> ta
+ storefile dest (Offset o) (Len l) b = liftIO $ do
+ withBinaryFile dest WriteMode $ \h -> do
+ when (o /= 0) $
+ hSeek h AbsoluteSeek o
+ L.hPut h b
+ sz <- getFileSize dest
+ return (toInteger sz == l)