2017-08-29 18:58:38 +00:00
|
|
|
{- git-annex command
|
|
|
|
-
|
2019-03-01 20:08:18 +00:00
|
|
|
- Copyright 2017-2019 Joey Hess <id@joeyh.name>
|
2017-08-29 18:58:38 +00:00
|
|
|
-
|
2019-03-13 19:48:14 +00:00
|
|
|
- Licensed under the GNU AGPL version 3 or higher.
|
2017-08-29 18:58:38 +00:00
|
|
|
-}
|
|
|
|
|
2017-09-19 18:20:47 +00:00
|
|
|
{-# LANGUAGE TupleSections, BangPatterns #-}
|
2019-12-04 17:15:34 +00:00
|
|
|
{-# LANGUAGE OverloadedStrings #-}
|
2017-09-07 18:32:47 +00:00
|
|
|
|
2017-08-29 18:58:38 +00:00
|
|
|
module Command.Export where
|
|
|
|
|
|
|
|
import Command
|
2017-09-12 18:19:26 +00:00
|
|
|
import qualified Annex
|
2017-08-29 18:58:38 +00:00
|
|
|
import qualified Git
|
|
|
|
import qualified Git.DiffTree
|
2017-08-31 17:29:54 +00:00
|
|
|
import qualified Git.LsTree
|
2019-05-20 15:54:55 +00:00
|
|
|
import qualified Git.Tree
|
2017-08-31 19:41:48 +00:00
|
|
|
import qualified Git.Ref
|
2017-08-31 17:29:54 +00:00
|
|
|
import Git.Types
|
2017-08-29 18:58:38 +00:00
|
|
|
import Git.FilePath
|
2017-08-31 19:41:48 +00:00
|
|
|
import Git.Sha
|
2017-08-29 18:58:38 +00:00
|
|
|
import Types.Remote
|
2017-09-15 20:34:45 +00:00
|
|
|
import Types.Export
|
2017-09-18 17:57:25 +00:00
|
|
|
import Annex.Export
|
2017-08-29 18:58:38 +00:00
|
|
|
import Annex.Content
|
2017-09-20 16:56:17 +00:00
|
|
|
import Annex.Transfer
|
2017-08-29 18:58:38 +00:00
|
|
|
import Annex.CatFile
|
2019-05-20 15:54:55 +00:00
|
|
|
import Annex.FileMatcher
|
|
|
|
import Types.FileMatcher
|
2019-03-01 20:08:18 +00:00
|
|
|
import Annex.RemoteTrackingBranch
|
2017-08-31 16:37:25 +00:00
|
|
|
import Logs.Location
|
2017-08-31 19:41:48 +00:00
|
|
|
import Logs.Export
|
2019-05-20 15:54:55 +00:00
|
|
|
import Logs.PreferredContent
|
2017-09-04 17:52:22 +00:00
|
|
|
import Database.Export
|
2017-09-19 17:05:43 +00:00
|
|
|
import Config
|
2017-08-29 18:58:38 +00:00
|
|
|
import Utility.Tmp
|
2017-09-20 16:56:17 +00:00
|
|
|
import Utility.Metered
|
2019-05-20 15:54:55 +00:00
|
|
|
import Utility.Matcher
|
2017-08-29 18:58:38 +00:00
|
|
|
|
|
|
|
import qualified Data.ByteString.Lazy as L
|
2017-09-07 18:32:47 +00:00
|
|
|
import qualified Data.Map as M
|
2017-09-19 18:20:47 +00:00
|
|
|
import Control.Concurrent
|
2017-08-29 18:58:38 +00:00
|
|
|
|
|
|
|
cmd :: Command
|
|
|
|
cmd = command "export" SectionCommon
|
|
|
|
"export content to a remote"
|
|
|
|
paramTreeish (seek <$$> optParser)
|
|
|
|
|
|
|
|
data ExportOptions = ExportOptions
|
|
|
|
{ exportTreeish :: Git.Ref
|
2019-03-01 20:08:18 +00:00
|
|
|
-- ^ can be a tree, a branch, a commit, or a tag
|
2017-08-29 18:58:38 +00:00
|
|
|
, exportRemote :: DeferredParse Remote
|
2017-09-19 17:05:43 +00:00
|
|
|
, exportTracking :: Bool
|
2017-08-29 18:58:38 +00:00
|
|
|
}
|
|
|
|
|
|
|
|
optParser :: CmdParamsDesc -> Parser ExportOptions
|
|
|
|
optParser _ = ExportOptions
|
|
|
|
<$> (Git.Ref <$> parsetreeish)
|
|
|
|
<*> (parseRemoteOption <$> parseToOption)
|
2017-09-19 17:05:43 +00:00
|
|
|
<*> parsetracking
|
2017-08-29 18:58:38 +00:00
|
|
|
where
|
|
|
|
parsetreeish = argument str
|
|
|
|
( metavar paramTreeish
|
|
|
|
)
|
2017-09-19 17:05:43 +00:00
|
|
|
parsetracking = switch
|
|
|
|
( long "tracking"
|
2019-02-23 19:48:25 +00:00
|
|
|
<> help ("track changes to the " ++ paramTreeish ++ " (deprecated)")
|
2017-09-19 17:05:43 +00:00
|
|
|
)
|
2017-08-29 18:58:38 +00:00
|
|
|
|
2017-09-06 19:33:40 +00:00
|
|
|
-- To handle renames which swap files, the exported file is first renamed
|
|
|
|
-- to a stable temporary name based on the key.
|
|
|
|
exportTempName :: ExportKey -> ExportLocation
|
2019-12-04 17:15:34 +00:00
|
|
|
exportTempName ek = mkExportLocation $ toRawFilePath $
|
2019-01-14 17:03:35 +00:00
|
|
|
".git-annex-tmp-content-" ++ serializeKey (asKey (ek))
|
2017-09-06 19:33:40 +00:00
|
|
|
|
2017-08-29 18:58:38 +00:00
|
|
|
seek :: ExportOptions -> CommandSeek
|
|
|
|
seek o = do
|
|
|
|
r <- getParsed (exportRemote o)
|
2017-09-07 17:45:31 +00:00
|
|
|
unlessM (isExportSupported r) $
|
2017-09-04 17:55:49 +00:00
|
|
|
giveup "That remote does not support exports."
|
2019-03-01 20:08:18 +00:00
|
|
|
|
|
|
|
-- handle deprecated option
|
2017-09-19 18:20:47 +00:00
|
|
|
when (exportTracking o) $
|
2019-02-23 19:48:25 +00:00
|
|
|
setConfig (remoteConfig r "annex-tracking-branch")
|
2017-09-19 18:20:47 +00:00
|
|
|
(fromRef $ exportTreeish o)
|
2019-03-01 20:08:18 +00:00
|
|
|
|
2019-05-20 15:54:55 +00:00
|
|
|
tree <- filterPreferredContent r =<<
|
|
|
|
fromMaybe (giveup "unknown tree") <$>
|
2019-03-11 17:18:20 +00:00
|
|
|
inRepo (Git.Ref.tree (exportTreeish o))
|
|
|
|
|
|
|
|
mtbcommitsha <- getExportCommit r (exportTreeish o)
|
2019-03-01 20:08:18 +00:00
|
|
|
|
2019-03-07 19:59:44 +00:00
|
|
|
db <- openDb (uuid r)
|
|
|
|
writeLockDbWhile db $ do
|
2019-03-01 20:08:18 +00:00
|
|
|
changeExport r db tree
|
|
|
|
unlessM (Annex.getState Annex.fast) $ do
|
|
|
|
void $ fillExport r db tree mtbcommitsha
|
2019-03-07 19:59:44 +00:00
|
|
|
closeDb db
|
2017-09-19 18:20:47 +00:00
|
|
|
|
2019-03-01 20:08:18 +00:00
|
|
|
-- | When the treeish is a branch like master or refs/heads/master
|
|
|
|
-- (but not refs/remotes/...), find the commit it points to
|
|
|
|
-- and the corresponding remote tracking branch.
|
2019-03-11 17:18:20 +00:00
|
|
|
--
|
|
|
|
-- The treeish may also be a subdir within a branch, like master:subdir,
|
|
|
|
-- that results in this returning the same thing it does for the master
|
|
|
|
-- branch.
|
2019-03-01 20:08:18 +00:00
|
|
|
getExportCommit :: Remote -> Git.Ref -> Annex (Maybe (RemoteTrackingBranch, Sha))
|
|
|
|
getExportCommit r treeish
|
|
|
|
| '/' `notElem` fromRef baseref = do
|
|
|
|
let tb = mkRemoteTrackingBranch r baseref
|
|
|
|
commitsha <- inRepo $ Git.Ref.sha $ Git.Ref.underBase refsheads baseref
|
|
|
|
return (fmap (tb, ) commitsha)
|
|
|
|
| otherwise = return Nothing
|
|
|
|
where
|
2019-03-11 17:18:20 +00:00
|
|
|
baseref = Ref $ takeWhile (/= ':') $ fromRef $
|
|
|
|
Git.Ref.removeBase refsheads treeish
|
2019-03-01 20:08:18 +00:00
|
|
|
refsheads = "refs/heads"
|
|
|
|
|
2017-09-19 18:20:47 +00:00
|
|
|
-- | Changes what's exported to the remote. Does not upload any new
|
|
|
|
-- files, but does delete and rename files already exported to the remote.
|
2019-05-20 15:54:55 +00:00
|
|
|
changeExport :: Remote -> ExportHandle -> PreferredFiltered Git.Ref -> CommandSeek
|
|
|
|
changeExport r db (PreferredFiltered new) = do
|
2017-08-31 19:41:48 +00:00
|
|
|
old <- getExport (uuid r)
|
2017-09-12 20:59:04 +00:00
|
|
|
recordExportBeginning (uuid r) new
|
2017-09-19 17:05:43 +00:00
|
|
|
|
2017-09-06 19:33:40 +00:00
|
|
|
-- Clean up after incomplete export of a tree, in which
|
|
|
|
-- the next block of code below may have renamed some files to
|
|
|
|
-- temp files. Diff from the incomplete tree to the new tree,
|
|
|
|
-- and delete any temp files that the new tree can't use.
|
2018-10-01 18:12:06 +00:00
|
|
|
let recover diff = commandAction $
|
2019-01-30 18:55:28 +00:00
|
|
|
startRecoverIncomplete r db
|
2018-10-01 18:12:06 +00:00
|
|
|
(Git.DiffTree.srcsha diff)
|
|
|
|
(Git.DiffTree.file diff)
|
2019-01-30 16:36:30 +00:00
|
|
|
forM_ (incompleteExportedTreeishes old) $ \incomplete ->
|
2018-10-01 18:12:06 +00:00
|
|
|
mapdiff recover incomplete new
|
2017-09-06 19:33:40 +00:00
|
|
|
|
|
|
|
-- Diff the old and new trees, and delete or rename to new name all
|
|
|
|
-- changed files in the export. After this, every file that remains
|
|
|
|
-- in the export will have the content from the new treeish.
|
2017-08-31 19:41:48 +00:00
|
|
|
--
|
2017-09-18 18:24:42 +00:00
|
|
|
-- When there was an export conflict, this resolves it.
|
|
|
|
--
|
|
|
|
-- The ExportTree is also updated here to reflect the new tree.
|
2019-01-30 16:36:30 +00:00
|
|
|
case exportedTreeishes old of
|
2017-09-18 18:24:42 +00:00
|
|
|
[] -> updateExportTree db emptyTree new
|
2017-09-06 19:33:40 +00:00
|
|
|
[oldtreesha] -> do
|
2017-09-18 18:24:42 +00:00
|
|
|
diffmap <- mkDiffMap oldtreesha new db
|
2018-10-01 18:12:06 +00:00
|
|
|
let seekdiffmap a = commandActions $
|
|
|
|
map a (M.toList diffmap)
|
2017-09-07 18:32:47 +00:00
|
|
|
-- Rename old files to temp, or delete.
|
2017-09-18 18:24:42 +00:00
|
|
|
seekdiffmap $ \(ek, (moldf, mnewf)) -> do
|
2017-09-07 18:32:47 +00:00
|
|
|
case (moldf, mnewf) of
|
|
|
|
(Just oldf, Just _newf) ->
|
2019-01-30 18:55:28 +00:00
|
|
|
startMoveToTempName r db oldf ek
|
2018-10-01 18:12:06 +00:00
|
|
|
(Just oldf, Nothing) ->
|
2019-01-30 18:55:28 +00:00
|
|
|
startUnexport' r db oldf ek
|
2017-09-07 18:32:47 +00:00
|
|
|
_ -> stop
|
2017-09-06 19:33:40 +00:00
|
|
|
-- Rename from temp to new files.
|
2017-09-07 18:32:47 +00:00
|
|
|
seekdiffmap $ \(ek, (moldf, mnewf)) ->
|
|
|
|
case (moldf, mnewf) of
|
|
|
|
(Just _oldf, Just newf) ->
|
2019-01-30 18:55:28 +00:00
|
|
|
startMoveFromTempName r db ek newf
|
2017-09-07 18:32:47 +00:00
|
|
|
_ -> stop
|
2017-09-06 19:33:40 +00:00
|
|
|
ts -> do
|
2019-04-09 17:03:59 +00:00
|
|
|
warning "Resolving export conflict.."
|
2017-09-06 19:33:40 +00:00
|
|
|
forM_ ts $ \oldtreesha -> do
|
|
|
|
-- Unexport both the srcsha and the dstsha,
|
|
|
|
-- because the wrong content may have
|
|
|
|
-- been renamed to the dstsha due to the
|
|
|
|
-- export conflict.
|
|
|
|
let unexportboth d =
|
|
|
|
[ Git.DiffTree.srcsha d
|
|
|
|
, Git.DiffTree.dstsha d
|
|
|
|
]
|
|
|
|
-- Don't rename to temp, because the
|
2017-09-07 18:32:47 +00:00
|
|
|
-- content is unknown; delete instead.
|
2017-09-06 19:33:40 +00:00
|
|
|
mapdiff
|
2019-01-30 18:55:28 +00:00
|
|
|
(\diff -> commandAction $ startUnexport r db (Git.DiffTree.file diff) (unexportboth diff))
|
2017-09-06 19:33:40 +00:00
|
|
|
oldtreesha new
|
2017-09-18 18:24:42 +00:00
|
|
|
updateExportTree db emptyTree new
|
2017-09-18 22:40:16 +00:00
|
|
|
liftIO $ recordExportTreeCurrent db new
|
2017-08-31 19:41:48 +00:00
|
|
|
|
|
|
|
-- Waiting until now to record the export guarantees that,
|
|
|
|
-- if this export is interrupted, there are no files left over
|
|
|
|
-- from a previous export, that are not part of this export.
|
2017-09-12 18:19:26 +00:00
|
|
|
c <- Annex.getState Annex.errcounter
|
2017-09-18 17:57:25 +00:00
|
|
|
when (c == 0) $ do
|
2017-09-12 18:19:26 +00:00
|
|
|
recordExport (uuid r) $ ExportChange
|
2019-01-30 16:36:30 +00:00
|
|
|
{ oldTreeish = exportedTreeishes old
|
2017-09-12 18:19:26 +00:00
|
|
|
, newTreeish = new
|
|
|
|
}
|
2017-09-06 19:33:40 +00:00
|
|
|
where
|
|
|
|
mapdiff a oldtreesha newtreesha = do
|
|
|
|
(diff, cleanup) <- inRepo $
|
|
|
|
Git.DiffTree.diffTreeRecursive oldtreesha newtreesha
|
|
|
|
seekActions $ pure $ map a diff
|
|
|
|
void $ liftIO cleanup
|
2017-09-04 18:00:54 +00:00
|
|
|
|
2017-09-07 18:32:47 +00:00
|
|
|
-- Map of old and new filenames for each changed ExportKey in a diff.
|
|
|
|
type DiffMap = M.Map ExportKey (Maybe TopFilePath, Maybe TopFilePath)
|
|
|
|
|
2017-09-18 18:24:42 +00:00
|
|
|
mkDiffMap :: Git.Ref -> Git.Ref -> ExportHandle -> Annex DiffMap
|
|
|
|
mkDiffMap old new db = do
|
2017-09-07 18:32:47 +00:00
|
|
|
(diff, cleanup) <- inRepo $ Git.DiffTree.diffTreeRecursive old new
|
|
|
|
diffmap <- M.fromListWith combinedm . concat <$> forM diff mkdm
|
|
|
|
void $ liftIO cleanup
|
|
|
|
return diffmap
|
|
|
|
where
|
|
|
|
combinedm (srca, dsta) (srcb, dstb) = (srca <|> srcb, dsta <|> dstb)
|
|
|
|
mkdm i = do
|
2017-09-18 17:57:25 +00:00
|
|
|
srcek <- getek (Git.DiffTree.srcsha i)
|
|
|
|
dstek <- getek (Git.DiffTree.dstsha i)
|
2017-09-18 18:24:42 +00:00
|
|
|
updateExportTree' db srcek dstek i
|
2017-09-07 18:32:47 +00:00
|
|
|
return $ catMaybes
|
|
|
|
[ (, (Just (Git.DiffTree.file i), Nothing)) <$> srcek
|
|
|
|
, (, (Nothing, Just (Git.DiffTree.file i))) <$> dstek
|
|
|
|
]
|
2017-09-18 17:57:25 +00:00
|
|
|
getek sha
|
2017-09-07 18:32:47 +00:00
|
|
|
| sha == nullSha = return Nothing
|
|
|
|
| otherwise = Just <$> exportKey sha
|
|
|
|
|
2019-03-01 20:08:18 +00:00
|
|
|
newtype FileUploaded = FileUploaded { fromFileUploaded :: Bool }
|
|
|
|
|
|
|
|
newtype AllFilled = AllFilled { fromAllFilled :: Bool }
|
|
|
|
|
|
|
|
-- | Upload all exported files that are not yet in the remote.
|
|
|
|
--
|
|
|
|
-- Returns True when some files were uploaded (perhaps not all of them).
|
|
|
|
--
|
|
|
|
-- Once all exported files have reached the remote, updates the
|
|
|
|
-- remote tracking branch.
|
2019-05-20 15:54:55 +00:00
|
|
|
fillExport :: Remote -> ExportHandle -> PreferredFiltered Git.Ref -> Maybe (RemoteTrackingBranch, Sha) -> Annex Bool
|
|
|
|
fillExport r db (PreferredFiltered newtree) mtbcommitsha = do
|
2019-03-01 20:08:18 +00:00
|
|
|
(l, cleanup) <- inRepo $ Git.LsTree.lsTree Git.LsTree.LsTreeRecursive newtree
|
|
|
|
cvar <- liftIO $ newMVar (FileUploaded False)
|
|
|
|
allfilledvar <- liftIO $ newMVar (AllFilled True)
|
|
|
|
commandActions $ map (startExport r db cvar allfilledvar) l
|
2017-09-19 18:20:47 +00:00
|
|
|
void $ liftIO $ cleanup
|
|
|
|
|
2019-03-01 20:08:18 +00:00
|
|
|
case mtbcommitsha of
|
|
|
|
Nothing -> noop
|
|
|
|
Just (tb, commitsha) ->
|
|
|
|
whenM (liftIO $ fromAllFilled <$> takeMVar allfilledvar) $
|
2019-05-06 17:56:39 +00:00
|
|
|
makeRemoteTrackingBranchMergeCommit tb commitsha
|
2019-05-01 17:13:00 +00:00
|
|
|
>>= setRemoteTrackingBranch tb
|
2019-03-01 20:08:18 +00:00
|
|
|
|
|
|
|
liftIO $ fromFileUploaded <$> takeMVar cvar
|
|
|
|
|
|
|
|
startExport :: Remote -> ExportHandle -> MVar FileUploaded -> MVar AllFilled -> Git.LsTree.TreeItem -> CommandStart
|
|
|
|
startExport r db cvar allfilledvar ti = do
|
2017-08-31 17:29:54 +00:00
|
|
|
ek <- exportKey (Git.LsTree.sha ti)
|
make CommandStart return a StartMessage
The goal is to be able to run CommandStart in the main thread when -J is
used, rather than unncessarily passing it off to a worker thread, which
incurs overhead that is signficant when the CommandStart is going to
quickly decide to stop.
To do that, the message it displays needs to be displayed in the worker
thread, after the CommandStart has run.
Also, the change will mean that CommandStart will no longer necessarily
run with the same Annex state as CommandPerform. While its docs already
said it should avoid modifying Annex state, I audited all the
CommandStart code as part of the conversion. (Note that CommandSeek
already sometimes runs with a different Annex state, and that has not been
a source of any problems, so I am not too worried that this change will
lead to breakage going forward.)
The only modification of Annex state I found was it calling
allowMessages in some Commands that default to noMessages. Dealt with
that by adding a startCustomOutput and a startingUsualMessages.
This lets a command start with noMessages and then select the output it
wants for each CommandStart.
One bit of breakage: onlyActionOn has been removed from commands that used it.
The plan is that, since a StartMessage contains an ActionItem,
when a Key can be extracted from that, the parallel job runner can
run onlyActionOn' automatically. Then commands won't need to worry about
this detail. Future work.
Otherwise, this was a fairly straightforward process of making each
CommandStart compile again. Hopefully other behavior changes were mostly
avoided.
In a few cases, a command had a CommandStart that called a CommandPerform
that then called showStart multiple times. I have collapsed those
down to a single start action. The main command to perhaps suffer from it
is Command.Direct, which used to show a start for each file, and no
longer does.
Another minor behavior change is that some commands used showStart
before, but had an associated file and a Key available, so were changed
to ShowStart with an ActionItemAssociatedFile. That will not change the
normal output or behavior, but --json output will now include the key.
This should not break it for anyone using a real json parser.
2019-06-06 19:42:30 +00:00
|
|
|
stopUnless (notrecordedpresent ek) $
|
|
|
|
starting ("export " ++ name r) (ActionItemOther (Just f)) $
|
|
|
|
ifM (either (const False) id <$> tryNonAsync (checkPresentExport (exportActions r) (asKey ek) loc))
|
|
|
|
( next $ cleanupExport r db ek loc False
|
|
|
|
, do
|
|
|
|
liftIO $ modifyMVar_ cvar (pure . const (FileUploaded True))
|
|
|
|
performExport r db ek af (Git.LsTree.sha ti) loc allfilledvar
|
|
|
|
)
|
2017-08-31 17:29:54 +00:00
|
|
|
where
|
2019-12-04 17:15:34 +00:00
|
|
|
loc = mkExportLocation (toRawFilePath f)
|
2017-09-20 16:56:17 +00:00
|
|
|
f = getTopFilePath (Git.LsTree.file ti)
|
2019-12-04 17:15:34 +00:00
|
|
|
af = AssociatedFile (Just (toRawFilePath f))
|
2018-11-14 15:47:40 +00:00
|
|
|
notrecordedpresent ek = (||)
|
2018-06-14 16:22:12 +00:00
|
|
|
<$> liftIO (notElem loc <$> getExportedLocation db (asKey ek))
|
|
|
|
-- If content was removed from the remote, the export db
|
|
|
|
-- will still list it, so also check location tracking.
|
|
|
|
<*> (notElem (uuid r) <$> loggedLocations (asKey ek))
|
2017-08-31 17:29:54 +00:00
|
|
|
|
2019-03-01 20:08:18 +00:00
|
|
|
performExport :: Remote -> ExportHandle -> ExportKey -> AssociatedFile -> Sha -> ExportLocation -> MVar AllFilled -> CommandPerform
|
|
|
|
performExport r db ek af contentsha loc allfilledvar = do
|
2019-01-30 18:55:28 +00:00
|
|
|
let storer = storeExport (exportActions r)
|
2019-03-05 20:49:42 +00:00
|
|
|
sent <- tryNonAsync $ case ek of
|
2017-09-01 17:02:07 +00:00
|
|
|
AnnexKey k -> ifM (inAnnex k)
|
2017-11-14 20:27:39 +00:00
|
|
|
( notifyTransfer Upload af $
|
2018-03-29 17:04:07 +00:00
|
|
|
-- Using noRetry here because interrupted
|
|
|
|
-- exports cannot be resumed.
|
2017-11-14 20:27:39 +00:00
|
|
|
upload (uuid r) k af noRetry $ \pm -> do
|
|
|
|
let rollback = void $
|
2019-01-30 18:55:28 +00:00
|
|
|
performUnexport r db [ek] loc
|
2017-11-14 20:27:39 +00:00
|
|
|
sendAnnex k rollback $ \f ->
|
2019-01-31 17:34:12 +00:00
|
|
|
storer f k loc pm
|
2017-09-01 17:02:07 +00:00
|
|
|
, do
|
|
|
|
showNote "not available"
|
|
|
|
return False
|
|
|
|
)
|
|
|
|
-- Sending a non-annexed file.
|
2019-01-31 17:34:12 +00:00
|
|
|
GitKey sha1k ->
|
2017-09-01 17:02:07 +00:00
|
|
|
withTmpFile "export" $ \tmp h -> do
|
|
|
|
b <- catObject contentsha
|
|
|
|
liftIO $ L.hPut h b
|
|
|
|
liftIO $ hClose h
|
2019-01-31 17:34:12 +00:00
|
|
|
storer tmp sha1k loc nullMeterUpdate
|
2019-03-05 20:49:42 +00:00
|
|
|
let failedsend = liftIO $ modifyMVar_ allfilledvar (pure . const (AllFilled False))
|
|
|
|
case sent of
|
|
|
|
Right True -> next $ cleanupExport r db ek loc True
|
|
|
|
Right False -> do
|
|
|
|
failedsend
|
2019-03-01 20:08:18 +00:00
|
|
|
stop
|
2019-03-05 20:49:42 +00:00
|
|
|
Left err -> do
|
|
|
|
failedsend
|
|
|
|
throwM err
|
2017-08-31 17:29:54 +00:00
|
|
|
|
2018-11-14 15:47:40 +00:00
|
|
|
cleanupExport :: Remote -> ExportHandle -> ExportKey -> ExportLocation -> Bool -> CommandCleanup
|
|
|
|
cleanupExport r db ek loc sent = do
|
2017-09-18 17:57:25 +00:00
|
|
|
liftIO $ addExportedLocation db (asKey ek) loc
|
2018-11-14 15:47:40 +00:00
|
|
|
when sent $
|
|
|
|
logChange (asKey ek) (uuid r) InfoPresent
|
2017-08-31 17:29:54 +00:00
|
|
|
return True
|
2017-08-29 18:58:38 +00:00
|
|
|
|
2019-01-30 18:55:28 +00:00
|
|
|
startUnexport :: Remote -> ExportHandle -> TopFilePath -> [Git.Sha] -> CommandStart
|
|
|
|
startUnexport r db f shas = do
|
2017-09-06 19:33:40 +00:00
|
|
|
eks <- forM (filter (/= nullSha) shas) exportKey
|
|
|
|
if null eks
|
|
|
|
then stop
|
make CommandStart return a StartMessage
The goal is to be able to run CommandStart in the main thread when -J is
used, rather than unncessarily passing it off to a worker thread, which
incurs overhead that is signficant when the CommandStart is going to
quickly decide to stop.
To do that, the message it displays needs to be displayed in the worker
thread, after the CommandStart has run.
Also, the change will mean that CommandStart will no longer necessarily
run with the same Annex state as CommandPerform. While its docs already
said it should avoid modifying Annex state, I audited all the
CommandStart code as part of the conversion. (Note that CommandSeek
already sometimes runs with a different Annex state, and that has not been
a source of any problems, so I am not too worried that this change will
lead to breakage going forward.)
The only modification of Annex state I found was it calling
allowMessages in some Commands that default to noMessages. Dealt with
that by adding a startCustomOutput and a startingUsualMessages.
This lets a command start with noMessages and then select the output it
wants for each CommandStart.
One bit of breakage: onlyActionOn has been removed from commands that used it.
The plan is that, since a StartMessage contains an ActionItem,
when a Key can be extracted from that, the parallel job runner can
run onlyActionOn' automatically. Then commands won't need to worry about
this detail. Future work.
Otherwise, this was a fairly straightforward process of making each
CommandStart compile again. Hopefully other behavior changes were mostly
avoided.
In a few cases, a command had a CommandStart that called a CommandPerform
that then called showStart multiple times. I have collapsed those
down to a single start action. The main command to perhaps suffer from it
is Command.Direct, which used to show a start for each file, and no
longer does.
Another minor behavior change is that some commands used showStart
before, but had an associated file and a Key available, so were changed
to ShowStart with an ActionItemAssociatedFile. That will not change the
normal output or behavior, but --json output will now include the key.
This should not break it for anyone using a real json parser.
2019-06-06 19:42:30 +00:00
|
|
|
else starting ("unexport " ++ name r) (ActionItemOther (Just f')) $
|
|
|
|
performUnexport r db eks loc
|
2017-08-31 19:41:48 +00:00
|
|
|
where
|
2019-12-04 17:15:34 +00:00
|
|
|
loc = mkExportLocation (toRawFilePath f')
|
2017-09-06 19:33:40 +00:00
|
|
|
f' = getTopFilePath f
|
|
|
|
|
2019-01-30 18:55:28 +00:00
|
|
|
startUnexport' :: Remote -> ExportHandle -> TopFilePath -> ExportKey -> CommandStart
|
make CommandStart return a StartMessage
The goal is to be able to run CommandStart in the main thread when -J is
used, rather than unncessarily passing it off to a worker thread, which
incurs overhead that is signficant when the CommandStart is going to
quickly decide to stop.
To do that, the message it displays needs to be displayed in the worker
thread, after the CommandStart has run.
Also, the change will mean that CommandStart will no longer necessarily
run with the same Annex state as CommandPerform. While its docs already
said it should avoid modifying Annex state, I audited all the
CommandStart code as part of the conversion. (Note that CommandSeek
already sometimes runs with a different Annex state, and that has not been
a source of any problems, so I am not too worried that this change will
lead to breakage going forward.)
The only modification of Annex state I found was it calling
allowMessages in some Commands that default to noMessages. Dealt with
that by adding a startCustomOutput and a startingUsualMessages.
This lets a command start with noMessages and then select the output it
wants for each CommandStart.
One bit of breakage: onlyActionOn has been removed from commands that used it.
The plan is that, since a StartMessage contains an ActionItem,
when a Key can be extracted from that, the parallel job runner can
run onlyActionOn' automatically. Then commands won't need to worry about
this detail. Future work.
Otherwise, this was a fairly straightforward process of making each
CommandStart compile again. Hopefully other behavior changes were mostly
avoided.
In a few cases, a command had a CommandStart that called a CommandPerform
that then called showStart multiple times. I have collapsed those
down to a single start action. The main command to perhaps suffer from it
is Command.Direct, which used to show a start for each file, and no
longer does.
Another minor behavior change is that some commands used showStart
before, but had an associated file and a Key available, so were changed
to ShowStart with an ActionItemAssociatedFile. That will not change the
normal output or behavior, but --json output will now include the key.
This should not break it for anyone using a real json parser.
2019-06-06 19:42:30 +00:00
|
|
|
startUnexport' r db f ek = starting ("unexport " ++ name r) (ActionItemOther (Just f')) $
|
|
|
|
performUnexport r db [ek] loc
|
2017-09-07 18:32:47 +00:00
|
|
|
where
|
2019-12-04 17:15:34 +00:00
|
|
|
loc = mkExportLocation (toRawFilePath f')
|
2017-09-07 18:32:47 +00:00
|
|
|
f' = getTopFilePath f
|
|
|
|
|
2019-01-26 16:52:56 +00:00
|
|
|
-- Unlike a usual drop from a repository, this does not check that
|
|
|
|
-- numcopies is satisfied before removing the content. Typically an export
|
|
|
|
-- remote is untrusted, so would not count as a copy anyway.
|
|
|
|
-- Or, an export may be appendonly, and removing a file from it does
|
|
|
|
-- not really remove the content, which must be accessible later on.
|
2019-01-30 18:55:28 +00:00
|
|
|
performUnexport :: Remote -> ExportHandle -> [ExportKey] -> ExportLocation -> CommandPerform
|
|
|
|
performUnexport r db eks loc = do
|
|
|
|
ifM (allM (\ek -> removeExport (exportActions r) (asKey ek) loc) eks)
|
|
|
|
( next $ cleanupUnexport r db eks loc
|
2017-09-06 19:33:40 +00:00
|
|
|
, stop
|
|
|
|
)
|
2017-08-29 18:58:38 +00:00
|
|
|
|
2019-01-30 18:55:28 +00:00
|
|
|
cleanupUnexport :: Remote -> ExportHandle -> [ExportKey] -> ExportLocation -> CommandCleanup
|
|
|
|
cleanupUnexport r db eks loc = do
|
2017-09-04 18:33:09 +00:00
|
|
|
liftIO $ do
|
2017-09-06 19:33:40 +00:00
|
|
|
forM_ eks $ \ek ->
|
2017-09-18 17:57:25 +00:00
|
|
|
removeExportedLocation db (asKey ek) loc
|
2017-09-04 18:33:09 +00:00
|
|
|
flushDbQueue db
|
2017-09-15 19:04:29 +00:00
|
|
|
|
2018-08-30 15:23:57 +00:00
|
|
|
-- An appendonly remote can support removeExportLocation to remove
|
2018-08-30 15:18:20 +00:00
|
|
|
-- the file from the exported tree, but still retain the content
|
|
|
|
-- and allow retrieving it.
|
2018-08-30 15:23:57 +00:00
|
|
|
unless (appendonly r) $ do
|
2018-08-30 15:18:20 +00:00
|
|
|
remaininglocs <- liftIO $
|
|
|
|
concat <$> forM eks (\ek -> getExportedLocation db (asKey ek))
|
|
|
|
when (null remaininglocs) $
|
|
|
|
forM_ eks $ \ek ->
|
|
|
|
logChange (asKey ek) (uuid r) InfoMissing
|
2017-09-15 19:04:29 +00:00
|
|
|
|
2019-01-30 18:55:28 +00:00
|
|
|
removeEmptyDirectories r db loc (map asKey eks)
|
2017-09-06 19:33:40 +00:00
|
|
|
|
2019-01-30 18:55:28 +00:00
|
|
|
startRecoverIncomplete :: Remote -> ExportHandle -> Git.Sha -> TopFilePath -> CommandStart
|
|
|
|
startRecoverIncomplete r db sha oldf
|
2017-09-06 19:33:40 +00:00
|
|
|
| sha == nullSha = stop
|
|
|
|
| otherwise = do
|
|
|
|
ek <- exportKey sha
|
2017-09-18 17:57:25 +00:00
|
|
|
let loc = exportTempName ek
|
2019-12-04 17:15:34 +00:00
|
|
|
starting ("unexport " ++ name r) (ActionItemOther (Just (fromRawFilePath (fromExportLocation loc)))) $ do
|
make CommandStart return a StartMessage
The goal is to be able to run CommandStart in the main thread when -J is
used, rather than unncessarily passing it off to a worker thread, which
incurs overhead that is signficant when the CommandStart is going to
quickly decide to stop.
To do that, the message it displays needs to be displayed in the worker
thread, after the CommandStart has run.
Also, the change will mean that CommandStart will no longer necessarily
run with the same Annex state as CommandPerform. While its docs already
said it should avoid modifying Annex state, I audited all the
CommandStart code as part of the conversion. (Note that CommandSeek
already sometimes runs with a different Annex state, and that has not been
a source of any problems, so I am not too worried that this change will
lead to breakage going forward.)
The only modification of Annex state I found was it calling
allowMessages in some Commands that default to noMessages. Dealt with
that by adding a startCustomOutput and a startingUsualMessages.
This lets a command start with noMessages and then select the output it
wants for each CommandStart.
One bit of breakage: onlyActionOn has been removed from commands that used it.
The plan is that, since a StartMessage contains an ActionItem,
when a Key can be extracted from that, the parallel job runner can
run onlyActionOn' automatically. Then commands won't need to worry about
this detail. Future work.
Otherwise, this was a fairly straightforward process of making each
CommandStart compile again. Hopefully other behavior changes were mostly
avoided.
In a few cases, a command had a CommandStart that called a CommandPerform
that then called showStart multiple times. I have collapsed those
down to a single start action. The main command to perhaps suffer from it
is Command.Direct, which used to show a start for each file, and no
longer does.
Another minor behavior change is that some commands used showStart
before, but had an associated file and a Key available, so were changed
to ShowStart with an ActionItemAssociatedFile. That will not change the
normal output or behavior, but --json output will now include the key.
This should not break it for anyone using a real json parser.
2019-06-06 19:42:30 +00:00
|
|
|
liftIO $ removeExportedLocation db (asKey ek) oldloc
|
|
|
|
performUnexport r db [ek] loc
|
2017-09-07 19:37:49 +00:00
|
|
|
where
|
2019-12-04 17:15:34 +00:00
|
|
|
oldloc = mkExportLocation (toRawFilePath oldf')
|
2017-09-07 19:37:49 +00:00
|
|
|
oldf' = getTopFilePath oldf
|
2017-09-06 19:33:40 +00:00
|
|
|
|
2019-01-30 18:55:28 +00:00
|
|
|
startMoveToTempName :: Remote -> ExportHandle -> TopFilePath -> ExportKey -> CommandStart
|
make CommandStart return a StartMessage
The goal is to be able to run CommandStart in the main thread when -J is
used, rather than unncessarily passing it off to a worker thread, which
incurs overhead that is signficant when the CommandStart is going to
quickly decide to stop.
To do that, the message it displays needs to be displayed in the worker
thread, after the CommandStart has run.
Also, the change will mean that CommandStart will no longer necessarily
run with the same Annex state as CommandPerform. While its docs already
said it should avoid modifying Annex state, I audited all the
CommandStart code as part of the conversion. (Note that CommandSeek
already sometimes runs with a different Annex state, and that has not been
a source of any problems, so I am not too worried that this change will
lead to breakage going forward.)
The only modification of Annex state I found was it calling
allowMessages in some Commands that default to noMessages. Dealt with
that by adding a startCustomOutput and a startingUsualMessages.
This lets a command start with noMessages and then select the output it
wants for each CommandStart.
One bit of breakage: onlyActionOn has been removed from commands that used it.
The plan is that, since a StartMessage contains an ActionItem,
when a Key can be extracted from that, the parallel job runner can
run onlyActionOn' automatically. Then commands won't need to worry about
this detail. Future work.
Otherwise, this was a fairly straightforward process of making each
CommandStart compile again. Hopefully other behavior changes were mostly
avoided.
In a few cases, a command had a CommandStart that called a CommandPerform
that then called showStart multiple times. I have collapsed those
down to a single start action. The main command to perhaps suffer from it
is Command.Direct, which used to show a start for each file, and no
longer does.
Another minor behavior change is that some commands used showStart
before, but had an associated file and a Key available, so were changed
to ShowStart with an ActionItemAssociatedFile. That will not change the
normal output or behavior, but --json output will now include the key.
This should not break it for anyone using a real json parser.
2019-06-06 19:42:30 +00:00
|
|
|
startMoveToTempName r db f ek = starting ("rename " ++ name r)
|
2019-12-04 17:15:34 +00:00
|
|
|
(ActionItemOther $ Just $ f' ++ " -> " ++ fromRawFilePath (fromExportLocation tmploc))
|
make CommandStart return a StartMessage
The goal is to be able to run CommandStart in the main thread when -J is
used, rather than unncessarily passing it off to a worker thread, which
incurs overhead that is signficant when the CommandStart is going to
quickly decide to stop.
To do that, the message it displays needs to be displayed in the worker
thread, after the CommandStart has run.
Also, the change will mean that CommandStart will no longer necessarily
run with the same Annex state as CommandPerform. While its docs already
said it should avoid modifying Annex state, I audited all the
CommandStart code as part of the conversion. (Note that CommandSeek
already sometimes runs with a different Annex state, and that has not been
a source of any problems, so I am not too worried that this change will
lead to breakage going forward.)
The only modification of Annex state I found was it calling
allowMessages in some Commands that default to noMessages. Dealt with
that by adding a startCustomOutput and a startingUsualMessages.
This lets a command start with noMessages and then select the output it
wants for each CommandStart.
One bit of breakage: onlyActionOn has been removed from commands that used it.
The plan is that, since a StartMessage contains an ActionItem,
when a Key can be extracted from that, the parallel job runner can
run onlyActionOn' automatically. Then commands won't need to worry about
this detail. Future work.
Otherwise, this was a fairly straightforward process of making each
CommandStart compile again. Hopefully other behavior changes were mostly
avoided.
In a few cases, a command had a CommandStart that called a CommandPerform
that then called showStart multiple times. I have collapsed those
down to a single start action. The main command to perhaps suffer from it
is Command.Direct, which used to show a start for each file, and no
longer does.
Another minor behavior change is that some commands used showStart
before, but had an associated file and a Key available, so were changed
to ShowStart with an ActionItemAssociatedFile. That will not change the
normal output or behavior, but --json output will now include the key.
This should not break it for anyone using a real json parser.
2019-06-06 19:42:30 +00:00
|
|
|
(performRename r db ek loc tmploc)
|
2017-09-06 19:33:40 +00:00
|
|
|
where
|
2019-12-04 17:15:34 +00:00
|
|
|
loc = mkExportLocation (toRawFilePath f')
|
2017-09-06 19:33:40 +00:00
|
|
|
f' = getTopFilePath f
|
2017-09-18 17:57:25 +00:00
|
|
|
tmploc = exportTempName ek
|
2017-09-06 19:33:40 +00:00
|
|
|
|
2019-01-30 18:55:28 +00:00
|
|
|
startMoveFromTempName :: Remote -> ExportHandle -> ExportKey -> TopFilePath -> CommandStart
|
|
|
|
startMoveFromTempName r db ek f = do
|
2017-09-18 17:57:25 +00:00
|
|
|
let tmploc = exportTempName ek
|
make CommandStart return a StartMessage
The goal is to be able to run CommandStart in the main thread when -J is
used, rather than unncessarily passing it off to a worker thread, which
incurs overhead that is signficant when the CommandStart is going to
quickly decide to stop.
To do that, the message it displays needs to be displayed in the worker
thread, after the CommandStart has run.
Also, the change will mean that CommandStart will no longer necessarily
run with the same Annex state as CommandPerform. While its docs already
said it should avoid modifying Annex state, I audited all the
CommandStart code as part of the conversion. (Note that CommandSeek
already sometimes runs with a different Annex state, and that has not been
a source of any problems, so I am not too worried that this change will
lead to breakage going forward.)
The only modification of Annex state I found was it calling
allowMessages in some Commands that default to noMessages. Dealt with
that by adding a startCustomOutput and a startingUsualMessages.
This lets a command start with noMessages and then select the output it
wants for each CommandStart.
One bit of breakage: onlyActionOn has been removed from commands that used it.
The plan is that, since a StartMessage contains an ActionItem,
when a Key can be extracted from that, the parallel job runner can
run onlyActionOn' automatically. Then commands won't need to worry about
this detail. Future work.
Otherwise, this was a fairly straightforward process of making each
CommandStart compile again. Hopefully other behavior changes were mostly
avoided.
In a few cases, a command had a CommandStart that called a CommandPerform
that then called showStart multiple times. I have collapsed those
down to a single start action. The main command to perhaps suffer from it
is Command.Direct, which used to show a start for each file, and no
longer does.
Another minor behavior change is that some commands used showStart
before, but had an associated file and a Key available, so were changed
to ShowStart with an ActionItemAssociatedFile. That will not change the
normal output or behavior, but --json output will now include the key.
This should not break it for anyone using a real json parser.
2019-06-06 19:42:30 +00:00
|
|
|
stopUnless (liftIO $ elem tmploc <$> getExportedLocation db (asKey ek)) $
|
2019-12-04 17:15:34 +00:00
|
|
|
starting ("rename " ++ name r) (ActionItemOther (Just (fromRawFilePath (fromExportLocation tmploc) ++ " -> " ++ f'))) $
|
make CommandStart return a StartMessage
The goal is to be able to run CommandStart in the main thread when -J is
used, rather than unncessarily passing it off to a worker thread, which
incurs overhead that is signficant when the CommandStart is going to
quickly decide to stop.
To do that, the message it displays needs to be displayed in the worker
thread, after the CommandStart has run.
Also, the change will mean that CommandStart will no longer necessarily
run with the same Annex state as CommandPerform. While its docs already
said it should avoid modifying Annex state, I audited all the
CommandStart code as part of the conversion. (Note that CommandSeek
already sometimes runs with a different Annex state, and that has not been
a source of any problems, so I am not too worried that this change will
lead to breakage going forward.)
The only modification of Annex state I found was it calling
allowMessages in some Commands that default to noMessages. Dealt with
that by adding a startCustomOutput and a startingUsualMessages.
This lets a command start with noMessages and then select the output it
wants for each CommandStart.
One bit of breakage: onlyActionOn has been removed from commands that used it.
The plan is that, since a StartMessage contains an ActionItem,
when a Key can be extracted from that, the parallel job runner can
run onlyActionOn' automatically. Then commands won't need to worry about
this detail. Future work.
Otherwise, this was a fairly straightforward process of making each
CommandStart compile again. Hopefully other behavior changes were mostly
avoided.
In a few cases, a command had a CommandStart that called a CommandPerform
that then called showStart multiple times. I have collapsed those
down to a single start action. The main command to perhaps suffer from it
is Command.Direct, which used to show a start for each file, and no
longer does.
Another minor behavior change is that some commands used showStart
before, but had an associated file and a Key available, so were changed
to ShowStart with an ActionItemAssociatedFile. That will not change the
normal output or behavior, but --json output will now include the key.
This should not break it for anyone using a real json parser.
2019-06-06 19:42:30 +00:00
|
|
|
performRename r db ek tmploc loc
|
2017-09-06 19:33:40 +00:00
|
|
|
where
|
2019-12-04 17:15:34 +00:00
|
|
|
loc = mkExportLocation (toRawFilePath f')
|
2017-09-06 19:33:40 +00:00
|
|
|
f' = getTopFilePath f
|
|
|
|
|
2019-01-30 18:55:28 +00:00
|
|
|
performRename :: Remote -> ExportHandle -> ExportKey -> ExportLocation -> ExportLocation -> CommandPerform
|
2019-03-11 16:44:12 +00:00
|
|
|
performRename r db ek src dest =
|
|
|
|
renameExport (exportActions r) (asKey ek) src dest >>= \case
|
|
|
|
Just True -> next $ cleanupRename r db ek src dest
|
|
|
|
Just False -> do
|
2017-09-12 18:08:00 +00:00
|
|
|
warning "rename failed; deleting instead"
|
2019-03-11 16:44:12 +00:00
|
|
|
fallbackdelete
|
|
|
|
-- Remote does not support renaming, so don't warn about it.
|
|
|
|
Nothing -> fallbackdelete
|
|
|
|
where
|
|
|
|
fallbackdelete = performUnexport r db [ek] src
|
2017-09-06 19:33:40 +00:00
|
|
|
|
2019-01-30 18:55:28 +00:00
|
|
|
cleanupRename :: Remote -> ExportHandle -> ExportKey -> ExportLocation -> ExportLocation -> CommandCleanup
|
|
|
|
cleanupRename r db ek src dest = do
|
2017-09-06 19:33:40 +00:00
|
|
|
liftIO $ do
|
2017-09-18 17:57:25 +00:00
|
|
|
removeExportedLocation db (asKey ek) src
|
|
|
|
addExportedLocation db (asKey ek) dest
|
2017-09-06 19:33:40 +00:00
|
|
|
flushDbQueue db
|
2017-09-15 20:34:45 +00:00
|
|
|
if exportDirectories src /= exportDirectories dest
|
2019-01-30 18:55:28 +00:00
|
|
|
then removeEmptyDirectories r db src [asKey ek]
|
2017-09-15 20:30:49 +00:00
|
|
|
else return True
|
2017-09-18 22:40:16 +00:00
|
|
|
|
|
|
|
-- | Remove empty directories from the export. Call after removing an
|
|
|
|
-- exported file, and after calling removeExportLocation and flushing the
|
|
|
|
-- database.
|
2019-01-30 18:55:28 +00:00
|
|
|
removeEmptyDirectories :: Remote -> ExportHandle -> ExportLocation -> [Key] -> Annex Bool
|
|
|
|
removeEmptyDirectories r db loc ks
|
2017-09-18 22:40:16 +00:00
|
|
|
| null (exportDirectories loc) = return True
|
2019-01-30 18:55:28 +00:00
|
|
|
| otherwise = case removeExportDirectory (exportActions r) of
|
2017-09-18 22:40:16 +00:00
|
|
|
Nothing -> return True
|
|
|
|
Just removeexportdirectory -> do
|
|
|
|
ok <- allM (go removeexportdirectory)
|
|
|
|
(reverse (exportDirectories loc))
|
|
|
|
unless ok $ liftIO $ do
|
|
|
|
-- Add location back to export database,
|
|
|
|
-- so this is tried again next time.
|
|
|
|
forM_ ks $ \k ->
|
|
|
|
addExportedLocation db k loc
|
|
|
|
flushDbQueue db
|
|
|
|
return ok
|
|
|
|
where
|
|
|
|
go removeexportdirectory d =
|
|
|
|
ifM (liftIO $ isExportDirectoryEmpty db d)
|
|
|
|
( removeexportdirectory d
|
|
|
|
, return True
|
|
|
|
)
|
2019-05-20 15:54:55 +00:00
|
|
|
|
|
|
|
-- | A value that has been filtered through the remote's preferred content
|
|
|
|
-- expression.
|
|
|
|
newtype PreferredFiltered t = PreferredFiltered t
|
|
|
|
|
2019-05-20 20:37:04 +00:00
|
|
|
-- | Filters the tree to files that are preferred content of the remote.
|
|
|
|
--
|
|
|
|
-- A log is written with files that were filtered out, so they can be added
|
|
|
|
-- back in when importing from the remote.
|
2019-05-20 15:54:55 +00:00
|
|
|
filterPreferredContent :: Remote -> Git.Ref -> Annex (PreferredFiltered Git.Ref)
|
2019-05-20 20:37:04 +00:00
|
|
|
filterPreferredContent r tree = logExportExcluded (uuid r) $ \logwriter -> do
|
2019-05-20 15:54:55 +00:00
|
|
|
m <- preferredContentMap
|
|
|
|
case M.lookup (uuid r) m of
|
2019-05-20 20:37:04 +00:00
|
|
|
Just matcher | not (isEmpty matcher) -> do
|
|
|
|
PreferredFiltered <$> go matcher logwriter
|
2019-05-20 15:54:55 +00:00
|
|
|
_ -> return (PreferredFiltered tree)
|
|
|
|
where
|
2019-05-20 20:37:04 +00:00
|
|
|
go matcher logwriter = do
|
2019-05-20 15:54:55 +00:00
|
|
|
g <- Annex.gitRepo
|
2019-05-20 20:37:04 +00:00
|
|
|
Git.Tree.adjustTree
|
|
|
|
(checkmatcher matcher logwriter)
|
|
|
|
[]
|
|
|
|
(\_old new -> new)
|
|
|
|
[]
|
|
|
|
tree
|
|
|
|
g
|
2019-05-20 15:54:55 +00:00
|
|
|
|
2019-05-20 20:37:04 +00:00
|
|
|
checkmatcher matcher logwriter ti@(Git.Tree.TreeItem topf _ sha) =
|
2019-05-20 15:54:55 +00:00
|
|
|
catKey sha >>= \case
|
|
|
|
Just k -> do
|
|
|
|
-- Match filename relative to the
|
|
|
|
-- top of the tree.
|
|
|
|
let af = AssociatedFile $ Just $
|
2019-12-04 17:15:34 +00:00
|
|
|
toRawFilePath $ getTopFilePath topf
|
2019-05-20 15:54:55 +00:00
|
|
|
let mi = MatchingKey k af
|
|
|
|
ifM (checkMatcher' matcher mi mempty)
|
|
|
|
( return (Just ti)
|
2019-05-20 20:37:04 +00:00
|
|
|
, do
|
|
|
|
() <- liftIO $ logwriter ti
|
|
|
|
return Nothing
|
2019-05-20 15:54:55 +00:00
|
|
|
)
|
|
|
|
-- Always export non-annexed files.
|
|
|
|
Nothing -> return (Just ti)
|