2011-06-21 20:08:09 +00:00
|
|
|
{- management of the git-annex branch
|
code to update a git-annex branch
There is no suitable git hook to run code when pulling changes that
might need to be merged into the git-annex branch. The post-merge hook
is only run when changes are merged into HEAD, and it's possible,
and indeed likely that many pulls will only have changes in git-annex,
but not in HEAD, and not trigger it.
So, git-annex will have to take care to update the branch before reading
from it, to make sure it has merged in current info from remotes. Happily,
this can be done quite inexpensively, just a git-show-ref to list
branches, and a minimalized git-log to see if there are unmerged changes
on the branches. To further speed up, it will be done only once per
git-annex run, max.
2011-06-21 18:29:09 +00:00
|
|
|
-
|
2012-02-14 18:35:52 +00:00
|
|
|
- Copyright 2011-2012 Joey Hess <joey@kitenet.net>
|
code to update a git-annex branch
There is no suitable git hook to run code when pulling changes that
might need to be merged into the git-annex branch. The post-merge hook
is only run when changes are merged into HEAD, and it's possible,
and indeed likely that many pulls will only have changes in git-annex,
but not in HEAD, and not trigger it.
So, git-annex will have to take care to update the branch before reading
from it, to make sure it has merged in current info from remotes. Happily,
this can be done quite inexpensively, just a git-show-ref to list
branches, and a minimalized git-log to see if there are unmerged changes
on the branches. To further speed up, it will be done only once per
git-annex run, max.
2011-06-21 18:29:09 +00:00
|
|
|
-
|
|
|
|
- Licensed under the GNU GPL version 3 or higher.
|
|
|
|
-}
|
|
|
|
|
2013-02-22 18:47:29 +00:00
|
|
|
{-# LANGUAGE CPP #-}
|
|
|
|
|
2011-10-04 04:40:47 +00:00
|
|
|
module Annex.Branch (
|
2012-01-06 19:40:04 +00:00
|
|
|
fullname,
|
2011-12-13 01:12:51 +00:00
|
|
|
name,
|
|
|
|
hasOrigin,
|
|
|
|
hasSibling,
|
2011-12-30 19:57:28 +00:00
|
|
|
siblingBranches,
|
2011-06-22 19:58:30 +00:00
|
|
|
create,
|
2011-06-21 20:08:09 +00:00
|
|
|
update,
|
2011-12-30 19:57:28 +00:00
|
|
|
forceUpdate,
|
|
|
|
updateTo,
|
2011-06-21 23:11:55 +00:00
|
|
|
get,
|
|
|
|
change,
|
2011-06-22 21:47:06 +00:00
|
|
|
commit,
|
2011-06-24 15:59:34 +00:00
|
|
|
files,
|
2011-06-21 20:08:09 +00:00
|
|
|
) where
|
code to update a git-annex branch
There is no suitable git hook to run code when pulling changes that
might need to be merged into the git-annex branch. The post-merge hook
is only run when changes are merged into HEAD, and it's possible,
and indeed likely that many pulls will only have changes in git-annex,
but not in HEAD, and not trigger it.
So, git-annex will have to take care to update the branch before reading
from it, to make sure it has merged in current info from remotes. Happily,
this can be done quite inexpensively, just a git-show-ref to list
branches, and a minimalized git-log to see if there are unmerged changes
on the branches. To further speed up, it will be done only once per
git-annex run, max.
2011-06-21 18:29:09 +00:00
|
|
|
|
2011-09-30 03:43:42 +00:00
|
|
|
import qualified Data.ByteString.Lazy.Char8 as L
|
2013-02-22 18:47:29 +00:00
|
|
|
import System.Posix.Env
|
code to update a git-annex branch
There is no suitable git hook to run code when pulling changes that
might need to be merged into the git-annex branch. The post-merge hook
is only run when changes are merged into HEAD, and it's possible,
and indeed likely that many pulls will only have changes in git-annex,
but not in HEAD, and not trigger it.
So, git-annex will have to take care to update the branch before reading
from it, to make sure it has merged in current info from remotes. Happily,
this can be done quite inexpensively, just a git-show-ref to list
branches, and a minimalized git-log to see if there are unmerged changes
on the branches. To further speed up, it will be done only once per
git-annex run, max.
2011-06-21 18:29:09 +00:00
|
|
|
|
2011-10-05 20:02:51 +00:00
|
|
|
import Common.Annex
|
2011-12-12 21:38:46 +00:00
|
|
|
import Annex.BranchState
|
2011-12-12 22:03:28 +00:00
|
|
|
import Annex.Journal
|
2011-06-30 17:16:57 +00:00
|
|
|
import qualified Git
|
2011-12-14 19:56:11 +00:00
|
|
|
import qualified Git.Command
|
2011-12-12 22:23:24 +00:00
|
|
|
import qualified Git.Ref
|
2011-12-13 01:12:51 +00:00
|
|
|
import qualified Git.Branch
|
2011-12-13 01:24:55 +00:00
|
|
|
import qualified Git.UnionMerge
|
2012-06-06 04:03:08 +00:00
|
|
|
import qualified Git.UpdateIndex
|
2012-02-14 18:35:52 +00:00
|
|
|
import Git.HashObject
|
2012-06-06 18:29:10 +00:00
|
|
|
import Git.Types
|
|
|
|
import Git.FilePath
|
2011-10-04 04:40:47 +00:00
|
|
|
import Annex.CatFile
|
2012-04-21 20:59:49 +00:00
|
|
|
import Annex.Perms
|
2012-08-25 00:50:39 +00:00
|
|
|
import qualified Annex
|
code to update a git-annex branch
There is no suitable git hook to run code when pulling changes that
might need to be merged into the git-annex branch. The post-merge hook
is only run when changes are merged into HEAD, and it's possible,
and indeed likely that many pulls will only have changes in git-annex,
but not in HEAD, and not trigger it.
So, git-annex will have to take care to update the branch before reading
from it, to make sure it has merged in current info from remotes. Happily,
this can be done quite inexpensively, just a git-show-ref to list
branches, and a minimalized git-log to see if there are unmerged changes
on the branches. To further speed up, it will be done only once per
git-annex run, max.
2011-06-21 18:29:09 +00:00
|
|
|
|
2011-06-21 21:39:45 +00:00
|
|
|
{- Name of the branch that is used to store git-annex's information. -}
|
improve type signatures with a Ref newtype
In git, a Ref can be a Sha, or a Branch, or a Tag. I added type aliases for
those. Note that this does not prevent mixing up of eg, refs and branches
at the type level. Since git really doesn't care, except rare cases like
git update-ref, or git tag -d, that seems ok for now.
There's also a tree-ish, but let's just use Ref for it. A given Sha or Ref
may or may not be a tree-ish, depending on the object type, so there seems
no point in trying to represent it at the type level.
2011-11-16 06:23:34 +00:00
|
|
|
name :: Git.Ref
|
|
|
|
name = Git.Ref "git-annex"
|
code to update a git-annex branch
There is no suitable git hook to run code when pulling changes that
might need to be merged into the git-annex branch. The post-merge hook
is only run when changes are merged into HEAD, and it's possible,
and indeed likely that many pulls will only have changes in git-annex,
but not in HEAD, and not trigger it.
So, git-annex will have to take care to update the branch before reading
from it, to make sure it has merged in current info from remotes. Happily,
this can be done quite inexpensively, just a git-show-ref to list
branches, and a minimalized git-log to see if there are unmerged changes
on the branches. To further speed up, it will be done only once per
git-annex run, max.
2011-06-21 18:29:09 +00:00
|
|
|
|
2011-06-21 21:39:45 +00:00
|
|
|
{- Fully qualified name of the branch. -}
|
improve type signatures with a Ref newtype
In git, a Ref can be a Sha, or a Branch, or a Tag. I added type aliases for
those. Note that this does not prevent mixing up of eg, refs and branches
at the type level. Since git really doesn't care, except rare cases like
git update-ref, or git tag -d, that seems ok for now.
There's also a tree-ish, but let's just use Ref for it. A given Sha or Ref
may or may not be a tree-ish, depending on the object type, so there seems
no point in trying to represent it at the type level.
2011-11-16 06:23:34 +00:00
|
|
|
fullname :: Git.Ref
|
|
|
|
fullname = Git.Ref $ "refs/heads/" ++ show name
|
code to update a git-annex branch
There is no suitable git hook to run code when pulling changes that
might need to be merged into the git-annex branch. The post-merge hook
is only run when changes are merged into HEAD, and it's possible,
and indeed likely that many pulls will only have changes in git-annex,
but not in HEAD, and not trigger it.
So, git-annex will have to take care to update the branch before reading
from it, to make sure it has merged in current info from remotes. Happily,
this can be done quite inexpensively, just a git-show-ref to list
branches, and a minimalized git-log to see if there are unmerged changes
on the branches. To further speed up, it will be done only once per
git-annex run, max.
2011-06-21 18:29:09 +00:00
|
|
|
|
2011-06-24 15:59:34 +00:00
|
|
|
{- Branch's name in origin. -}
|
improve type signatures with a Ref newtype
In git, a Ref can be a Sha, or a Branch, or a Tag. I added type aliases for
those. Note that this does not prevent mixing up of eg, refs and branches
at the type level. Since git really doesn't care, except rare cases like
git update-ref, or git tag -d, that seems ok for now.
There's also a tree-ish, but let's just use Ref for it. A given Sha or Ref
may or may not be a tree-ish, depending on the object type, so there seems
no point in trying to represent it at the type level.
2011-11-16 06:23:34 +00:00
|
|
|
originname :: Git.Ref
|
|
|
|
originname = Git.Ref $ "origin/" ++ show name
|
2011-06-24 15:59:34 +00:00
|
|
|
|
2011-12-13 01:12:51 +00:00
|
|
|
{- Does origin/git-annex exist? -}
|
|
|
|
hasOrigin :: Annex Bool
|
|
|
|
hasOrigin = inRepo $ Git.Ref.exists originname
|
slow, stupid, and safe index updating
Always merge the git-annex branch into .git/annex/index before making a
commit from the index.
This ensures that, when the branch has been changed in any way
(by a push being received, or changes pulled directly into it, or
even by the user checking it out, and committing a change), the index
reflects those changes.
This is much too slow; it needs to be optimised to only update the
index when the branch has really changed, not every time.
Also, there is an unhandled race, when a change is made to the branch
right after the index gets updated. I left it in for now because it's
unlikely and I didn't want to complicate things with additional locking
yet.
2011-12-11 18:51:20 +00:00
|
|
|
|
2011-12-13 01:12:51 +00:00
|
|
|
{- Does the git-annex branch or a sibling foo/git-annex branch exist? -}
|
|
|
|
hasSibling :: Annex Bool
|
|
|
|
hasSibling = not . null <$> siblingBranches
|
2011-06-21 21:39:45 +00:00
|
|
|
|
2011-12-13 01:12:51 +00:00
|
|
|
{- List of git-annex (refs, branches), including the main one and any
|
|
|
|
- from remotes. Duplicate refs are filtered out. -}
|
|
|
|
siblingBranches :: Annex [(Git.Ref, Git.Branch)]
|
2011-12-30 22:36:40 +00:00
|
|
|
siblingBranches = inRepo $ Git.Ref.matchingUniq name
|
2011-06-22 19:58:30 +00:00
|
|
|
|
|
|
|
{- Creates the branch, if it does not already exist. -}
|
|
|
|
create :: Annex ()
|
2012-06-12 15:32:06 +00:00
|
|
|
create = void getBranch
|
2011-12-12 07:30:47 +00:00
|
|
|
|
|
|
|
{- Returns the ref of the branch, creating it first if necessary. -}
|
2012-01-10 19:36:54 +00:00
|
|
|
getBranch :: Annex Git.Ref
|
|
|
|
getBranch = maybe (hasOrigin >>= go >>= use) return =<< branchsha
|
2012-12-13 04:24:19 +00:00
|
|
|
where
|
|
|
|
go True = do
|
2013-03-03 17:39:07 +00:00
|
|
|
inRepo $ Git.Command.run
|
|
|
|
[Param "branch", Param $ show name, Param $ show originname]
|
2012-12-13 04:24:19 +00:00
|
|
|
fromMaybe (error $ "failed to create " ++ show name)
|
|
|
|
<$> branchsha
|
|
|
|
go False = withIndex' True $
|
|
|
|
inRepo $ Git.Branch.commit "branch created" fullname []
|
|
|
|
use sha = do
|
|
|
|
setIndexSha sha
|
|
|
|
return sha
|
|
|
|
branchsha = inRepo $ Git.Ref.sha fullname
|
2011-06-22 18:18:49 +00:00
|
|
|
|
2012-09-15 19:40:13 +00:00
|
|
|
{- Ensures that the branch and index are up-to-date; should be
|
2012-09-15 23:47:23 +00:00
|
|
|
- called before data is read from it. Runs only once per git-annex run. -}
|
2011-12-30 19:57:28 +00:00
|
|
|
update :: Annex ()
|
avoid unnecessary transfer scans when syncing a disconnected remote
Found a very cheap way to determine when a disconnected remote has
diverged, and has new content that needs to be transferred: Piggyback on
the git-annex branch update, which already checks for divergence.
However, this does not check if new content has appeared locally while
disconnected, that should be transferred to the remote.
Also, this does not handle cases where the two git repos are in sync,
but their content syncing has not caught up yet.
This code could have its efficiency improved:
* When multiple remotes are synced, if any one has diverged, they're
all queued for transfer scans.
* The transfer scanner could be told whether the remote has new content,
the local repo has new content, or both, and could optimise its scan
accordingly.
2012-08-22 18:51:11 +00:00
|
|
|
update = runUpdateOnce $ void $ updateTo =<< siblingBranches
|
2011-12-30 19:57:28 +00:00
|
|
|
|
|
|
|
{- Forces an update even if one has already been run. -}
|
avoid unnecessary transfer scans when syncing a disconnected remote
Found a very cheap way to determine when a disconnected remote has
diverged, and has new content that needs to be transferred: Piggyback on
the git-annex branch update, which already checks for divergence.
However, this does not check if new content has appeared locally while
disconnected, that should be transferred to the remote.
Also, this does not handle cases where the two git repos are in sync,
but their content syncing has not caught up yet.
This code could have its efficiency improved:
* When multiple remotes are synced, if any one has diverged, they're
all queued for transfer scans.
* The transfer scanner could be told whether the remote has new content,
the local repo has new content, or both, and could optimise its scan
accordingly.
2012-08-22 18:51:11 +00:00
|
|
|
forceUpdate :: Annex Bool
|
2011-12-30 19:57:28 +00:00
|
|
|
forceUpdate = updateTo =<< siblingBranches
|
|
|
|
|
|
|
|
{- Merges the specified Refs into the index, if they have any changes not
|
|
|
|
- already in it. The Branch names are only used in the commit message;
|
|
|
|
- it's even possible that the provided Branches have not been updated to
|
|
|
|
- point to the Refs yet.
|
2012-09-15 22:34:46 +00:00
|
|
|
-
|
|
|
|
- The branch is fast-forwarded if possible, otherwise a merge commit is
|
|
|
|
- made.
|
2011-10-09 20:19:09 +00:00
|
|
|
-
|
2012-09-15 22:34:46 +00:00
|
|
|
- Before Refs are merged into the index, it's important to first stage the
|
merge: Use fast-forward merges when possible.
Thanks Valentin Haenel for a test case showing how non-fast-forward merges
could result in an ongoing pull/merge/push cycle.
While the git-annex branch is fast-forwarded, git-annex's index file is still
updated using the union merge strategy as before. There's no other way to
update the index that would be any faster.
It is possible that a union merge and a fast-forward result in different file
contents: Files should have the same lines, but a union merge may change
their order. If this happens, the next commit made to the git-annex branch
will have some unnecessary changes to line orders, but the consistency
of data should be preserved.
Note that when the journal contains changes, a fast-forward is never attempted,
which is fine, because committing those changes would be vanishingly unlikely
to leave the git-annex branch at a commit that already exists in one of
the remotes.
The real difficulty is handling the case where multiple remotes have all
changed. git-annex does find the best (ie, newest) one and fast forwards
to it. If the remotes are diverged, no fast-forward is done at all. It would
be possible to pick one, fast forward to it, and make a merge commit to
the rest, I see no benefit to adding that complexity.
Determining the best of N changed remotes requires N*2+1 calls to git-log, but
these are fast git-log calls, and N is typically small. Also, typically
some or all of the remote refs will be the same, and git-log is not called to
compare those. In the real world I expect this will almost always add only
1 git-log call to the merge process. (Which already makes N anyway.)
2011-11-06 19:18:45 +00:00
|
|
|
- journal into the index. Otherwise, any changes in the journal would
|
|
|
|
- later get staged, and might overwrite changes made during the merge.
|
2012-09-15 22:34:46 +00:00
|
|
|
- This is only done if some of the Refs do need to be merged.
|
2011-10-09 20:19:09 +00:00
|
|
|
-
|
avoid unnecessary transfer scans when syncing a disconnected remote
Found a very cheap way to determine when a disconnected remote has
diverged, and has new content that needs to be transferred: Piggyback on
the git-annex branch update, which already checks for divergence.
However, this does not check if new content has appeared locally while
disconnected, that should be transferred to the remote.
Also, this does not handle cases where the two git repos are in sync,
but their content syncing has not caught up yet.
This code could have its efficiency improved:
* When multiple remotes are synced, if any one has diverged, they're
all queued for transfer scans.
* The transfer scanner could be told whether the remote has new content,
the local repo has new content, or both, and could optimise its scan
accordingly.
2012-08-22 18:51:11 +00:00
|
|
|
- Returns True if any refs were merged in, False otherwise.
|
2011-10-09 20:19:09 +00:00
|
|
|
-}
|
avoid unnecessary transfer scans when syncing a disconnected remote
Found a very cheap way to determine when a disconnected remote has
diverged, and has new content that needs to be transferred: Piggyback on
the git-annex branch update, which already checks for divergence.
However, this does not check if new content has appeared locally while
disconnected, that should be transferred to the remote.
Also, this does not handle cases where the two git repos are in sync,
but their content syncing has not caught up yet.
This code could have its efficiency improved:
* When multiple remotes are synced, if any one has diverged, they're
all queued for transfer scans.
* The transfer scanner could be told whether the remote has new content,
the local repo has new content, or both, and could optimise its scan
accordingly.
2012-08-22 18:51:11 +00:00
|
|
|
updateTo :: [(Git.Ref, Git.Branch)] -> Annex Bool
|
2011-12-30 19:57:28 +00:00
|
|
|
updateTo pairs = do
|
2011-12-12 07:30:47 +00:00
|
|
|
-- ensure branch exists, and get its current ref
|
|
|
|
branchref <- getBranch
|
2012-09-15 23:47:23 +00:00
|
|
|
dirty <- journalDirty
|
2011-12-30 19:57:28 +00:00
|
|
|
(refs, branches) <- unzip <$> filterM isnewer pairs
|
2012-09-15 22:34:46 +00:00
|
|
|
if null refs
|
2012-12-13 04:45:27 +00:00
|
|
|
{- Even when no refs need to be merged, the index
|
2012-09-15 23:47:23 +00:00
|
|
|
- may still be updated if the branch has gotten ahead
|
|
|
|
- of the index. -}
|
|
|
|
then whenM (needUpdateIndex branchref) $ lockJournal $ do
|
2012-09-15 22:34:46 +00:00
|
|
|
forceUpdateIndex branchref
|
2012-09-15 23:47:23 +00:00
|
|
|
{- When there are journalled changes
|
|
|
|
- as well as the branch being updated,
|
|
|
|
- a commit needs to be done. -}
|
|
|
|
when dirty $
|
|
|
|
go branchref True [] []
|
|
|
|
else lockJournal $ go branchref dirty refs branches
|
|
|
|
return $ not $ null refs
|
2012-12-13 04:24:19 +00:00
|
|
|
where
|
|
|
|
isnewer (r, _) = inRepo $ Git.Branch.changed fullname r
|
|
|
|
go branchref dirty refs branches = withIndex $ do
|
|
|
|
cleanjournal <- if dirty then stageJournal else return noop
|
|
|
|
let merge_desc = if null branches
|
|
|
|
then "update"
|
|
|
|
else "merging " ++
|
|
|
|
unwords (map Git.Ref.describe branches) ++
|
|
|
|
" into " ++ show name
|
|
|
|
unless (null branches) $ do
|
|
|
|
showSideAction merge_desc
|
|
|
|
mergeIndex refs
|
|
|
|
ff <- if dirty
|
|
|
|
then return False
|
|
|
|
else inRepo $ Git.Branch.fastForward fullname refs
|
|
|
|
if ff
|
|
|
|
then updateIndex branchref
|
|
|
|
else commitBranch branchref merge_desc
|
|
|
|
(nub $ fullname:refs)
|
|
|
|
liftIO cleanjournal
|
2011-06-23 15:37:26 +00:00
|
|
|
|
2012-09-15 22:34:46 +00:00
|
|
|
{- Gets the content of a file, which may be in the journal, or committed
|
|
|
|
- to the branch. Due to limitatons of git cat-file, does *not* get content
|
|
|
|
- that has only been staged to the index.
|
|
|
|
-
|
|
|
|
- Updates the branch if necessary, to ensure the most up-to-date available
|
|
|
|
- content is available.
|
2011-06-23 15:37:26 +00:00
|
|
|
-
|
|
|
|
- Returns an empty string if the file doesn't exist yet. -}
|
2011-06-21 21:39:45 +00:00
|
|
|
get :: FilePath -> Annex String
|
2011-11-12 19:15:57 +00:00
|
|
|
get = get' False
|
|
|
|
|
|
|
|
{- Like get, but does not merge the branch, so the info returned may not
|
|
|
|
- reflect changes in remotes. (Changing the value this returns, and then
|
|
|
|
- merging is always the same as using get, and then changing its value.) -}
|
|
|
|
getStale :: FilePath -> Annex String
|
|
|
|
getStale = get' True
|
|
|
|
|
|
|
|
get' :: Bool -> FilePath -> Annex String
|
2012-10-19 18:25:15 +00:00
|
|
|
get' staleok file = fromjournal =<< getJournalFile file
|
2012-12-13 04:24:19 +00:00
|
|
|
where
|
|
|
|
fromjournal (Just content) = return content
|
|
|
|
fromjournal Nothing
|
|
|
|
| staleok = withIndex frombranch
|
|
|
|
| otherwise = do
|
|
|
|
update
|
|
|
|
frombranch
|
|
|
|
frombranch = withIndex $ L.unpack <$> catFile fullname file
|
2011-06-30 01:23:40 +00:00
|
|
|
|
2011-12-13 01:12:51 +00:00
|
|
|
{- Applies a function to modifiy the content of a file.
|
|
|
|
-
|
|
|
|
- Note that this does not cause the branch to be merged, it only
|
|
|
|
- modifes the current content of the file on the branch.
|
|
|
|
-}
|
|
|
|
change :: FilePath -> (String -> String) -> Annex ()
|
2012-02-16 04:41:30 +00:00
|
|
|
change file a = lockJournal $ a <$> getStale file >>= set file
|
2011-12-13 01:12:51 +00:00
|
|
|
|
2012-10-19 18:25:15 +00:00
|
|
|
{- Records new content of a file into the journal -}
|
2011-12-13 01:12:51 +00:00
|
|
|
set :: FilePath -> String -> Annex ()
|
2012-10-19 18:25:15 +00:00
|
|
|
set file content = setJournalFile file content
|
2011-12-13 01:12:51 +00:00
|
|
|
|
|
|
|
{- Stages the journal, and commits staged changes to the branch. -}
|
|
|
|
commit :: String -> Annex ()
|
2012-09-15 23:47:23 +00:00
|
|
|
commit message = whenM journalDirty $ lockJournal $ do
|
|
|
|
cleanjournal <- stageJournal
|
2011-12-13 01:12:51 +00:00
|
|
|
ref <- getBranch
|
|
|
|
withIndex $ commitBranch ref message [fullname]
|
2012-09-15 23:47:23 +00:00
|
|
|
liftIO $ cleanjournal
|
2012-02-25 20:11:47 +00:00
|
|
|
|
2011-12-13 01:12:51 +00:00
|
|
|
{- Commits the staged changes in the index to the branch.
|
|
|
|
-
|
|
|
|
- Ensures that the branch's index file is first updated to the state
|
2012-02-14 15:20:30 +00:00
|
|
|
- of the branch at branchref, before running the commit action. This
|
2011-12-13 01:12:51 +00:00
|
|
|
- is needed because the branch may have had changes pushed to it, that
|
|
|
|
- are not yet reflected in the index.
|
|
|
|
-
|
|
|
|
- Also safely handles a race that can occur if a change is being pushed
|
|
|
|
- into the branch at the same time. When the race happens, the commit will
|
|
|
|
- be made on top of the newly pushed change, but without the index file
|
|
|
|
- being updated to include it. The result is that the newly pushed
|
|
|
|
- change is reverted. This race is detected and another commit made
|
|
|
|
- to fix it.
|
|
|
|
-
|
|
|
|
- The branchref value can have been obtained using getBranch at any
|
|
|
|
- previous point, though getting it a long time ago makes the race
|
|
|
|
- more likely to occur.
|
|
|
|
-}
|
|
|
|
commitBranch :: Git.Ref -> String -> [Git.Ref] -> Annex ()
|
|
|
|
commitBranch branchref message parents = do
|
2012-09-15 22:34:46 +00:00
|
|
|
showStoringStateAction
|
|
|
|
commitBranch' branchref message parents
|
|
|
|
commitBranch' :: Git.Ref -> String -> [Git.Ref] -> Annex ()
|
|
|
|
commitBranch' branchref message parents = do
|
2011-12-13 01:12:51 +00:00
|
|
|
updateIndex branchref
|
2011-12-13 19:08:44 +00:00
|
|
|
committedref <- inRepo $ Git.Branch.commit message fullname parents
|
2011-12-13 01:12:51 +00:00
|
|
|
setIndexSha committedref
|
|
|
|
parentrefs <- commitparents <$> catObject committedref
|
|
|
|
when (racedetected branchref parentrefs) $
|
|
|
|
fixrace committedref parentrefs
|
2012-12-13 04:24:19 +00:00
|
|
|
where
|
|
|
|
-- look for "parent ref" lines and return the refs
|
|
|
|
commitparents = map (Git.Ref . snd) . filter isparent .
|
|
|
|
map (toassoc . L.unpack) . L.lines
|
|
|
|
toassoc = separate (== ' ')
|
|
|
|
isparent (k,_) = k == "parent"
|
2011-12-13 01:12:51 +00:00
|
|
|
|
2012-12-13 04:24:19 +00:00
|
|
|
{- The race can be detected by checking the commit's
|
|
|
|
- parent, which will be the newly pushed branch,
|
|
|
|
- instead of the expected ref that the index was updated to. -}
|
|
|
|
racedetected expectedref parentrefs
|
|
|
|
| expectedref `elem` parentrefs = False -- good parent
|
|
|
|
| otherwise = True -- race!
|
2011-12-13 01:12:51 +00:00
|
|
|
|
2012-12-13 04:24:19 +00:00
|
|
|
{- To recover from the race, union merge the lost refs
|
|
|
|
- into the index, and recommit on top of the bad commit. -}
|
|
|
|
fixrace committedref lostrefs = do
|
|
|
|
mergeIndex lostrefs
|
|
|
|
commitBranch committedref racemessage [committedref]
|
2011-12-13 01:12:51 +00:00
|
|
|
|
2012-12-13 04:24:19 +00:00
|
|
|
racemessage = message ++ " (recovery from race)"
|
2011-12-13 01:12:51 +00:00
|
|
|
|
2011-06-23 15:37:26 +00:00
|
|
|
{- Lists all files on the branch. There may be duplicates in the list. -}
|
2011-06-23 03:24:14 +00:00
|
|
|
files :: Annex [FilePath]
|
2012-09-15 19:40:13 +00:00
|
|
|
files = do
|
|
|
|
update
|
|
|
|
withIndex $ do
|
2012-10-04 22:47:31 +00:00
|
|
|
bfiles <- inRepo $ Git.Command.pipeNullSplitZombie
|
2012-10-04 23:56:32 +00:00
|
|
|
[ Params "ls-tree --name-only -r -z"
|
|
|
|
, Param $ show fullname
|
|
|
|
]
|
2012-09-15 19:40:13 +00:00
|
|
|
jfiles <- getJournalledFiles
|
|
|
|
return $ jfiles ++ bfiles
|
2011-12-13 01:12:51 +00:00
|
|
|
|
|
|
|
{- Populates the branch's index file with the current branch contents.
|
|
|
|
-
|
|
|
|
- This is only done when the index doesn't yet exist, and the index
|
|
|
|
- is used to build up changes to be commited to the branch, and merge
|
|
|
|
- in changes from other branches.
|
|
|
|
-}
|
|
|
|
genIndex :: Git.Repo -> IO ()
|
2012-06-08 04:29:39 +00:00
|
|
|
genIndex g = Git.UpdateIndex.streamUpdateIndex g
|
|
|
|
[Git.UpdateIndex.lsTree fullname g]
|
2011-12-13 01:12:51 +00:00
|
|
|
|
2011-12-30 19:57:28 +00:00
|
|
|
{- Merges the specified refs into the index.
|
2011-12-13 01:12:51 +00:00
|
|
|
- Any changes staged in the index will be preserved. -}
|
|
|
|
mergeIndex :: [Git.Ref] -> Annex ()
|
|
|
|
mergeIndex branches = do
|
|
|
|
h <- catFileHandle
|
2012-06-08 04:29:39 +00:00
|
|
|
inRepo $ \g -> Git.UnionMerge.mergeIndex h g branches
|
2011-12-13 01:12:51 +00:00
|
|
|
|
|
|
|
{- Runs an action using the branch's index file. -}
|
|
|
|
withIndex :: Annex a -> Annex a
|
|
|
|
withIndex = withIndex' False
|
|
|
|
withIndex' :: Bool -> Annex a -> Annex a
|
|
|
|
withIndex' bootstrapping a = do
|
|
|
|
f <- fromRepo gitAnnexIndex
|
2012-08-25 00:50:39 +00:00
|
|
|
g <- gitRepo
|
2013-02-27 06:39:22 +00:00
|
|
|
#ifdef __ANDROID__
|
2013-02-22 18:47:29 +00:00
|
|
|
{- Work around for weird getEnvironment breakage on Android. See
|
|
|
|
- https://github.com/neurocyte/ghc-android/issues/7
|
|
|
|
- Instead, use getEnv to get some key environment variables that
|
|
|
|
- git expects to have. -}
|
|
|
|
let keyenv = words "USER PATH GIT_EXEC_PATH HOSTNAME HOME"
|
|
|
|
let getEnvPair k = maybe Nothing (\v -> Just (k, v)) <$> getEnv k
|
|
|
|
e <- liftIO $ catMaybes <$> forM keyenv getEnvPair
|
|
|
|
#else
|
2012-10-11 16:58:03 +00:00
|
|
|
e <- liftIO getEnvironment
|
2013-02-22 18:47:29 +00:00
|
|
|
#endif
|
2012-10-11 16:58:03 +00:00
|
|
|
let g' = g { gitEnv = Just $ ("GIT_INDEX_FILE", f):e }
|
2012-08-25 00:50:39 +00:00
|
|
|
|
|
|
|
Annex.changeState $ \s -> s { Annex.repo = g' }
|
|
|
|
checkIndexOnce $ unlessM (liftIO $ doesFileExist f) $ do
|
|
|
|
unless bootstrapping create
|
|
|
|
liftIO $ createDirectoryIfMissing True $ takeDirectory f
|
|
|
|
unless bootstrapping $ inRepo genIndex
|
|
|
|
r <- a
|
|
|
|
Annex.changeState $ \s -> s { Annex.repo = (Annex.repo s) { gitEnv = gitEnv g} }
|
|
|
|
|
|
|
|
return r
|
2011-12-13 01:12:51 +00:00
|
|
|
|
|
|
|
{- Updates the branch's index to reflect the current contents of the branch.
|
|
|
|
- Any changes staged in the index will be preserved.
|
|
|
|
-
|
|
|
|
- Compares the ref stored in the lock file with the current
|
|
|
|
- ref of the branch to see if an update is needed.
|
|
|
|
-}
|
|
|
|
updateIndex :: Git.Ref -> Annex ()
|
2012-09-15 22:34:46 +00:00
|
|
|
updateIndex branchref = whenM (needUpdateIndex branchref) $
|
|
|
|
forceUpdateIndex branchref
|
|
|
|
|
|
|
|
forceUpdateIndex :: Git.Ref -> Annex ()
|
|
|
|
forceUpdateIndex branchref = do
|
|
|
|
withIndex $ mergeIndex [fullname]
|
|
|
|
setIndexSha branchref
|
|
|
|
|
|
|
|
{- Checks if the index needs to be updated. -}
|
|
|
|
needUpdateIndex :: Git.Ref -> Annex Bool
|
|
|
|
needUpdateIndex branchref = do
|
2011-12-13 01:12:51 +00:00
|
|
|
lock <- fromRepo gitAnnexIndexLock
|
|
|
|
lockref <- Git.Ref . firstLine <$>
|
2012-09-17 04:18:07 +00:00
|
|
|
liftIO (catchDefaultIO "" $ readFileStrict lock)
|
2012-09-15 22:34:46 +00:00
|
|
|
return (lockref /= branchref)
|
2011-12-13 01:12:51 +00:00
|
|
|
|
|
|
|
{- Record that the branch's index has been updated to correspond to a
|
|
|
|
- given ref of the branch. -}
|
|
|
|
setIndexSha :: Git.Ref -> Annex ()
|
|
|
|
setIndexSha ref = do
|
2012-12-13 04:45:27 +00:00
|
|
|
lock <- fromRepo gitAnnexIndexLock
|
2011-12-13 01:12:51 +00:00
|
|
|
liftIO $ writeFile lock $ show ref ++ "\n"
|
2012-04-21 20:59:49 +00:00
|
|
|
setAnnexPerm lock
|
2011-12-13 01:12:51 +00:00
|
|
|
|
2012-09-15 23:47:23 +00:00
|
|
|
{- Stages the journal into the index and returns an action that will
|
|
|
|
- clean up the staged journal files, which should only be run once
|
|
|
|
- the index has been committed to the branch. Should be run within
|
|
|
|
- lockJournal, to prevent others from modifying the journal. -}
|
|
|
|
stageJournal :: Annex (IO ())
|
|
|
|
stageJournal = withIndex $ do
|
|
|
|
g <- gitRepo
|
|
|
|
let dir = gitAnnexJournalDir g
|
2011-10-09 20:19:09 +00:00
|
|
|
fs <- getJournalFiles
|
2012-09-15 23:47:23 +00:00
|
|
|
liftIO $ do
|
|
|
|
h <- hashObjectStart g
|
|
|
|
Git.UpdateIndex.streamUpdateIndex g
|
|
|
|
[genstream dir h fs]
|
|
|
|
hashObjectStop h
|
|
|
|
return $ liftIO $ mapM_ removeFile $ map (dir </>) fs
|
2012-12-13 04:24:19 +00:00
|
|
|
where
|
|
|
|
genstream dir h fs streamer = forM_ fs $ \file -> do
|
|
|
|
let path = dir </> file
|
|
|
|
sha <- hashFile h path
|
|
|
|
streamer $ Git.UpdateIndex.updateIndexLine
|
|
|
|
sha FileBlob (asTopFilePath $ fileJournal file)
|