git-annex/Logs/Transfer.hs

178 lines
5.3 KiB
Haskell
Raw Normal View History

2012-07-01 19:04:29 +00:00
{- git-annex transfer information files
2012-07-01 18:29:00 +00:00
-
- Copyright 2012 Joey Hess <joey@kitenet.net>
-
- Licensed under the GNU GPL version 3 or higher.
-}
module Logs.Transfer where
import Common.Annex
import Annex.Perms
import Annex.Exception
import qualified Git
import Types.Remote
2012-07-02 12:35:15 +00:00
import qualified Fields
2012-07-01 18:29:00 +00:00
import Control.Concurrent
import System.Posix.Types
import Data.Time.Clock
{- Enough information to uniquely identify a transfer, used as the filename
- of the transfer information file. -}
data Transfer = Transfer
{ transferDirection :: Direction
, transferRemote :: UUID
, transferKey :: Key
}
deriving (Show, Eq, Ord)
2012-07-01 18:29:00 +00:00
2012-07-02 17:49:27 +00:00
{- Information about a Transfer, stored in the transfer information file.
-
- Note that the associatedFile may not correspond to a file in the local
- git repository. It's some file, possibly relative to some directory,
- of some repository, that was acted on to initiate the transfer.
-}
2012-07-01 18:29:00 +00:00
data TransferInfo = TransferInfo
{ startedTime :: UTCTime
, transferPid :: Maybe ProcessID
2012-07-01 18:29:00 +00:00
, transferThread :: Maybe ThreadId
, bytesComplete :: Maybe Integer
, associatedFile :: Maybe FilePath
}
deriving (Show, Eq, Ord)
2012-07-01 18:29:00 +00:00
data Direction = Upload | Download
deriving (Eq, Ord)
2012-07-01 18:29:00 +00:00
instance Show Direction where
show Upload = "upload"
show Download = "download"
readDirection :: String -> Maybe Direction
readDirection "upload" = Just Upload
readDirection "download" = Just Download
readDirection _ = Nothing
upload :: UUID -> Key -> AssociatedFile -> Annex a -> Annex a
upload u key file a = transfer (Transfer Upload u key) file a
2012-07-01 19:04:29 +00:00
download :: UUID -> Key -> AssociatedFile -> Annex a -> Annex a
download u key file a = transfer (Transfer Download u key) file a
2012-07-01 19:04:29 +00:00
fieldTransfer :: Direction -> Key -> Annex a -> Annex a
fieldTransfer direction key a = do
2012-07-02 12:35:15 +00:00
afile <- Fields.getField Fields.associatedFile
maybe a (\u -> transfer (Transfer direction (toUUID u) key) afile a)
2012-07-02 12:35:15 +00:00
=<< Fields.getField Fields.remoteUUID
2012-07-01 18:29:00 +00:00
{- Runs a transfer action. Creates and locks the transfer information file
- while the action is running. Will throw an error if the transfer is
- already in progress.
-}
transfer :: Transfer -> Maybe FilePath -> Annex a -> Annex a
2012-07-01 19:04:29 +00:00
transfer t file a = do
tfile <- fromRepo $ transferFile t
createAnnexDirectory $ takeDirectory tfile
2012-07-01 18:29:00 +00:00
mode <- annexFileMode
info <- liftIO $ TransferInfo
<$> getCurrentTime
<*> pure Nothing -- pid not stored in file, so omitted for speed
2012-07-01 18:29:00 +00:00
<*> pure Nothing -- threadid not stored in file, so omitted for speed
<*> pure Nothing -- not 0; transfer may be resuming
<*> pure file
2012-07-01 19:04:29 +00:00
bracketIO (prep tfile mode info) (cleanup tfile) a
2012-07-01 18:29:00 +00:00
where
2012-07-01 19:04:29 +00:00
prep tfile mode info = do
2012-07-01 18:29:00 +00:00
fd <- openFd tfile ReadWrite (Just mode)
defaultFileFlags { trunc = True }
locked <- catchMaybeIO $
setLock fd (WriteLock, AbsoluteSeek, 0, 0)
when (locked == Nothing) $
error $ "transfer already in progress"
2012-07-01 19:04:29 +00:00
h <- fdToHandle fd
hPutStr h $ writeTransferInfo info
hFlush h
return h
cleanup tfile h = do
2012-07-01 18:29:00 +00:00
removeFile tfile
hClose h
2012-07-01 18:29:00 +00:00
{- If a transfer is still running, returns its TransferInfo. -}
checkTransfer :: Transfer -> Annex (Maybe TransferInfo)
2012-07-01 19:04:29 +00:00
checkTransfer t = do
2012-07-01 18:29:00 +00:00
mode <- annexFileMode
2012-07-01 19:04:29 +00:00
tfile <- fromRepo $ transferFile t
2012-07-01 18:29:00 +00:00
mfd <- liftIO $ catchMaybeIO $
openFd tfile ReadOnly (Just mode) defaultFileFlags
case mfd of
Nothing -> return Nothing -- failed to open file; not running
Just fd -> do
locked <- liftIO $
getLock fd (WriteLock, AbsoluteSeek, 0, 0)
case locked of
Nothing -> do
liftIO $ closeFd fd
return Nothing
Just (pid, _) -> liftIO $ do
2012-07-01 19:04:29 +00:00
h <- fdToHandle fd
2012-07-01 18:29:00 +00:00
info <- readTransferInfo pid
2012-07-01 19:04:29 +00:00
<$> hGetContentsStrict h
hClose h
2012-07-01 18:29:00 +00:00
return info
{- Gets all currently running transfers. -}
getTransfers :: Annex [(Transfer, TransferInfo)]
getTransfers = do
transfers <- catMaybes . map parseTransferFile <$> findfiles
2012-07-01 18:29:00 +00:00
infos <- mapM checkTransfer transfers
return $ map (\(t, Just i) -> (t, i)) $
filter running $ zip transfers infos
where
findfiles = liftIO . dirContentsRecursive
=<< fromRepo gitAnnexTransferDir
running (_, i) = isJust i
{- The transfer information file to use for a given Transfer. -}
transferFile :: Transfer -> Git.Repo -> FilePath
transferFile (Transfer direction u key) r = gitAnnexTransferDir r
2012-07-01 19:04:29 +00:00
</> show direction
</> fromUUID u
2012-07-01 19:04:29 +00:00
</> keyFile key
2012-07-01 18:29:00 +00:00
{- Parses a transfer information filename to a Transfer. -}
parseTransferFile :: FilePath -> Maybe Transfer
parseTransferFile file =
2012-07-01 18:29:00 +00:00
case drop (length bits - 3) bits of
2012-07-01 19:04:29 +00:00
[direction, u, key] -> Transfer
2012-07-01 18:29:00 +00:00
<$> readDirection direction
<*> pure (toUUID u)
2012-07-01 18:29:00 +00:00
<*> fileKey key
_ -> Nothing
where
bits = splitDirectories file
writeTransferInfo :: TransferInfo -> String
2012-07-01 19:04:29 +00:00
writeTransferInfo info = unlines
2012-07-01 18:29:00 +00:00
-- transferPid is not included; instead obtained by looking at
-- the process that locks the file.
-- transferThread is not included; not relevant for other processes
[ show $ startedTime info
-- bytesComplete is not included; changes too fast
2012-07-01 19:04:29 +00:00
, fromMaybe "" $ associatedFile info -- comes last; arbitrary content
2012-07-01 18:29:00 +00:00
]
readTransferInfo :: ProcessID -> String -> Maybe TransferInfo
readTransferInfo pid s =
case bits of
[time] -> TransferInfo
<$> readish time
<*> pure (Just pid)
2012-07-01 18:29:00 +00:00
<*> pure Nothing
<*> pure Nothing
<*> pure (if null filename then Nothing else Just filename)
2012-07-01 18:29:00 +00:00
_ -> Nothing
where
2012-07-01 19:04:29 +00:00
(bits, filebits) = splitAt 1 $ lines s
filename = join "\n" filebits