2015-04-30 18:02:56 +00:00
|
|
|
{- git-annex numcopies configuration and checking
|
2014-01-21 22:08:56 +00:00
|
|
|
-
|
2021-01-06 18:11:08 +00:00
|
|
|
- Copyright 2014-2021 Joey Hess <id@joeyh.name>
|
2014-01-21 22:08:56 +00:00
|
|
|
-
|
2019-03-13 19:48:14 +00:00
|
|
|
- Licensed under the GNU AGPL version 3 or higher.
|
2014-01-21 22:08:56 +00:00
|
|
|
-}
|
|
|
|
|
2018-10-13 05:36:06 +00:00
|
|
|
{-# LANGUAGE ScopedTypeVariables, DeriveDataTypeable #-}
|
2015-10-09 17:07:03 +00:00
|
|
|
|
2015-04-30 18:02:56 +00:00
|
|
|
module Annex.NumCopies (
|
2014-01-21 22:08:56 +00:00
|
|
|
module Types.NumCopies,
|
|
|
|
module Logs.NumCopies,
|
2021-01-06 18:11:08 +00:00
|
|
|
getFileNumMinCopies,
|
2021-06-15 15:12:27 +00:00
|
|
|
getSafestNumMinCopies,
|
|
|
|
getSafestNumMinCopies',
|
2014-01-21 22:08:56 +00:00
|
|
|
getGlobalFileNumCopies,
|
|
|
|
getNumCopies,
|
2021-01-06 18:11:08 +00:00
|
|
|
getMinCopies,
|
2014-01-21 22:08:56 +00:00
|
|
|
deprecatedNumCopies,
|
2015-04-12 16:49:11 +00:00
|
|
|
defaultNumCopies,
|
|
|
|
numCopiesCheck,
|
|
|
|
numCopiesCheck',
|
2015-10-09 15:09:46 +00:00
|
|
|
verifyEnoughCopiesToDrop,
|
2015-10-09 18:57:32 +00:00
|
|
|
verifiableCopies,
|
2015-10-09 20:16:03 +00:00
|
|
|
UnVerifiedCopy(..),
|
2014-01-21 22:08:56 +00:00
|
|
|
) where
|
|
|
|
|
2016-01-20 20:36:33 +00:00
|
|
|
import Annex.Common
|
2014-01-21 22:08:56 +00:00
|
|
|
import qualified Annex
|
|
|
|
import Types.NumCopies
|
|
|
|
import Logs.NumCopies
|
|
|
|
import Logs.Trust
|
|
|
|
import Annex.CheckAttr
|
|
|
|
import qualified Remote
|
2015-10-09 16:36:04 +00:00
|
|
|
import qualified Types.Remote as Remote
|
2015-04-30 18:02:56 +00:00
|
|
|
import Annex.Content
|
2015-10-09 18:57:32 +00:00
|
|
|
import Annex.UUID
|
2021-06-15 15:12:27 +00:00
|
|
|
import Annex.CatFile
|
|
|
|
import qualified Database.Keys
|
2014-01-21 22:08:56 +00:00
|
|
|
|
2015-10-09 17:07:03 +00:00
|
|
|
import Control.Exception
|
|
|
|
import qualified Control.Monad.Catch as M
|
|
|
|
import Data.Typeable
|
|
|
|
|
2014-01-21 22:08:56 +00:00
|
|
|
defaultNumCopies :: NumCopies
|
|
|
|
defaultNumCopies = NumCopies 1
|
|
|
|
|
2021-01-06 18:11:08 +00:00
|
|
|
defaultMinCopies :: MinCopies
|
|
|
|
defaultMinCopies = MinCopies 1
|
|
|
|
|
|
|
|
fromSourcesOr :: v -> [Annex (Maybe v)] -> Annex v
|
|
|
|
fromSourcesOr v = fromMaybe v <$$> getM id
|
2014-01-21 22:08:56 +00:00
|
|
|
|
|
|
|
{- The git config annex.numcopies is deprecated. -}
|
|
|
|
deprecatedNumCopies :: Annex (Maybe NumCopies)
|
|
|
|
deprecatedNumCopies = annexNumCopies <$> Annex.getGitConfig
|
|
|
|
|
|
|
|
{- Value forced on the command line by --numcopies. -}
|
|
|
|
getForcedNumCopies :: Annex (Maybe NumCopies)
|
|
|
|
getForcedNumCopies = Annex.getState Annex.forcenumcopies
|
|
|
|
|
2021-01-06 18:11:08 +00:00
|
|
|
{- Value forced on the command line by --mincopies. -}
|
|
|
|
getForcedMinCopies :: Annex (Maybe MinCopies)
|
|
|
|
getForcedMinCopies = Annex.getState Annex.forcemincopies
|
|
|
|
|
|
|
|
{- NumCopies value from any of the non-.gitattributes configuration
|
2014-01-21 22:08:56 +00:00
|
|
|
- sources. -}
|
|
|
|
getNumCopies :: Annex NumCopies
|
2021-01-06 18:11:08 +00:00
|
|
|
getNumCopies = fromSourcesOr defaultNumCopies
|
2014-01-21 22:08:56 +00:00
|
|
|
[ getForcedNumCopies
|
|
|
|
, getGlobalNumCopies
|
|
|
|
, deprecatedNumCopies
|
|
|
|
]
|
|
|
|
|
2021-01-06 18:11:08 +00:00
|
|
|
{- MinCopies value from any of the non-.gitattributes configuration
|
|
|
|
- sources. -}
|
|
|
|
getMinCopies :: Annex MinCopies
|
|
|
|
getMinCopies = fromSourcesOr defaultMinCopies
|
|
|
|
[ getForcedMinCopies
|
|
|
|
, getGlobalMinCopies
|
2014-01-21 22:08:56 +00:00
|
|
|
]
|
|
|
|
|
2021-01-06 18:11:08 +00:00
|
|
|
{- NumCopies and MinCopies value for a file, from any configuration source,
|
|
|
|
- including .gitattributes. -}
|
|
|
|
getFileNumMinCopies :: RawFilePath -> Annex (NumCopies, MinCopies)
|
|
|
|
getFileNumMinCopies f = do
|
|
|
|
fnumc <- getForcedNumCopies
|
|
|
|
fminc <- getForcedMinCopies
|
|
|
|
case (fnumc, fminc) of
|
|
|
|
(Just numc, Just minc) -> return (numc, minc)
|
|
|
|
(Just numc, Nothing) -> do
|
|
|
|
minc <- fromSourcesOr defaultMinCopies
|
|
|
|
[ snd <$> getNumMinCopiesAttr f
|
|
|
|
, getGlobalMinCopies
|
|
|
|
]
|
|
|
|
return (numc, minc)
|
|
|
|
(Nothing, Just minc) -> do
|
|
|
|
numc <- fromSourcesOr defaultNumCopies
|
|
|
|
[ fst <$> getNumMinCopiesAttr f
|
|
|
|
, getGlobalNumCopies
|
|
|
|
, deprecatedNumCopies
|
|
|
|
]
|
|
|
|
return (numc, minc)
|
|
|
|
(Nothing, Nothing) -> do
|
|
|
|
let fallbacknum = fromSourcesOr defaultNumCopies
|
|
|
|
[ getGlobalNumCopies
|
|
|
|
, deprecatedNumCopies
|
|
|
|
]
|
|
|
|
let fallbackmin = fromSourcesOr defaultMinCopies
|
|
|
|
[ getGlobalMinCopies
|
|
|
|
]
|
|
|
|
getNumMinCopiesAttr f >>= \case
|
|
|
|
(Just numc, Just minc) ->
|
|
|
|
return (numc, minc)
|
|
|
|
(Just numc, Nothing) -> (,)
|
|
|
|
<$> pure numc
|
|
|
|
<*> fallbackmin
|
|
|
|
(Nothing, Just minc) -> (,)
|
|
|
|
<$> fallbacknum
|
|
|
|
<*> pure minc
|
|
|
|
(Nothing, Nothing) -> (,)
|
|
|
|
<$> fallbacknum
|
|
|
|
<*> fallbackmin
|
|
|
|
|
2021-06-15 15:12:27 +00:00
|
|
|
{- Gets the highest NumCopies and MinCopies value for all files
|
|
|
|
- associated with a key. Provide any known associated file;
|
|
|
|
- the rest are looked up from the database.
|
|
|
|
-
|
2021-06-15 15:38:44 +00:00
|
|
|
- Using this when dropping, rather than getFileNumMinCopies
|
|
|
|
- avoids dropping one file that has a smaller value violating
|
|
|
|
- the value set for another file that uses the same content.
|
2021-06-15 15:12:27 +00:00
|
|
|
-}
|
|
|
|
getSafestNumMinCopies :: AssociatedFile -> Key -> Annex (NumCopies, MinCopies)
|
|
|
|
getSafestNumMinCopies afile k =
|
|
|
|
Database.Keys.getAssociatedFilesIncluding afile k
|
2021-06-15 15:38:44 +00:00
|
|
|
>>= getSafestNumMinCopies' afile k
|
2021-06-15 15:12:27 +00:00
|
|
|
|
2021-06-15 15:38:44 +00:00
|
|
|
getSafestNumMinCopies' :: AssociatedFile -> Key -> [RawFilePath] -> Annex (NumCopies, MinCopies)
|
|
|
|
getSafestNumMinCopies' afile k fs = do
|
2021-06-15 15:12:27 +00:00
|
|
|
l <- mapM getFileNumMinCopies fs
|
|
|
|
let l' = zip l fs
|
|
|
|
(,)
|
|
|
|
<$> findmax fst l' getNumCopies
|
|
|
|
<*> findmax snd l' getMinCopies
|
|
|
|
where
|
|
|
|
-- Some associated files in the keys database may no longer
|
|
|
|
-- correspond to files in the repository.
|
2021-06-15 15:38:44 +00:00
|
|
|
-- (But the AssociatedFile passed to this is known to be
|
|
|
|
-- an associated file, which may not be in the keys database
|
|
|
|
-- yet, so checking it is skipped.)
|
|
|
|
stillassociated f
|
|
|
|
| AssociatedFile (Just f) == afile = return True
|
|
|
|
| otherwise = catKeyFile f >>= \case
|
|
|
|
Just k' | k' == k -> return True
|
|
|
|
_ -> return False
|
2021-06-15 15:12:27 +00:00
|
|
|
|
|
|
|
-- Avoid calling stillassociated on every file; just make sure
|
|
|
|
-- that the one with the highest value is still associated.
|
|
|
|
findmax _ [] fallback = fallback
|
|
|
|
findmax getv l fallback = do
|
|
|
|
let n = maximum (map (getv . fst) l)
|
|
|
|
let (maxls, l') = partition (\(x, _) -> getv x == n) l
|
|
|
|
ifM (anyM stillassociated (map snd maxls))
|
|
|
|
( return n
|
|
|
|
, findmax getv l' fallback
|
|
|
|
)
|
|
|
|
|
2014-01-21 22:08:56 +00:00
|
|
|
{- This is the globally visible numcopies value for a file. So it does
|
|
|
|
- not include local configuration in the git config or command line
|
|
|
|
- options. -}
|
2020-10-30 19:55:59 +00:00
|
|
|
getGlobalFileNumCopies :: RawFilePath -> Annex NumCopies
|
2021-01-06 18:11:08 +00:00
|
|
|
getGlobalFileNumCopies f = fromSourcesOr defaultNumCopies
|
|
|
|
[ fst <$> getNumMinCopiesAttr f
|
|
|
|
, getGlobalNumCopies
|
2014-01-21 22:08:56 +00:00
|
|
|
]
|
|
|
|
|
2021-01-06 18:11:08 +00:00
|
|
|
getNumMinCopiesAttr :: RawFilePath -> Annex (Maybe NumCopies, Maybe MinCopies)
|
|
|
|
getNumMinCopiesAttr file =
|
|
|
|
checkAttrs ["annex.numcopies", "annex.mincopies"] file >>= \case
|
|
|
|
(n:m:[]) -> return
|
|
|
|
( NumCopies <$> readish n
|
|
|
|
, MinCopies <$> readish m
|
|
|
|
)
|
|
|
|
_ -> error "internal"
|
2014-01-21 22:08:56 +00:00
|
|
|
|
|
|
|
{- Checks if numcopies are satisfied for a file by running a comparison
|
|
|
|
- between the number of (not untrusted) copies that are
|
2015-10-08 22:20:36 +00:00
|
|
|
- belived to exist, and the configured value.
|
|
|
|
-
|
|
|
|
- This is good enough for everything except dropping the file, which
|
|
|
|
- requires active verification of the copies.
|
|
|
|
-}
|
2020-10-30 19:55:59 +00:00
|
|
|
numCopiesCheck :: RawFilePath -> Key -> (Int -> Int -> v) -> Annex v
|
2014-01-21 22:08:56 +00:00
|
|
|
numCopiesCheck file key vs = do
|
|
|
|
have <- trustExclude UnTrusted =<< Remote.keyLocations key
|
2015-04-12 16:49:11 +00:00
|
|
|
numCopiesCheck' file vs have
|
|
|
|
|
2020-10-30 19:55:59 +00:00
|
|
|
numCopiesCheck' :: RawFilePath -> (Int -> Int -> v) -> [UUID] -> Annex v
|
2015-04-12 16:49:11 +00:00
|
|
|
numCopiesCheck' file vs have = do
|
2021-01-06 18:11:08 +00:00
|
|
|
NumCopies needed <- fst <$> getFileNumMinCopies file
|
2014-01-21 22:08:56 +00:00
|
|
|
return $ length have `vs` needed
|
2015-04-30 18:02:56 +00:00
|
|
|
|
2015-10-09 18:57:32 +00:00
|
|
|
data UnVerifiedCopy = UnVerifiedRemote Remote | UnVerifiedHere
|
|
|
|
deriving (Ord, Eq)
|
|
|
|
|
2015-04-30 18:02:56 +00:00
|
|
|
{- Verifies that enough copies of a key exist amoung the listed remotes,
|
2015-10-09 19:48:02 +00:00
|
|
|
- to safely drop it, running an action with a proof if so, and
|
|
|
|
- printing an informative message if not.
|
2015-04-30 18:02:56 +00:00
|
|
|
-}
|
2015-10-09 15:09:46 +00:00
|
|
|
verifyEnoughCopiesToDrop
|
2015-04-30 18:02:56 +00:00
|
|
|
:: String -- message to print when there are no known locations
|
|
|
|
-> Key
|
2015-10-09 19:48:02 +00:00
|
|
|
-> Maybe ContentRemovalLock
|
2015-04-30 18:02:56 +00:00
|
|
|
-> NumCopies
|
2021-01-06 18:11:08 +00:00
|
|
|
-> MinCopies
|
2015-06-03 17:15:38 +00:00
|
|
|
-> [UUID] -- repos to skip considering (generally untrusted remotes)
|
2015-10-08 22:20:36 +00:00
|
|
|
-> [VerifiedCopy] -- copies already verified to exist
|
2015-10-09 18:57:32 +00:00
|
|
|
-> [UnVerifiedCopy] -- places to check to see if they have copies
|
2015-10-09 20:16:03 +00:00
|
|
|
-> (SafeDropProof -> Annex a) -- action to perform the drop
|
2015-10-09 15:09:46 +00:00
|
|
|
-> Annex a -- action to perform when unable to drop
|
|
|
|
-> Annex a
|
2021-01-06 18:11:08 +00:00
|
|
|
verifyEnoughCopiesToDrop nolocmsg key removallock neednum needmin skip preverified tocheck dropaction nodropaction =
|
2020-06-26 17:00:40 +00:00
|
|
|
helper [] [] preverified (nub tocheck) []
|
2015-04-30 18:02:56 +00:00
|
|
|
where
|
2020-06-26 17:00:40 +00:00
|
|
|
helper bad missing have [] lockunsupported =
|
2021-01-06 18:11:08 +00:00
|
|
|
liftIO (mkSafeDropProof neednum needmin have removallock) >>= \case
|
2015-10-09 15:09:46 +00:00
|
|
|
Right proof -> dropaction proof
|
|
|
|
Left stillhave -> do
|
2021-01-06 18:11:08 +00:00
|
|
|
notEnoughCopies key neednum needmin stillhave (skip++missing) bad nolocmsg lockunsupported
|
2015-10-09 15:09:46 +00:00
|
|
|
nodropaction
|
2020-06-26 17:00:40 +00:00
|
|
|
helper bad missing have (c:cs) lockunsupported
|
2021-01-06 18:11:08 +00:00
|
|
|
| isSafeDrop neednum needmin have removallock =
|
|
|
|
liftIO (mkSafeDropProof neednum needmin have removallock) >>= \case
|
2015-10-09 15:09:46 +00:00
|
|
|
Right proof -> dropaction proof
|
2020-06-26 17:00:40 +00:00
|
|
|
Left stillhave -> helper bad missing stillhave (c:cs) lockunsupported
|
2015-10-09 18:57:32 +00:00
|
|
|
| otherwise = case c of
|
|
|
|
UnVerifiedHere -> lockContentShared key contverified
|
2017-12-05 19:00:50 +00:00
|
|
|
UnVerifiedRemote r -> checkremote r contverified $
|
2020-06-26 17:00:40 +00:00
|
|
|
let lockunsupported' = r : lockunsupported
|
|
|
|
in Remote.hasKey r key >>= \case
|
|
|
|
Right True -> helper bad missing (mkVerifiedCopy RecentlyVerifiedCopy r : have) cs lockunsupported'
|
|
|
|
Left _ -> helper (r:bad) missing have cs lockunsupported'
|
|
|
|
Right False -> helper bad (Remote.uuid r:missing) have cs lockunsupported'
|
2015-10-09 18:57:32 +00:00
|
|
|
where
|
2020-06-26 17:00:40 +00:00
|
|
|
contverified vc = helper bad missing (vc : have) cs lockunsupported
|
2015-10-09 18:57:32 +00:00
|
|
|
|
|
|
|
checkremote r cont fallback = case Remote.lockContent r of
|
|
|
|
Just lockcontent -> do
|
|
|
|
-- The remote's lockContent will throw an exception
|
|
|
|
-- when it is unable to lock, in which case the
|
|
|
|
-- fallback should be run.
|
|
|
|
--
|
|
|
|
-- On the other hand, the continuation could itself
|
|
|
|
-- throw an exception (ie, the eventual drop action
|
|
|
|
-- fails), and in this case we don't want to run the
|
|
|
|
-- fallback since part of the drop action may have
|
|
|
|
-- already been performed.
|
|
|
|
--
|
|
|
|
-- Differentiate between these two sorts
|
|
|
|
-- of exceptions by using DropException.
|
|
|
|
let a = lockcontent key $ \v ->
|
|
|
|
cont v `catchNonAsync` (throw . DropException)
|
|
|
|
a `M.catches`
|
|
|
|
[ M.Handler (\ (e :: AsyncException) -> throwM e)
|
2016-06-20 14:31:47 +00:00
|
|
|
, M.Handler (\ (e :: SomeAsyncException) -> throwM e)
|
2015-10-09 18:57:32 +00:00
|
|
|
, M.Handler (\ (DropException e') -> throwM e')
|
|
|
|
, M.Handler (\ (_e :: SomeException) -> fallback)
|
|
|
|
]
|
|
|
|
Nothing -> fallback
|
2015-04-30 18:02:56 +00:00
|
|
|
|
2015-10-09 17:07:03 +00:00
|
|
|
data DropException = DropException SomeException
|
|
|
|
deriving (Typeable, Show)
|
|
|
|
|
|
|
|
instance Exception DropException
|
|
|
|
|
2021-01-06 18:11:08 +00:00
|
|
|
notEnoughCopies :: Key -> NumCopies -> MinCopies -> [VerifiedCopy] -> [UUID] -> [Remote] -> String -> [Remote] -> Annex ()
|
|
|
|
notEnoughCopies key neednum needmin have skip bad nolocmsg lockunsupported = do
|
2015-04-30 18:02:56 +00:00
|
|
|
showNote "unsafe"
|
2021-01-06 18:11:08 +00:00
|
|
|
if length have < fromNumCopies neednum
|
2015-10-09 19:14:25 +00:00
|
|
|
then showLongNote $
|
|
|
|
"Could only verify the existence of " ++
|
2021-01-06 18:11:08 +00:00
|
|
|
show (length have) ++ " out of " ++ show (fromNumCopies neednum) ++
|
2021-04-27 17:39:56 +00:00
|
|
|
" necessary " ++ pluralcopies (fromNumCopies neednum)
|
2015-10-09 19:14:25 +00:00
|
|
|
else do
|
2021-04-27 17:39:56 +00:00
|
|
|
showLongNote $ "Unable to lock down " ++ show (fromMinCopies needmin) ++
|
|
|
|
" " ++ pluralcopies (fromMinCopies needmin) ++
|
|
|
|
" of file necessary to safely drop it."
|
2020-06-26 17:00:40 +00:00
|
|
|
if null lockunsupported
|
|
|
|
then showLongNote "(This could have happened because of a concurrent drop, or because a remote has too old a version of git-annex-shell installed.)"
|
|
|
|
else showLongNote $ "These remotes do not support locking: "
|
|
|
|
++ Remote.listRemoteNames lockunsupported
|
|
|
|
|
2015-04-30 18:02:56 +00:00
|
|
|
Remote.showTriedRemotes bad
|
2015-10-08 20:55:11 +00:00
|
|
|
Remote.showLocations True key (map toUUID have++skip) nolocmsg
|
2021-04-27 17:39:56 +00:00
|
|
|
where
|
|
|
|
pluralcopies 1 = "copy"
|
|
|
|
pluralcopies _ = "copies"
|
2015-04-30 18:02:56 +00:00
|
|
|
|
2015-10-09 18:57:32 +00:00
|
|
|
{- Finds locations of a key that can be used to get VerifiedCopies,
|
|
|
|
- in order to allow dropping the key.
|
|
|
|
-
|
|
|
|
- Provide a list of UUIDs that the key is being dropped from.
|
|
|
|
- The returned lists will exclude any of those UUIDs.
|
|
|
|
-
|
|
|
|
- The return lists also exclude any repositories that are untrusted,
|
|
|
|
- since those should not be used for verification.
|
2015-04-30 18:02:56 +00:00
|
|
|
-
|
2015-10-09 18:57:32 +00:00
|
|
|
- The UnVerifiedCopy list is cost ordered.
|
|
|
|
- The VerifiedCopy list contains repositories that are trusted to
|
|
|
|
- contain the key.
|
2015-04-30 18:02:56 +00:00
|
|
|
-}
|
2015-10-09 18:57:32 +00:00
|
|
|
verifiableCopies :: Key -> [UUID] -> Annex ([UnVerifiedCopy], [VerifiedCopy])
|
|
|
|
verifiableCopies key exclude = do
|
|
|
|
locs <- Remote.keyLocations key
|
|
|
|
(remotes, trusteduuids) <- Remote.remoteLocations locs
|
|
|
|
=<< trustGet Trusted
|
|
|
|
untrusteduuids <- trustGet UnTrusted
|
|
|
|
let exclude' = exclude ++ untrusteduuids
|
|
|
|
let remotes' = Remote.remotesWithoutUUID remotes (exclude' ++ trusteduuids)
|
|
|
|
let verified = map (mkVerifiedCopy TrustedCopy) $
|
|
|
|
filter (`notElem` exclude') trusteduuids
|
2015-04-30 18:02:56 +00:00
|
|
|
u <- getUUID
|
2015-10-09 18:57:32 +00:00
|
|
|
let herec = if u `elem` locs && u `notElem` exclude'
|
|
|
|
then [UnVerifiedHere]
|
|
|
|
else []
|
|
|
|
return (herec ++ map UnVerifiedRemote remotes', verified)
|