2010-11-06 21:06:19 +00:00
{- git - annex command
-
2020-02-14 18:52:15 +00:00
- Copyright 2010 - 2020 Joey Hess < id @ joeyh . name >
2010-11-06 21:06:19 +00:00
-
2019-03-13 19:48:14 +00:00
- Licensed under the GNU AGPL version 3 or higher .
2010-11-06 21:06:19 +00:00
- }
2013-05-10 21:29:59 +00:00
{- # LANGUAGE CPP # -}
2020-11-03 14:11:04 +00:00
{- # LANGUAGE OverloadedStrings # -}
2013-05-10 21:29:59 +00:00
2010-11-06 21:06:19 +00:00
module Command.Fsck where
import Command
2012-01-20 17:23:11 +00:00
import qualified Annex
2011-07-05 22:31:46 +00:00
import qualified Remote
import qualified Types.Backend
2011-10-29 21:49:37 +00:00
import qualified Backend
2011-10-04 04:40:47 +00:00
import Annex.Content
2012-06-06 00:25:32 +00:00
import Annex.Perms
fully support core.symlinks=false in all relevant symlink handling code
Refactored annex link code into nice clean new library.
Audited and dealt with calls to createSymbolicLink.
Remaining calls are all safe, because:
Annex/Link.hs: ( liftIO $ createSymbolicLink linktarget file
only when core.symlinks=true
Assistant/WebApp/Configurators/Local.hs: createSymbolicLink link link
test if symlinks can be made
Command/Fix.hs: liftIO $ createSymbolicLink link file
command only works in indirect mode
Command/FromKey.hs: liftIO $ createSymbolicLink link file
command only works in indirect mode
Command/Indirect.hs: liftIO $ createSymbolicLink l f
refuses to run if core.symlinks=false
Init.hs: createSymbolicLink f f2
test if symlinks can be made
Remote/Directory.hs: go [file] = catchBoolIO $ createSymbolicLink file f >> return True
fast key linking; catches failure to make symlink and falls back to copy
Remote/Git.hs: liftIO $ catchBoolIO $ createSymbolicLink loc file >> return True
ditto
Upgrade/V1.hs: liftIO $ createSymbolicLink link f
v1 repos could not be on a filesystem w/o symlinks
Audited and dealt with calls to readSymbolicLink.
Remaining calls are all safe, because:
Annex/Link.hs: ( liftIO $ catchMaybeIO $ readSymbolicLink file
only when core.symlinks=true
Assistant/Threads/Watcher.hs: ifM ((==) (Just link) <$> liftIO (catchMaybeIO $ readSymbolicLink file))
code that fixes real symlinks when inotify sees them
It's ok to not fix psdueo-symlinks.
Assistant/Threads/Watcher.hs: mlink <- liftIO (catchMaybeIO $ readSymbolicLink file)
ditto
Command/Fix.hs: stopUnless ((/=) (Just link) <$> liftIO (catchMaybeIO $ readSymbolicLink file)) $ do
command only works in indirect mode
Upgrade/V1.hs: getsymlink = takeFileName <$> readSymbolicLink file
v1 repos could not be on a filesystem w/o symlinks
Audited and dealt with calls to isSymbolicLink.
(Typically used with getSymbolicLinkStatus, but that is just used because
getFileStatus is not as robust; it also works on pseudolinks.)
Remaining calls are all safe, because:
Assistant/Threads/SanityChecker.hs: | isSymbolicLink s -> addsymlink file ms
only handles staging of symlinks that were somehow not staged
(might need to be updated to support pseudolinks, but this is
only a belt-and-suspenders check anyway, and I've never seen the code run)
Command/Add.hs: if isSymbolicLink s || not (isRegularFile s)
avoids adding symlinks to the annex, so not relevant
Command/Indirect.hs: | isSymbolicLink s -> void $ flip whenAnnexed f $
only allowed on systems that support symlinks
Command/Indirect.hs: whenM (liftIO $ not . isSymbolicLink <$> getSymbolicLinkStatus f) $ do
ditto
Seek.hs:notSymlink f = liftIO $ not . isSymbolicLink <$> getSymbolicLinkStatus f
used to find unlocked files, only relevant in indirect mode
Utility/FSEvents.hs: | Files.isSymbolicLink s = runhook addSymlinkHook $ Just s
Utility/FSEvents.hs: | Files.isSymbolicLink s ->
Utility/INotify.hs: | Files.isSymbolicLink s ->
Utility/INotify.hs: checkfiletype Files.isSymbolicLink addSymlinkHook f
Utility/Kqueue.hs: | Files.isSymbolicLink s = callhook addSymlinkHook (Just s) change
all above are lower-level, not relevant
Audited and dealt with calls to isSymLink.
Remaining calls are all safe, because:
Annex/Direct.hs: | isSymLink (getmode item) =
This is looking at git diff-tree objects, not files on disk
Command/Unused.hs: | isSymLink (LsTree.mode l) = do
This is looking at git ls-tree, not file on disk
Utility/FileMode.hs:isSymLink :: FileMode -> Bool
Utility/FileMode.hs:isSymLink = checkMode symbolicLinkMode
low-level
Done!!
2013-02-17 19:05:55 +00:00
import Annex.Link
2011-10-15 20:21:08 +00:00
import Logs.Location
import Logs.Trust
2015-04-05 16:50:02 +00:00
import Logs.Activity
2018-10-30 03:13:36 +00:00
import Utility.TimeStamp
2018-02-08 18:08:41 +00:00
import Logs.PreferredContent
2015-04-30 18:02:56 +00:00
import Annex.NumCopies
2011-10-15 21:47:03 +00:00
import Annex.UUID
2016-02-14 21:27:50 +00:00
import Annex.ReplaceFile
2011-07-06 00:36:43 +00:00
import Utility.DataUnits
2012-09-25 23:37:34 +00:00
import Utility.HumanTime
2015-04-18 18:13:07 +00:00
import Utility.CopyFile
2013-06-18 01:30:52 +00:00
import Git.FilePath
2014-02-11 19:29:56 +00:00
import Utility.PID
2015-12-11 20:05:56 +00:00
import qualified Database.Keys
2015-02-16 19:08:29 +00:00
import qualified Database.Fsck as FsckDb
2015-07-25 21:37:09 +00:00
import Types.CleanupActions
2017-02-27 17:50:00 +00:00
import Types.Key
2017-03-10 18:12:39 +00:00
import Types.ActionItem
2019-12-06 18:44:42 +00:00
import qualified Utility.RawFilePath as R
2010-11-06 21:06:19 +00:00
2012-09-25 18:16:34 +00:00
import Data.Time.Clock.POSIX
import System.Posix.Types ( EpochTime )
2018-02-08 18:08:41 +00:00
import qualified Data.Set as S
import qualified Data.Map as M
2020-05-13 21:05:56 +00:00
import Data.Either
2020-11-03 14:11:04 +00:00
import qualified System.FilePath.ByteString as P
2012-09-25 18:16:34 +00:00
2015-07-08 16:33:27 +00:00
cmd :: Command
2018-02-19 18:28:17 +00:00
cmd = withGlobalOptions [ jobsOption , jsonOptions , annexedMatchingOptions ] $
2015-07-10 17:18:46 +00:00
command " fsck " SectionMaintenance
" find and fix problems "
paramPaths ( seek <$$> optParser )
2015-07-08 20:58:54 +00:00
data FsckOptions = FsckOptions
{ fsckFiles :: CmdParams
2015-07-09 20:05:45 +00:00
, fsckFromOption :: Maybe ( DeferredParse Remote )
2015-07-09 16:26:25 +00:00
, incrementalOpt :: Maybe IncrementalOpt
2015-07-09 16:44:03 +00:00
, keyOptions :: Maybe KeyOptions
2015-07-08 20:58:54 +00:00
}
2015-07-09 16:26:25 +00:00
data IncrementalOpt
= StartIncrementalO
| MoreIncrementalO
| ScheduleIncrementalO Duration
2015-07-08 20:58:54 +00:00
optParser :: CmdParamsDesc -> Parser FsckOptions
optParser desc = FsckOptions
<$> cmdParams desc
2017-05-31 20:20:55 +00:00
<*> optional ( parseRemoteOption <$> strOption
2015-07-09 14:41:17 +00:00
( long " from " <> short 'f' <> metavar paramRemote
2015-07-08 20:58:54 +00:00
<> help " check remote "
2015-09-14 17:19:04 +00:00
<> completeRemotes
2015-07-08 20:58:54 +00:00
) )
2015-07-09 16:26:25 +00:00
<*> optional parseincremental
2016-08-03 16:37:12 +00:00
<*> optional parseKeyOptions
2015-07-09 16:26:25 +00:00
where
parseincremental =
flag' StartIncrementalO
( long " incremental " <> short 'S'
<> help " start an incremental fsck "
)
<|> flag' MoreIncrementalO
( long " more " <> short 'm'
<> help " continue an incremental fsck "
)
2020-08-15 19:53:35 +00:00
<|> ( ScheduleIncrementalO <$> option ( eitherReader parseDuration )
2015-07-09 16:26:25 +00:00
( long " incremental-schedule " <> metavar paramTime
<> help " schedule incremental fscking "
) )
2015-07-08 20:58:54 +00:00
seek :: FsckOptions -> CommandSeek
2019-06-19 16:35:08 +00:00
seek o = startConcurrency commandStages $ do
2015-07-09 20:05:45 +00:00
from <- maybe ( pure Nothing ) ( Just <$$> getParsed ) ( fsckFromOption o )
2015-02-17 21:08:11 +00:00
u <- maybe getUUID ( pure . Remote . uuid ) from
2015-11-10 18:44:58 +00:00
checkDeadRepo u
2015-07-09 16:26:25 +00:00
i <- prepIncremental u ( incrementalOpt o )
2020-07-13 21:04:02 +00:00
let seeker = AnnexedFileSeeker
2020-07-22 18:23:28 +00:00
{ startAction = start from i
2020-07-15 15:21:43 +00:00
, checkContentPresent = Nothing
2020-07-13 21:04:02 +00:00
, usesLocationLog = True
}
2020-07-24 16:05:28 +00:00
withKeyOptions ( keyOptions o ) False seeker
2018-10-01 18:12:06 +00:00
( \ kai -> commandAction . startKey from i kai =<< getNumCopies )
2020-07-13 21:04:02 +00:00
( withFilesInGitAnnex ww seeker )
2020-05-28 19:55:17 +00:00
=<< workTreeItems ww ( fsckFiles o )
2015-07-25 21:37:09 +00:00
cleanupIncremental i
2015-05-06 18:45:20 +00:00
void $ tryIO $ recordActivity Fsck u
2020-05-28 19:55:17 +00:00
where
ww = WarnUnmatchLsFiles
2010-11-15 22:22:50 +00:00
2015-11-10 18:44:58 +00:00
checkDeadRepo :: UUID -> Annex ()
checkDeadRepo u =
whenM ( ( == ) DeadTrusted <$> lookupTrust u ) $
earlyWarning " Warning: Fscking a repository that is currently marked as dead. "
2020-09-14 20:49:33 +00:00
start :: Maybe Remote -> Incremental -> SeekInput -> RawFilePath -> Key -> CommandStart
start from inc si file key = Backend . getBackend ( fromRawFilePath file ) key >>= \ case
2017-12-05 19:00:50 +00:00
Nothing -> stop
Just backend -> do
2021-01-06 18:11:08 +00:00
( numcopies , _mincopies ) <- getFileNumMinCopies file
2017-12-05 19:00:50 +00:00
case from of
Nothing -> go $ perform key file backend numcopies
Just r -> go $ performRemote key afile backend numcopies r
2012-11-12 05:05:04 +00:00
where
2020-09-14 20:49:33 +00:00
go = runFsck inc si ( mkActionItem ( key , afile ) ) key
2017-03-10 17:12:24 +00:00
afile = AssociatedFile ( Just file )
2010-11-15 22:22:50 +00:00
2019-12-04 17:15:34 +00:00
perform :: Key -> RawFilePath -> Backend -> NumCopies -> Annex Bool
2015-12-11 20:05:56 +00:00
perform key file backend numcopies = do
2019-12-04 17:15:34 +00:00
keystatus <- getKeyFileStatus key ( fromRawFilePath file )
2015-12-11 20:05:56 +00:00
check
-- order matters
[ fixLink key file
2017-03-10 18:12:39 +00:00
, verifyLocationLog key keystatus ai
2018-02-08 18:08:41 +00:00
, verifyRequiredContent key ai
2016-02-14 21:09:54 +00:00
, verifyAssociatedFiles key keystatus file
2016-02-14 21:27:50 +00:00
, verifyWorkTree key file
2017-03-10 18:12:39 +00:00
, checkKeySize key keystatus ai
2017-03-10 17:12:24 +00:00
, checkBackend backend key keystatus afile
2018-05-23 18:07:51 +00:00
, checkKeyUpgrade backend key ai afile
2017-03-10 17:12:24 +00:00
, checkKeyNumCopies key afile numcopies
2015-12-11 20:05:56 +00:00
]
2017-03-10 17:12:24 +00:00
where
afile = AssociatedFile ( Just file )
2019-06-06 16:53:24 +00:00
ai = mkActionItem ( key , afile )
2011-10-29 21:49:37 +00:00
2012-01-19 19:24:05 +00:00
{- To fsck a remote, the content is retrieved to a tmp file,
- and checked locally . - }
2016-11-16 19:32:49 +00:00
performRemote :: Key -> AssociatedFile -> Backend -> NumCopies -> Remote -> Annex Bool
performRemote key afile backend numcopies remote =
2012-03-14 21:43:34 +00:00
dispatch =<< Remote . hasKey remote key
2012-11-12 05:05:04 +00:00
where
dispatch ( Left err ) = do
showNote err
return False
2017-12-05 19:00:50 +00:00
dispatch ( Right True ) = withtmp $ \ tmpfile ->
getfile tmpfile >>= \ case
2015-04-27 21:40:21 +00:00
Nothing -> go True Nothing
Just True -> go True ( Just tmpfile )
Just False -> do
2015-02-10 17:10:58 +00:00
warning " failed to download file from remote "
2015-02-12 20:03:59 +00:00
void $ go True Nothing
2015-02-10 17:10:58 +00:00
return False
2012-11-12 05:05:04 +00:00
dispatch ( Right False ) = go False Nothing
go present localcopy = check
2017-03-10 18:12:39 +00:00
[ verifyLocationLogRemote key ai remote present
2018-02-08 18:08:41 +00:00
, verifyRequiredContent key ai
2017-03-10 18:12:39 +00:00
, withLocalCopy localcopy $ checkKeySizeRemote key remote ai
, withLocalCopy localcopy $ checkBackendRemote backend key remote ai
2016-11-16 19:32:49 +00:00
, checkKeyNumCopies key afile numcopies
2012-11-12 05:05:04 +00:00
]
2019-06-06 16:53:24 +00:00
ai = mkActionItem ( key , afile )
2012-11-12 05:05:04 +00:00
withtmp a = do
2020-02-14 18:52:15 +00:00
-- Put it in the gitAnnexTmpObjectDir since that's on a
-- filesystem where object temp files are normally
-- stored. The pid prevents multiple fsck processes
-- contending over the same file. (Multiple threads cannot,
-- because OnlyActionOn is used.)
2014-02-11 19:29:56 +00:00
pid <- liftIO getPID
2014-02-26 20:52:56 +00:00
t <- fromRepo gitAnnexTmpObjectDir
2012-11-12 05:05:04 +00:00
createAnnexDirectory t
2020-11-03 14:11:04 +00:00
let tmp = t P .</> " fsck " <> toRawFilePath ( show pid ) <> " . " <> keyFile key
let cleanup = liftIO $ catchIO ( R . removeLink tmp ) ( const noop )
2012-11-12 05:05:04 +00:00
cleanup
cleanup ` after ` a tmp
2020-11-06 18:10:58 +00:00
getfile tmp = ifM ( checkDiskSpace ( Just ( P . takeDirectory tmp ) ) key 0 True )
2020-05-13 21:05:56 +00:00
( ifM ( getcheap tmp )
2015-04-27 21:40:21 +00:00
( return ( Just True )
2012-11-12 05:05:04 +00:00
, ifM ( Annex . getState Annex . fast )
2015-04-27 21:40:21 +00:00
( return Nothing
2020-05-13 21:05:56 +00:00
, Just . isRight <$> tryNonAsync ( getfile' tmp )
2012-03-14 21:43:34 +00:00
)
2012-11-12 05:05:04 +00:00
)
2015-04-27 21:40:21 +00:00
, return ( Just False )
2015-04-18 18:23:34 +00:00
)
2020-11-03 14:11:04 +00:00
getfile' tmp = Remote . retrieveKeyFile remote key ( AssociatedFile Nothing ) ( fromRawFilePath tmp ) dummymeter
2013-04-11 21:15:45 +00:00
dummymeter _ = noop
2020-05-13 21:05:56 +00:00
getcheap tmp = case Remote . retrieveKeyFileCheap remote of
2020-11-03 14:11:04 +00:00
Just a -> isRight <$> tryNonAsync ( a key afile ( fromRawFilePath tmp ) )
2020-05-13 21:05:56 +00:00
Nothing -> return False
2012-01-19 19:24:05 +00:00
2020-09-14 20:49:33 +00:00
startKey :: Maybe Remote -> Incremental -> ( SeekInput , Key , ActionItem ) -> NumCopies -> CommandStart
startKey from inc ( si , key , ai ) numcopies =
2020-07-29 19:23:18 +00:00
Backend . maybeLookupBackendVariety ( fromKey keyVariety key ) >>= \ case
2014-02-20 18:45:17 +00:00
Nothing -> stop
2020-09-14 20:49:33 +00:00
Just backend -> runFsck inc si ai key $
2016-11-16 19:32:49 +00:00
case from of
Nothing -> performKey key backend numcopies
2017-03-10 17:12:24 +00:00
Just r -> performRemote key ( AssociatedFile Nothing ) backend numcopies r
2011-10-29 21:49:37 +00:00
2015-04-05 16:50:02 +00:00
performKey :: Key -> Backend -> NumCopies -> Annex Bool
2015-12-11 20:05:56 +00:00
performKey key backend numcopies = do
keystatus <- getKeyStatus key
check
2017-03-10 19:03:33 +00:00
[ verifyLocationLog key keystatus ( mkActionItem key )
, checkKeySize key keystatus ( mkActionItem key )
2017-03-10 17:12:24 +00:00
, checkBackend backend key keystatus ( AssociatedFile Nothing )
, checkKeyNumCopies key ( AssociatedFile Nothing ) numcopies
2015-12-11 20:05:56 +00:00
]
2011-10-29 21:49:37 +00:00
2012-09-25 19:06:33 +00:00
check :: [ Annex Bool ] -> Annex Bool
2013-09-25 07:09:06 +00:00
check cs = and <$> sequence cs
2012-03-10 18:46:21 +00:00
2019-01-14 19:19:20 +00:00
{- Checks that symlinks points correctly to the annexed content. -}
2019-12-04 17:15:34 +00:00
fixLink :: Key -> RawFilePath -> Annex Bool
2012-03-10 18:46:21 +00:00
fixLink key file = do
2020-11-03 14:11:04 +00:00
want <- calcRepo $ gitAnnexLink file key
fully support core.symlinks=false in all relevant symlink handling code
Refactored annex link code into nice clean new library.
Audited and dealt with calls to createSymbolicLink.
Remaining calls are all safe, because:
Annex/Link.hs: ( liftIO $ createSymbolicLink linktarget file
only when core.symlinks=true
Assistant/WebApp/Configurators/Local.hs: createSymbolicLink link link
test if symlinks can be made
Command/Fix.hs: liftIO $ createSymbolicLink link file
command only works in indirect mode
Command/FromKey.hs: liftIO $ createSymbolicLink link file
command only works in indirect mode
Command/Indirect.hs: liftIO $ createSymbolicLink l f
refuses to run if core.symlinks=false
Init.hs: createSymbolicLink f f2
test if symlinks can be made
Remote/Directory.hs: go [file] = catchBoolIO $ createSymbolicLink file f >> return True
fast key linking; catches failure to make symlink and falls back to copy
Remote/Git.hs: liftIO $ catchBoolIO $ createSymbolicLink loc file >> return True
ditto
Upgrade/V1.hs: liftIO $ createSymbolicLink link f
v1 repos could not be on a filesystem w/o symlinks
Audited and dealt with calls to readSymbolicLink.
Remaining calls are all safe, because:
Annex/Link.hs: ( liftIO $ catchMaybeIO $ readSymbolicLink file
only when core.symlinks=true
Assistant/Threads/Watcher.hs: ifM ((==) (Just link) <$> liftIO (catchMaybeIO $ readSymbolicLink file))
code that fixes real symlinks when inotify sees them
It's ok to not fix psdueo-symlinks.
Assistant/Threads/Watcher.hs: mlink <- liftIO (catchMaybeIO $ readSymbolicLink file)
ditto
Command/Fix.hs: stopUnless ((/=) (Just link) <$> liftIO (catchMaybeIO $ readSymbolicLink file)) $ do
command only works in indirect mode
Upgrade/V1.hs: getsymlink = takeFileName <$> readSymbolicLink file
v1 repos could not be on a filesystem w/o symlinks
Audited and dealt with calls to isSymbolicLink.
(Typically used with getSymbolicLinkStatus, but that is just used because
getFileStatus is not as robust; it also works on pseudolinks.)
Remaining calls are all safe, because:
Assistant/Threads/SanityChecker.hs: | isSymbolicLink s -> addsymlink file ms
only handles staging of symlinks that were somehow not staged
(might need to be updated to support pseudolinks, but this is
only a belt-and-suspenders check anyway, and I've never seen the code run)
Command/Add.hs: if isSymbolicLink s || not (isRegularFile s)
avoids adding symlinks to the annex, so not relevant
Command/Indirect.hs: | isSymbolicLink s -> void $ flip whenAnnexed f $
only allowed on systems that support symlinks
Command/Indirect.hs: whenM (liftIO $ not . isSymbolicLink <$> getSymbolicLinkStatus f) $ do
ditto
Seek.hs:notSymlink f = liftIO $ not . isSymbolicLink <$> getSymbolicLinkStatus f
used to find unlocked files, only relevant in indirect mode
Utility/FSEvents.hs: | Files.isSymbolicLink s = runhook addSymlinkHook $ Just s
Utility/FSEvents.hs: | Files.isSymbolicLink s ->
Utility/INotify.hs: | Files.isSymbolicLink s ->
Utility/INotify.hs: checkfiletype Files.isSymbolicLink addSymlinkHook f
Utility/Kqueue.hs: | Files.isSymbolicLink s = callhook addSymlinkHook (Just s) change
all above are lower-level, not relevant
Audited and dealt with calls to isSymLink.
Remaining calls are all safe, because:
Annex/Direct.hs: | isSymLink (getmode item) =
This is looking at git diff-tree objects, not files on disk
Command/Unused.hs: | isSymLink (LsTree.mode l) = do
This is looking at git ls-tree, not file on disk
Utility/FileMode.hs:isSymLink :: FileMode -> Bool
Utility/FileMode.hs:isSymLink = checkMode symbolicLinkMode
low-level
Done!!
2013-02-17 19:05:55 +00:00
have <- getAnnexLinkTarget file
2013-01-06 19:42:49 +00:00
maybe noop ( go want ) have
return True
where
2013-06-18 00:51:36 +00:00
go want have
2020-11-03 14:11:04 +00:00
| want /= fromInternalGitPath have = do
2013-06-18 00:51:36 +00:00
showNote " fixing link "
2020-11-03 14:11:04 +00:00
createWorkTreeDirectory ( parentDir file )
liftIO $ R . removeLink file
2013-06-18 00:51:36 +00:00
addAnnexLink want file
| otherwise = noop
2012-03-10 18:46:21 +00:00
2011-03-02 18:30:36 +00:00
{- Checks that the location log reflects the current status of the key,
2012-12-13 04:45:27 +00:00
- in this repository only . - }
2017-03-10 18:12:39 +00:00
verifyLocationLog :: Key -> KeyStatus -> ActionItem -> Annex Bool
verifyLocationLog key keystatus ai = do
2020-11-03 14:11:04 +00:00
obj <- calcRepo ( gitAnnexLocation key )
2019-08-26 19:52:19 +00:00
present <- if isKeyUnlockedThin keystatus
2020-11-03 14:11:04 +00:00
then liftIO ( doesFileExist ( fromRawFilePath obj ) )
2015-12-11 20:05:56 +00:00
else inAnnex key
2013-01-06 19:42:49 +00:00
u <- getUUID
2011-03-02 18:30:36 +00:00
2015-12-11 20:05:56 +00:00
{- Since we're checking that a key's object file is present, throw
2013-01-06 19:42:49 +00:00
- in a permission fixup here too . - }
2019-08-26 19:52:19 +00:00
when present $ do
2019-03-18 19:53:54 +00:00
void $ tryIO $ case keystatus of
2020-11-06 18:10:58 +00:00
KeyUnlockedThin -> thawContent obj
KeyLockedThin -> thawContent obj
_ -> freezeContent obj
2016-04-14 19:36:53 +00:00
unlessM ( isContentWritePermOk obj ) $
2020-11-03 14:11:04 +00:00
warning $ " ** Unable to set correct write mode for " ++ fromRawFilePath obj ++ " ; perhaps you don't own that file "
whenM ( liftIO $ R . doesPathExist $ parentDir obj ) $
2015-12-11 20:05:56 +00:00
freezeContentDir obj
2011-03-28 20:19:20 +00:00
2017-02-27 17:50:00 +00:00
{- Warn when annex.securehashesonly is set and content using an
- insecure hash is present . This should only be able to happen
- if the repository already contained the content before the
- config was set . - }
2020-07-29 19:23:18 +00:00
whenM ( pure present <&&> ( not <$> Backend . isCryptographicallySecure key ) ) $
2017-02-27 17:50:00 +00:00
whenM ( annexSecureHashesOnly <$> Annex . getGitConfig ) $
2020-11-03 14:11:04 +00:00
warning $ " ** Despite annex.securehashesonly being set, " ++ fromRawFilePath obj ++ " has content present in the annex using an insecure " ++ decodeBS ( formatKeyVariety ( fromKey keyVariety key ) ) ++ " key "
2017-02-27 17:50:00 +00:00
2019-08-27 16:26:52 +00:00
verifyLocationLog' key ai present u ( logChange key u )
2012-01-19 19:24:05 +00:00
2017-03-10 18:12:39 +00:00
verifyLocationLogRemote :: Key -> ActionItem -> Remote -> Bool -> Annex Bool
verifyLocationLogRemote key ai remote present =
verifyLocationLog' key ai present ( Remote . uuid remote )
2012-01-19 19:24:05 +00:00
( Remote . logStatus remote key )
2011-03-02 18:30:36 +00:00
2017-03-10 18:12:39 +00:00
verifyLocationLog' :: Key -> ActionItem -> Bool -> UUID -> ( LogStatus -> Annex () ) -> Annex Bool
verifyLocationLog' key ai present u updatestatus = do
2015-11-10 17:59:04 +00:00
uuids <- loggedLocations key
2011-03-02 18:30:36 +00:00
case ( present , u ` elem ` uuids ) of
( True , False ) -> do
2016-05-10 17:08:16 +00:00
fix InfoPresent
-- There is no data loss, so do not fail.
return True
2011-03-02 18:30:36 +00:00
( False , True ) -> do
2016-05-10 17:08:16 +00:00
fix InfoMissing
warning $
2017-03-10 18:12:39 +00:00
" ** Based on the location log, " ++
2019-12-04 17:15:34 +00:00
decodeBS' ( actionItemDesc ai ) ++
2017-03-10 18:12:39 +00:00
" \ n ** was expected to be present, " ++
2016-05-10 17:08:16 +00:00
" but its content is missing. "
return False
2016-05-10 17:20:45 +00:00
( False , False ) -> do
-- When the location log for the key is not present,
-- create it, so that the key will be known.
when ( null uuids ) $
whenM ( not <$> isKnownKey key ) $
updatestatus InfoMissing
return True
( True , True ) -> return True
2012-11-12 05:05:04 +00:00
where
fix s = do
showNote " fixing location log "
2013-12-01 19:52:30 +00:00
updatestatus s
2011-07-05 22:31:46 +00:00
2018-02-08 18:08:41 +00:00
{- Verifies that all repos that are required to contain the content do,
- checking against the location log . - }
verifyRequiredContent :: Key -> ActionItem -> Annex Bool
2019-06-06 16:53:24 +00:00
verifyRequiredContent key ai @ ( ActionItemAssociatedFile afile _ ) = do
2018-02-08 18:08:41 +00:00
requiredlocs <- S . fromList . M . keys <$> requiredContentMap
2018-02-08 18:16:00 +00:00
if S . null requiredlocs
2018-02-08 18:08:41 +00:00
then return True
else do
2018-02-08 18:16:00 +00:00
presentlocs <- S . fromList <$> loggedLocations key
missinglocs <- filterM
( \ u -> isRequiredContent ( Just u ) S . empty ( Just key ) afile False )
( S . toList $ S . difference requiredlocs presentlocs )
if null missinglocs
then return True
else do
missingrequired <- Remote . prettyPrintUUIDs " missingrequired " missinglocs
warning $
" ** Required content " ++
2019-12-04 17:15:34 +00:00
decodeBS' ( actionItemDesc ai ) ++
2018-02-08 18:16:00 +00:00
" is missing from these repositories: \ n " ++
missingrequired
return False
2018-02-08 18:08:41 +00:00
verifyRequiredContent _ _ = return True
2016-02-14 20:52:43 +00:00
{- Verifies the associated file records. -}
2019-12-04 17:15:34 +00:00
verifyAssociatedFiles :: Key -> KeyStatus -> RawFilePath -> Annex Bool
2016-02-14 21:09:54 +00:00
verifyAssociatedFiles key keystatus file = do
2019-08-26 19:52:19 +00:00
when ( isKeyUnlockedThin keystatus ) $ do
2019-12-09 17:49:05 +00:00
f <- inRepo $ toTopFilePath file
2019-03-18 19:53:54 +00:00
afs <- Database . Keys . getAssociatedFiles key
unless ( getTopFilePath f ` elem ` map getTopFilePath afs ) $
Database . Keys . addAssociatedFile key f
2019-08-26 19:52:19 +00:00
return True
2013-01-19 18:11:23 +00:00
2019-12-04 17:15:34 +00:00
verifyWorkTree :: Key -> RawFilePath -> Annex Bool
2016-02-14 21:27:50 +00:00
verifyWorkTree key file = do
{- Make sure that a pointer file is replaced with its content,
- when the content is available . - }
2019-08-26 19:52:19 +00:00
mk <- liftIO $ isPointerFile file
case mk of
Just k | k == key -> whenM ( inAnnex key ) $ do
showNote " fixing worktree content "
2020-03-06 15:31:01 +00:00
replaceWorkTreeFile ( fromRawFilePath file ) $ \ tmp -> do
2020-11-06 18:10:58 +00:00
let tmp' = toRawFilePath tmp
2019-12-06 18:44:42 +00:00
mode <- liftIO $ catchMaybeIO $ fileMode <$> R . getFileStatus file
2019-08-26 19:52:19 +00:00
ifM ( annexThin <$> Annex . getGitConfig )
2020-11-06 18:10:58 +00:00
( void $ linkFromAnnex key tmp' mode
2019-08-26 19:52:19 +00:00
, do
2020-11-06 18:10:58 +00:00
obj <- calcRepo ( gitAnnexLocation key )
void $ checkedCopyFile key obj tmp' mode
thawContent tmp'
2019-08-26 19:52:19 +00:00
)
2019-12-11 18:12:22 +00:00
Database . Keys . storeInodeCaches key [ file ]
2019-08-26 19:52:19 +00:00
_ -> return ()
return True
2013-06-24 20:26:00 +00:00
2011-07-05 22:31:46 +00:00
{- The size of the data for a key is checked against the size encoded in
2013-01-06 19:42:49 +00:00
- the key's metadata , if available .
-
2019-08-26 19:52:19 +00:00
- Not checked when a file is unlocked .
2014-10-09 19:09:26 +00:00
- }
2017-03-10 18:12:39 +00:00
checkKeySize :: Key -> KeyStatus -> ActionItem -> Annex Bool
2019-03-18 19:53:54 +00:00
checkKeySize _ KeyUnlockedThin _ = return True
2017-03-10 18:12:39 +00:00
checkKeySize key _ ai = do
2015-12-15 18:27:20 +00:00
file <- calcRepo $ gitAnnexLocation key
2019-12-11 18:12:22 +00:00
ifM ( liftIO $ R . doesPathExist file )
2020-11-03 14:11:04 +00:00
( checkKeySizeOr badContent key file ai
2015-12-15 18:27:20 +00:00
, return True
)
2012-01-19 19:24:05 +00:00
2020-11-03 14:11:04 +00:00
withLocalCopy :: Maybe RawFilePath -> ( RawFilePath -> Annex Bool ) -> Annex Bool
2017-03-10 16:09:52 +00:00
withLocalCopy Nothing _ = return True
withLocalCopy ( Just localcopy ) f = f localcopy
2020-11-03 14:11:04 +00:00
checkKeySizeRemote :: Key -> Remote -> ActionItem -> RawFilePath -> Annex Bool
2017-03-10 18:12:39 +00:00
checkKeySizeRemote key remote ai localcopy =
checkKeySizeOr ( badContentRemote remote localcopy ) key localcopy ai
2011-07-05 22:31:46 +00:00
2020-11-03 14:11:04 +00:00
checkKeySizeOr :: ( Key -> Annex String ) -> Key -> RawFilePath -> ActionItem -> Annex Bool
2019-11-22 20:24:04 +00:00
checkKeySizeOr bad key file ai = case fromKey keySize key of
2012-01-19 19:24:05 +00:00
Nothing -> return True
Just size -> do
2020-11-05 15:26:34 +00:00
size' <- liftIO $ getFileSize file
2012-03-14 21:43:34 +00:00
comparesizes size size'
2012-11-12 05:05:04 +00:00
where
comparesizes a b = do
let same = a == b
unless same $ badsize a b
return same
badsize a b = do
msg <- bad key
2017-03-10 18:12:39 +00:00
warning $ concat
2019-12-04 17:15:34 +00:00
[ decodeBS' ( actionItemDesc ai )
2017-03-10 18:12:39 +00:00
, " : Bad file size ( "
, compareSizes storageUnits True a b
, " ); "
, msg
2012-11-12 05:05:04 +00:00
]
2011-07-05 22:31:46 +00:00
2018-05-23 18:07:51 +00:00
{- Check for keys that are upgradable.
-
- Warns and suggests the user migrate , but does not migrate itself ,
- because migration can cause more disk space to be used , and makes
- worktree changes that need to be committed .
- }
checkKeyUpgrade :: Backend -> Key -> ActionItem -> AssociatedFile -> Annex Bool
checkKeyUpgrade backend key ai ( AssociatedFile ( Just file ) ) =
case Types . Backend . canUpgradeKey backend of
Just a | a key -> do
warning $ concat
2019-12-04 17:15:34 +00:00
[ decodeBS' ( actionItemDesc ai )
2018-05-23 18:07:51 +00:00
, " : Can be upgraded to an improved key format. "
, " You can do so by running: git annex migrate --backend= "
2019-11-22 20:24:04 +00:00
, decodeBS ( formatKeyVariety ( fromKey keyVariety key ) ) ++ " "
2019-12-04 17:15:34 +00:00
, decodeBS' file
2018-05-23 18:07:51 +00:00
]
return True
_ -> return True
checkKeyUpgrade _ _ _ ( AssociatedFile Nothing ) =
-- Don't suggest migrating without a filename, because
-- while possible to do, there is no actual benefit from
-- doing that in this situation.
return True
2015-12-11 20:05:56 +00:00
{- Runs the backend specific check on a key's content object.
-
- When a file is unlocked , it may be a hard link to the object ,
- thus when the user modifies the file , the object will be modified and
- not pass the check , and we don't want to find an error in this case .
- So , skip the check if the key is unlocked and modified .
2013-01-08 16:41:09 +00:00
- }
2017-03-08 19:15:20 +00:00
checkBackend :: Backend -> Key -> KeyStatus -> AssociatedFile -> Annex Bool
2019-08-26 19:52:19 +00:00
checkBackend backend key keystatus afile = do
2019-12-11 18:12:22 +00:00
content <- calcRepo ( gitAnnexLocation key )
2019-08-26 19:52:19 +00:00
ifM ( pure ( isKeyUnlockedThin keystatus ) <&&> ( not <$> isUnmodified key content ) )
( nocheck
2020-11-03 14:11:04 +00:00
, checkBackendOr badContent backend key content ai
2013-01-08 16:41:09 +00:00
)
2019-08-26 19:52:19 +00:00
where
2013-04-16 20:17:20 +00:00
nocheck = return True
2012-01-19 19:24:05 +00:00
2019-06-06 16:53:24 +00:00
ai = mkActionItem ( key , afile )
2020-11-03 14:11:04 +00:00
checkBackendRemote :: Backend -> Key -> Remote -> ActionItem -> RawFilePath -> Annex Bool
2017-03-10 18:12:39 +00:00
checkBackendRemote backend key remote ai localcopy =
checkBackendOr ( badContentRemote remote localcopy ) backend key localcopy ai
2012-01-19 19:24:05 +00:00
2020-11-03 14:11:04 +00:00
checkBackendOr :: ( Key -> Annex String ) -> Backend -> Key -> RawFilePath -> ActionItem -> Annex Bool
2017-03-10 18:12:39 +00:00
checkBackendOr bad backend key file ai =
checkBackendOr' bad backend key file ai ( return True )
2013-01-08 19:07:00 +00:00
2015-10-01 17:28:49 +00:00
-- The postcheck action is run after the content is verified,
-- in order to detect situations where the file is changed while being
2019-08-26 19:52:19 +00:00
-- verified.
2020-11-03 14:11:04 +00:00
checkBackendOr' :: ( Key -> Annex String ) -> Backend -> Key -> RawFilePath -> ActionItem -> Annex Bool -> Annex Bool
2017-03-10 18:12:39 +00:00
checkBackendOr' bad backend key file ai postcheck =
2015-10-01 17:28:49 +00:00
case Types . Backend . verifyKeyContent backend of
2012-09-16 05:17:48 +00:00
Nothing -> return True
2015-10-01 17:28:49 +00:00
Just verifier -> do
2020-11-05 15:26:34 +00:00
ok <- verifier key file
2013-01-08 19:07:00 +00:00
ifM postcheck
( do
unless ok $ do
msg <- bad key
2017-03-10 18:12:39 +00:00
warning $ concat
2019-12-04 17:15:34 +00:00
[ decodeBS' ( actionItemDesc ai )
2017-03-10 18:12:39 +00:00
, " : Bad file content; "
, msg
2017-03-08 19:15:20 +00:00
]
2013-01-08 19:07:00 +00:00
return ok
, return True
)
2011-10-31 16:33:41 +00:00
2015-06-09 18:08:57 +00:00
checkKeyNumCopies :: Key -> AssociatedFile -> NumCopies -> Annex Bool
checkKeyNumCopies key afile numcopies = do
2017-03-10 17:12:24 +00:00
let ( desc , hasafile ) = case afile of
2019-01-14 17:03:35 +00:00
AssociatedFile Nothing -> ( serializeKey key , False )
2019-12-04 17:15:34 +00:00
AssociatedFile ( Just af ) -> ( fromRawFilePath af , True )
2016-02-19 19:12:11 +00:00
locs <- loggedLocations key
( untrustedlocations , otherlocations ) <- trustPartition UnTrusted locs
( deadlocations , safelocations ) <- trustPartition DeadTrusted otherlocations
2014-01-21 20:08:19 +00:00
let present = NumCopies ( length safelocations )
2014-01-21 21:08:49 +00:00
if present < numcopies
2017-03-10 17:12:24 +00:00
then ifM ( pure ( not hasafile ) <&&> checkDead key )
2015-06-09 18:08:57 +00:00
( do
showLongNote $ " This key is dead, skipping. "
return True
, do
2016-02-19 19:12:11 +00:00
untrusted <- Remote . prettyPrintUUIDs " untrusted " untrustedlocations
dead <- Remote . prettyPrintUUIDs " dead " deadlocations
2017-03-10 17:12:24 +00:00
warning $ missingNote desc present numcopies untrusted dead
when ( fromNumCopies present == 0 && not hasafile ) $
2015-06-09 19:12:40 +00:00
showLongNote " (Avoid this check by running: git annex dead --key ) "
2015-06-09 18:08:57 +00:00
return False
)
2011-07-05 22:31:46 +00:00
else return True
2016-02-19 19:12:11 +00:00
missingNote :: String -> NumCopies -> NumCopies -> String -> String -> String
missingNote file ( NumCopies 0 ) _ [] dead =
" ** No known copies exist of " ++ file ++ honorDead dead
missingNote file ( NumCopies 0 ) _ untrusted dead =
2011-07-05 22:31:46 +00:00
" Only these untrusted locations may have copies of " ++ file ++
" \ n " ++ untrusted ++
2016-02-19 19:12:11 +00:00
" Back it up to trusted locations with git-annex copy. " ++ honorDead dead
missingNote file present needed [] _ =
2014-01-21 20:08:19 +00:00
" Only " ++ show ( fromNumCopies present ) ++ " of " ++ show ( fromNumCopies needed ) ++
2011-07-05 22:31:46 +00:00
" trustworthy copies exist of " ++ file ++
" \ n Back it up with git-annex copy. "
2016-02-19 19:12:11 +00:00
missingNote file present needed untrusted dead =
missingNote file present needed [] dead ++
2011-07-05 22:31:46 +00:00
" \ n The following untrusted locations may also have copies: " ++
" \ n " ++ untrusted
2016-02-19 19:12:11 +00:00
honorDead :: String -> String
honorDead dead
| null dead = " "
| otherwise = " \ n These dead repositories used to have copies \ n " ++ dead
2012-01-19 19:24:05 +00:00
{- Bad content is moved aside. -}
badContent :: Key -> Annex String
badContent key = do
2013-01-07 17:01:53 +00:00
dest <- moveBad key
2012-01-19 19:24:05 +00:00
return $ " moved to " ++ dest
2015-04-18 18:13:07 +00:00
{- Bad content is dropped from the remote. We have downloaded a copy
- from the remote to a temp file already ( in some cases , it's just a
- symlink to a file in the remote ) . To avoid any further data loss ,
- that temp file is moved to the bad content directory unless
- the local annex has a copy of the content . - }
2020-11-03 14:11:04 +00:00
badContentRemote :: Remote -> RawFilePath -> Key -> Annex String
2015-04-18 18:13:07 +00:00
badContentRemote remote localcopy key = do
bad <- fromRepo gitAnnexBadDir
2020-11-03 14:11:04 +00:00
let destbad = bad P .</> keyFile key
let destbad' = fromRawFilePath destbad
movedbad <- ifM ( inAnnex key <||> liftIO ( doesFileExist destbad' ) )
2015-04-18 18:13:07 +00:00
( return False
, do
createAnnexDirectory ( parentDir destbad )
liftIO $ catchDefaultIO False $
2020-11-03 14:11:04 +00:00
ifM ( isSymbolicLink <$> R . getSymbolicLinkStatus localcopy )
( copyFileExternal CopyTimeStamps ( fromRawFilePath localcopy ) destbad'
2015-04-18 18:13:07 +00:00
, do
2020-11-03 14:11:04 +00:00
moveFile ( fromRawFilePath localcopy ) destbad'
2015-04-18 18:13:07 +00:00
return True
)
)
2020-05-14 18:08:09 +00:00
dropped <- tryNonAsync ( Remote . removeKey remote key )
when ( isRight dropped ) $
bugfix: drop --from an unavailable remote no longer updates the location log, incorrectly, to say the remote does not have the key.
The comments correctly noted that the remote could drop the key and
yet False be returned due to some problem that occurred afterwards.
For example, if it's a network remote, it could drop the key just
as the network goes down, and so things timeout and a nonzero exit
from ssh is propigated through and False returned.
However... Most of the time, this scenario will not have happened.
False will mean the remote was not available or could not drop the key
at all.
So, instead of assuming the worst, just trust the status we have.
If we get it wrong, and the scenario above happened, our location
log will think the remote has the key. But the remote's location
log (assuming it has one) will know it dropped it, and the next sync
will regain consistency.
For a special remote, with no location log, our location log will be wrong,
but this is no different than the situation where someone else dropped
the key from the remote and we've not synced with them. The standard
paranoia about not trusting the location log to be the last word about
whether a remote has a key will save us from these situations. Ie,
if we try to drop the file, we'll actively check the remote,
and determine the inconsistency then.
2013-03-10 23:15:53 +00:00
Remote . logStatus remote key InfoMissing
2015-04-18 18:13:07 +00:00
return $ case ( movedbad , dropped ) of
2020-05-14 18:08:09 +00:00
( True , Right () ) -> " moved from " ++ Remote . name remote ++
2020-11-03 14:11:04 +00:00
" to " ++ fromRawFilePath destbad
2020-05-14 18:08:09 +00:00
( False , Right () ) -> " dropped from " ++ Remote . name remote
( _ , Left e ) -> " failed to drop from " ++ Remote . name remote ++ " : " ++ show e
2012-09-25 17:22:12 +00:00
2020-09-14 20:49:33 +00:00
runFsck :: Incremental -> SeekInput -> ActionItem -> Key -> Annex Bool -> CommandStart
runFsck inc si ai key a = stopUnless ( needFsck inc key ) $
starting " fsck " ( OnlyActionOn key ai ) si $ 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
ok <- a
when ok $
recordFsckTime inc key
next $ return ok
2012-09-25 19:06:33 +00:00
{- Check if a key needs to be fscked, with support for incremental fscks. -}
2012-09-25 19:45:17 +00:00
needFsck :: Incremental -> Key -> Annex Bool
2015-07-31 20:00:13 +00:00
needFsck ( ScheduleIncremental _ _ i ) k = needFsck i k
2015-02-16 20:04:23 +00:00
needFsck ( ContIncremental h ) key = liftIO $ not <$> FsckDb . inDb h key
2012-09-25 19:45:17 +00:00
needFsck _ _ = return True
2012-09-25 19:06:33 +00:00
2015-02-16 19:08:29 +00:00
recordFsckTime :: Incremental -> Key -> Annex ()
2015-02-16 20:48:19 +00:00
recordFsckTime inc key = withFsckDb inc $ \ h -> liftIO $ FsckDb . addDb h key
2012-09-25 18:16:34 +00:00
2013-05-19 18:46:48 +00:00
{- Records the start time of an incremental fsck.
2012-09-25 18:16:34 +00:00
-
- To guard against time stamp damange ( for example , if an annex directory
- is copied without - a ) , the fsckstate file contains a time that should
2014-02-13 16:40:10 +00:00
- be identical to its modification time .
2014-02-25 18:09:39 +00:00
- ( This is not possible to do on Windows , and so the timestamp in
- the file will only be equal or greater than the modification time . )
2014-02-13 16:40:10 +00:00
- }
2015-02-17 21:08:11 +00:00
recordStartTime :: UUID -> Annex ()
recordStartTime u = do
f <- fromRepo ( gitAnnexFsckState u )
2015-01-09 17:11:56 +00:00
createAnnexDirectory $ parentDir f
2020-11-03 14:11:04 +00:00
liftIO $ removeWhenExistsWith R . removeLink f
2020-11-06 18:10:58 +00:00
liftIO $ withFile ( fromRawFilePath f ) WriteMode $ \ h -> do
2014-02-13 16:40:10 +00:00
# ifndef mingw32_HOST_OS
2020-11-03 14:11:04 +00:00
t <- modificationTime <$> R . getFileStatus f
2014-02-13 16:40:10 +00:00
# else
2018-01-02 21:17:10 +00:00
t <- getPOSIXTime
2014-02-13 16:40:10 +00:00
# endif
2018-01-02 21:17:10 +00:00
hPutStr h $ showTime $ realToFrac t
2020-11-06 18:10:58 +00:00
setAnnexFilePerm f
2012-11-12 05:05:04 +00:00
where
showTime :: POSIXTime -> String
showTime = show
2012-09-25 18:16:34 +00:00
2015-02-17 21:08:11 +00:00
resetStartTime :: UUID -> Annex ()
2020-11-03 14:11:04 +00:00
resetStartTime u = liftIO . removeWhenExistsWith R . removeLink
2020-10-29 14:33:12 +00:00
=<< fromRepo ( gitAnnexFsckState u )
2012-09-25 23:37:34 +00:00
2012-09-25 18:16:34 +00:00
{- Gets the incremental fsck start time. -}
2015-02-17 21:08:11 +00:00
getStartTime :: UUID -> Annex ( Maybe EpochTime )
getStartTime u = do
f <- fromRepo ( gitAnnexFsckState u )
2012-09-25 18:16:34 +00:00
liftIO $ catchDefaultIO Nothing $ do
2020-11-03 14:11:04 +00:00
timestamp <- modificationTime <$> R . getFileStatus f
2014-02-25 18:09:39 +00:00
let fromstatus = Just ( realToFrac timestamp )
2020-11-03 14:11:04 +00:00
fromfile <- parsePOSIXTime <$> readFile ( fromRawFilePath f )
2014-02-25 18:09:39 +00:00
return $ if matchingtimestamp fromfile fromstatus
2012-09-25 18:16:34 +00:00
then Just timestamp
else Nothing
2012-11-12 05:05:04 +00:00
where
2014-02-25 18:09:39 +00:00
matchingtimestamp fromfile fromstatus =
# ifndef mingw32_HOST_OS
fromfile == fromstatus
# else
fromfile >= fromstatus
# endif
2015-04-01 21:53:16 +00:00
2015-07-25 21:37:09 +00:00
data Incremental
= NonIncremental
2015-08-23 22:39:29 +00:00
| ScheduleIncremental Duration UUID Incremental
2015-07-25 21:37:09 +00:00
| StartIncremental FsckDb . FsckHandle
2015-07-31 20:00:13 +00:00
| ContIncremental FsckDb . FsckHandle
2015-04-01 21:53:16 +00:00
2015-07-09 16:26:25 +00:00
prepIncremental :: UUID -> Maybe IncrementalOpt -> Annex Incremental
prepIncremental _ Nothing = pure NonIncremental
prepIncremental u ( Just StartIncrementalO ) = do
recordStartTime u
ifM ( FsckDb . newPass u )
2015-07-31 20:00:13 +00:00
( StartIncremental <$> openFsckDb u
2016-11-16 01:29:54 +00:00
, giveup " Cannot start a new --incremental fsck pass; another fsck process is already running. "
2015-07-09 16:26:25 +00:00
)
prepIncremental u ( Just MoreIncrementalO ) =
2015-07-31 20:00:13 +00:00
ContIncremental <$> openFsckDb u
2015-07-09 16:26:25 +00:00
prepIncremental u ( Just ( ScheduleIncrementalO delta ) ) = do
started <- getStartTime u
2015-07-31 20:00:13 +00:00
i <- prepIncremental u $ Just $ case started of
2015-07-09 16:26:25 +00:00
Nothing -> StartIncrementalO
Just _ -> MoreIncrementalO
2015-07-31 20:00:13 +00:00
return ( ScheduleIncremental delta u i )
2015-07-25 21:37:09 +00:00
cleanupIncremental :: Incremental -> Annex ()
2015-07-31 20:00:13 +00:00
cleanupIncremental ( ScheduleIncremental delta u i ) = do
v <- getStartTime u
case v of
Nothing -> noop
Just started -> do
now <- liftIO getPOSIXTime
when ( now - realToFrac started >= durationToPOSIXTime delta ) $
resetStartTime u
cleanupIncremental i
2015-07-25 21:37:09 +00:00
cleanupIncremental _ = return ()
2015-07-31 20:00:13 +00:00
openFsckDb :: UUID -> Annex FsckDb . FsckHandle
openFsckDb u = do
h <- FsckDb . openDb u
2020-12-11 19:28:58 +00:00
Annex . addCleanupAction FsckCleanup $
2015-07-31 20:00:13 +00:00
FsckDb . closeDb h
return h
withFsckDb :: Incremental -> ( FsckDb . FsckHandle -> Annex () ) -> Annex ()
withFsckDb ( ContIncremental h ) a = a h
withFsckDb ( StartIncremental h ) a = a h
withFsckDb NonIncremental _ = noop
withFsckDb ( ScheduleIncremental _ _ i ) a = withFsckDb i a
2015-12-11 20:05:56 +00:00
2019-03-18 19:53:54 +00:00
data KeyStatus
= KeyMissing
| KeyPresent
| KeyUnlockedThin
-- ^ An annex.thin worktree file is hard linked to the object.
| KeyLockedThin
-- ^ The object has hard links, but the file being fscked
-- is not the one that hard links to it.
deriving ( Show )
isKeyUnlockedThin :: KeyStatus -> Bool
isKeyUnlockedThin KeyUnlockedThin = True
isKeyUnlockedThin KeyLockedThin = False
isKeyUnlockedThin KeyPresent = False
isKeyUnlockedThin KeyMissing = False
2015-12-11 20:05:56 +00:00
getKeyStatus :: Key -> Annex KeyStatus
2019-08-26 19:52:19 +00:00
getKeyStatus key = catchDefaultIO KeyMissing $ do
afs <- not . null <$> Database . Keys . getAssociatedFiles key
2019-12-11 18:12:22 +00:00
obj <- calcRepo ( gitAnnexLocation key )
multilink <- ( ( > 1 ) . linkCount <$> liftIO ( R . getFileStatus obj ) )
2019-08-26 19:52:19 +00:00
return $ if multilink && afs
then KeyUnlockedThin
else KeyPresent
2016-02-14 21:09:54 +00:00
getKeyFileStatus :: Key -> FilePath -> Annex KeyStatus
getKeyFileStatus key file = do
s <- getKeyStatus key
case s of
2019-03-18 19:53:54 +00:00
KeyUnlockedThin -> catchDefaultIO KeyUnlockedThin $
2019-12-04 17:15:34 +00:00
ifM ( isJust <$> isAnnexLink ( toRawFilePath file ) )
2019-03-18 19:53:54 +00:00
( return KeyLockedThin
, return KeyUnlockedThin
2016-02-14 21:09:54 +00:00
)
_ -> return s
2019-03-18 19:53:54 +00:00