2024-05-06 16:58:38 +00:00
|
|
|
{- git-remote-annex program
|
|
|
|
-
|
|
|
|
- Copyright 2024 Joey Hess <id@joeyh.name>
|
|
|
|
-
|
|
|
|
- Licensed under the GNU AGPL version 3 or higher.
|
|
|
|
-}
|
|
|
|
|
2024-05-06 20:25:55 +00:00
|
|
|
{-# LANGUAGE OverloadedStrings #-}
|
|
|
|
|
2024-05-06 16:58:38 +00:00
|
|
|
module CmdLine.GitRemoteAnnex where
|
|
|
|
|
2024-05-06 18:07:27 +00:00
|
|
|
import Annex.Common
|
2024-05-06 16:58:38 +00:00
|
|
|
import qualified Annex
|
2024-05-06 20:25:55 +00:00
|
|
|
import qualified Remote
|
2024-05-07 19:13:41 +00:00
|
|
|
import qualified Git.CurrentRepo
|
|
|
|
import qualified Git.Ref
|
|
|
|
import qualified Git.Branch
|
|
|
|
import qualified Git.Bundle
|
|
|
|
import Git.Types
|
|
|
|
import Backend.GitRemoteAnnex
|
|
|
|
import Annex.Transfer
|
2024-05-06 20:25:55 +00:00
|
|
|
import Types.Remote
|
|
|
|
import Types.Key
|
2024-05-06 18:50:41 +00:00
|
|
|
import Network.URI
|
2024-05-06 20:25:55 +00:00
|
|
|
import Utility.Tmp
|
|
|
|
import Utility.Metered
|
|
|
|
import qualified Data.ByteString as B
|
|
|
|
import qualified Data.ByteString.Char8 as B8
|
2024-05-07 19:13:41 +00:00
|
|
|
import qualified Data.Map.Strict as M
|
2024-05-06 16:58:38 +00:00
|
|
|
|
|
|
|
run :: [String] -> IO ()
|
2024-05-07 19:13:41 +00:00
|
|
|
run (remotename:url:[]) =
|
|
|
|
-- git strips the "annex::" prefix of the url
|
|
|
|
-- when running this command, so add it back
|
|
|
|
let url' = "annex::" ++ url
|
|
|
|
in case parseSpecialRemoteNameUrl remotename url' of
|
|
|
|
Left e -> giveup e
|
|
|
|
Right src -> do
|
|
|
|
state <- Annex.new =<< Git.CurrentRepo.get
|
|
|
|
Annex.eval state (run' src)
|
2024-05-06 18:07:27 +00:00
|
|
|
run (_remotename:[]) = giveup "remote url not configured"
|
|
|
|
run _ = giveup "expected remote name and url parameters"
|
|
|
|
|
2024-05-06 20:25:55 +00:00
|
|
|
run' :: SpecialRemoteConfig -> Annex ()
|
|
|
|
run' src =
|
|
|
|
-- Prevent any usual git-annex output to stdout, because
|
|
|
|
-- the output of this command is being parsed by git.
|
|
|
|
doQuietAction $ do
|
|
|
|
rmt <- getSpecialRemote src
|
2024-05-07 19:13:41 +00:00
|
|
|
ls <- lines <$> liftIO getContents
|
|
|
|
go rmt ls emptyState
|
2024-05-06 18:07:27 +00:00
|
|
|
where
|
2024-05-07 19:13:41 +00:00
|
|
|
go rmt (l:ls) st =
|
2024-05-06 18:07:27 +00:00
|
|
|
let (c, v) = splitLine l
|
|
|
|
in case c of
|
2024-05-07 19:13:41 +00:00
|
|
|
"capabilities" -> capabilities >> go rmt ls st
|
2024-05-06 18:07:27 +00:00
|
|
|
"list" -> case v of
|
2024-05-07 19:13:41 +00:00
|
|
|
"" -> list st rmt False >>= go rmt ls
|
|
|
|
"for-push" -> list st rmt True >>= go rmt ls
|
2024-05-06 18:07:27 +00:00
|
|
|
_ -> protocolError l
|
2024-05-07 19:13:41 +00:00
|
|
|
"fetch" -> fetch st rmt (l:ls) >>= \ls' -> go rmt ls' st
|
|
|
|
"push" -> push st rmt (l:ls) >>= \ls' -> go rmt ls' st
|
|
|
|
"" -> return ()
|
2024-05-06 18:07:27 +00:00
|
|
|
_ -> protocolError l
|
2024-05-07 19:13:41 +00:00
|
|
|
go _ [] _ = return ()
|
|
|
|
|
|
|
|
data State = State
|
|
|
|
{ manifestCache :: Maybe Manifest
|
|
|
|
, trackingRefs :: M.Map Ref Sha
|
|
|
|
}
|
|
|
|
|
|
|
|
emptyState :: State
|
|
|
|
emptyState = State
|
|
|
|
{ manifestCache = Nothing
|
|
|
|
, trackingRefs = mempty
|
|
|
|
}
|
2024-05-06 18:07:27 +00:00
|
|
|
|
|
|
|
protocolError :: String -> a
|
|
|
|
protocolError l = giveup $ "gitremote-helpers protocol error at " ++ show l
|
|
|
|
|
|
|
|
capabilities :: Annex ()
|
|
|
|
capabilities = do
|
|
|
|
liftIO $ putStrLn "fetch"
|
|
|
|
liftIO $ putStrLn "push"
|
|
|
|
liftIO $ putStrLn ""
|
|
|
|
liftIO $ hFlush stdout
|
|
|
|
|
2024-05-07 19:13:41 +00:00
|
|
|
list :: State -> Remote -> Bool -> Annex State
|
|
|
|
list st rmt forpush = do
|
|
|
|
manifest <- downloadManifest rmt
|
|
|
|
l <- forM (inManifest manifest) $ \k -> do
|
|
|
|
b <- downloadGitBundle rmt k
|
|
|
|
heads <- inRepo $ Git.Bundle.listHeads b
|
|
|
|
-- Get all the objects from the bundle. This is done here
|
|
|
|
-- so that the tracking refs can be updated with what is
|
|
|
|
-- listed, and so what when a full repush is done, all
|
|
|
|
-- objects are available to be pushed.
|
|
|
|
when forpush $
|
|
|
|
inRepo $ Git.Bundle.unbundle b
|
|
|
|
-- The bundle may contain tracking refs, or regular refs,
|
|
|
|
-- make sure we're operating on regular refs.
|
|
|
|
return $ map (\(s, r) -> (fromTrackingRef rmt r, s)) heads
|
|
|
|
|
|
|
|
-- Later refs replace earlier refs with the same name.
|
|
|
|
let refmap = M.fromList $ concat l
|
|
|
|
let reflist = M.toList refmap
|
|
|
|
let trackingrefmap = M.mapKeys (toTrackingRef rmt) refmap
|
|
|
|
|
|
|
|
-- When listing for a push, update the tracking refs to match what
|
|
|
|
-- was listed. This is necessary in order for a full repush to know
|
|
|
|
-- what to push.
|
|
|
|
when forpush $
|
|
|
|
updateTrackingRefs rmt trackingrefmap
|
|
|
|
|
|
|
|
-- Respond to git with a list of refs.
|
|
|
|
liftIO $ do
|
|
|
|
forM_ reflist $ \(ref, sha) ->
|
|
|
|
B8.putStrLn $ fromRef' sha <> " " <> fromRef' ref
|
|
|
|
-- Newline terminates list of refs.
|
|
|
|
putStrLn ""
|
|
|
|
hFlush stdout
|
|
|
|
|
|
|
|
-- Remember the tracking refs.
|
|
|
|
return $ st
|
|
|
|
{ manifestCache = Just manifest
|
|
|
|
, trackingRefs = trackingrefmap
|
|
|
|
}
|
2024-05-06 18:07:27 +00:00
|
|
|
|
|
|
|
-- Any number of fetch commands can be sent by git, asking for specific
|
|
|
|
-- things. We fetch everything new at once, so find the end of the fetch
|
|
|
|
-- commands (which is supposed to be a blank line) before fetching.
|
2024-05-07 19:13:41 +00:00
|
|
|
fetch :: State -> Remote -> [String] -> Annex [String]
|
|
|
|
fetch st rmt (l:ls) = case splitLine l of
|
|
|
|
("fetch", _) -> fetch st rmt ls
|
2024-05-06 18:07:27 +00:00
|
|
|
("", _) -> do
|
2024-05-07 19:13:41 +00:00
|
|
|
fetch' st rmt
|
2024-05-06 18:07:27 +00:00
|
|
|
return ls
|
|
|
|
_ -> do
|
2024-05-07 19:13:41 +00:00
|
|
|
fetch' st rmt
|
2024-05-06 18:07:27 +00:00
|
|
|
return (l:ls)
|
2024-05-07 19:13:41 +00:00
|
|
|
fetch st rmt [] = do
|
|
|
|
fetch' st rmt
|
2024-05-06 18:07:27 +00:00
|
|
|
return []
|
|
|
|
|
2024-05-07 19:13:41 +00:00
|
|
|
fetch' :: State -> Remote -> Annex ()
|
|
|
|
fetch' st rmt = do
|
|
|
|
manifest <- maybe (downloadManifest rmt) pure (manifestCache st)
|
|
|
|
forM_ (inManifest manifest) $ \k ->
|
|
|
|
downloadGitBundle rmt k >>= inRepo . Git.Bundle.unbundle
|
2024-05-06 18:07:27 +00:00
|
|
|
|
2024-05-07 19:13:41 +00:00
|
|
|
push :: State -> Remote -> [String] -> Annex [String]
|
|
|
|
push st rmt ls = do
|
2024-05-06 18:07:27 +00:00
|
|
|
let (refspecs, ls') = collectRefSpecs ls
|
|
|
|
error "TODO push refspecs"
|
|
|
|
return ls'
|
|
|
|
|
|
|
|
data RefSpec = RefSpec
|
|
|
|
{ forcedPush :: Bool
|
|
|
|
, srcRef :: Maybe String -- empty when deleting a ref
|
|
|
|
, dstRef :: String
|
|
|
|
}
|
|
|
|
deriving (Show)
|
|
|
|
|
|
|
|
-- Any number of push commands can be sent by git, specifying the refspecs
|
|
|
|
-- to push. They should be followed by a blank line.
|
|
|
|
collectRefSpecs :: [String] -> ([RefSpec], [String])
|
|
|
|
collectRefSpecs = go []
|
|
|
|
where
|
|
|
|
go c (l:ls) = case splitLine l of
|
|
|
|
("push", refspec) -> go (parseRefSpec refspec:c) ls
|
|
|
|
("", _) -> (c, ls)
|
|
|
|
_ -> (c, (l:ls))
|
|
|
|
go c [] = (c, [])
|
|
|
|
|
|
|
|
parseRefSpec :: String -> RefSpec
|
|
|
|
parseRefSpec ('+':s) = (parseRefSpec s) { forcedPush = True }
|
|
|
|
parseRefSpec s =
|
|
|
|
let (src, cdst) = break (== ':') s
|
|
|
|
dst = if null cdst then cdst else drop 1 cdst
|
|
|
|
in RefSpec
|
|
|
|
{ forcedPush = False
|
|
|
|
, srcRef = if null src then Nothing else Just src
|
|
|
|
, dstRef = dst
|
|
|
|
}
|
|
|
|
|
|
|
|
-- "foo bar" to ("foo", "bar")
|
|
|
|
-- "foo" to ("foo", "")
|
|
|
|
splitLine :: String -> (String, String)
|
|
|
|
splitLine l =
|
|
|
|
let (c, sv) = break (== ' ') l
|
|
|
|
v = if null sv then sv else drop 1 sv
|
|
|
|
in (c, v)
|
2024-05-06 18:50:41 +00:00
|
|
|
|
2024-05-07 19:13:41 +00:00
|
|
|
data SpecialRemoteConfig
|
|
|
|
= SpecialRemoteConfig
|
|
|
|
{ specialRemoteUUID :: UUID
|
|
|
|
, specialRemoteParams :: [(String, String)]
|
|
|
|
}
|
|
|
|
| ExistingSpecialRemote RemoteName
|
2024-05-06 18:50:41 +00:00
|
|
|
deriving (Show)
|
|
|
|
|
|
|
|
-- The url for a special remote looks like
|
2024-05-07 19:13:41 +00:00
|
|
|
-- "annex::uuid?param=value¶m=value..."
|
|
|
|
--
|
|
|
|
-- Also accept an url of "annex::", when a remote name is provided,
|
|
|
|
-- to use an already enabled special remote.
|
|
|
|
parseSpecialRemoteNameUrl :: String -> String -> Either String SpecialRemoteConfig
|
|
|
|
parseSpecialRemoteNameUrl remotename url
|
|
|
|
| url == "annex::" && remotename /= url = Right $
|
|
|
|
ExistingSpecialRemote remotename
|
|
|
|
| otherwise = parseSpecialRemoteUrl url
|
|
|
|
|
2024-05-06 18:50:41 +00:00
|
|
|
parseSpecialRemoteUrl :: String -> Either String SpecialRemoteConfig
|
2024-05-07 19:13:41 +00:00
|
|
|
parseSpecialRemoteUrl url = case parseURI url of
|
2024-05-06 18:50:41 +00:00
|
|
|
Nothing -> Left "URL parse failed"
|
|
|
|
Just u -> case uriScheme u of
|
|
|
|
"annex:" -> case uriPath u of
|
|
|
|
"" -> Left "annex: URL did not include a UUID"
|
2024-05-07 18:37:29 +00:00
|
|
|
(':':p) -> Right $ SpecialRemoteConfig
|
2024-05-06 18:50:41 +00:00
|
|
|
{ specialRemoteUUID = toUUID p
|
|
|
|
, specialRemoteParams = parsequery u
|
|
|
|
}
|
2024-05-07 18:37:29 +00:00
|
|
|
_ -> Left "annex: URL malformed"
|
2024-05-06 18:50:41 +00:00
|
|
|
_ -> Left "Not an annex: URL"
|
|
|
|
where
|
|
|
|
parsequery u = map parsekv $ splitc '&' (drop 1 (uriQuery u))
|
2024-05-06 20:25:55 +00:00
|
|
|
parsekv kv =
|
|
|
|
let (k, sv) = break (== '=') kv
|
2024-05-06 18:50:41 +00:00
|
|
|
v = if null sv then sv else drop 1 sv
|
|
|
|
in (unEscapeString k, unEscapeString v)
|
2024-05-06 20:25:55 +00:00
|
|
|
|
|
|
|
getSpecialRemote :: SpecialRemoteConfig -> Annex Remote
|
2024-05-07 19:13:41 +00:00
|
|
|
getSpecialRemote (ExistingSpecialRemote remotename) =
|
|
|
|
Remote.byNameOnly remotename >>= \case
|
|
|
|
Just rmt -> if thirdPartyPopulated (remotetype rmt)
|
|
|
|
then giveup "Cannot use this thirdparty-populated special remote as a git remote"
|
|
|
|
else return rmt
|
|
|
|
Nothing -> giveup $ "There is no special remote named " ++ remotename
|
|
|
|
getSpecialRemote src@(SpecialRemoteConfig {})
|
2024-05-06 20:25:55 +00:00
|
|
|
-- Given the configuration of a special remote, create a
|
|
|
|
-- Remote object to access the special remote.
|
|
|
|
-- This needs to avoid storing the configuration in the git-annex
|
|
|
|
-- branch (which would be redundant and also the configuration
|
|
|
|
-- provided may differ in some small way from the configuration
|
|
|
|
-- that is stored in the git repository inside the remote, which
|
|
|
|
-- should not be changed). It also needs to avoid creating a git
|
|
|
|
-- remote in .git/config.
|
|
|
|
| otherwise = error "TODO conjure up a new special remote out of thin air"
|
|
|
|
-- XXX one way to do it would be to make a temporary git repo,
|
|
|
|
-- initremote in there, and use that for accessing the special
|
|
|
|
-- remote, rather than the current git repo. But can this be
|
|
|
|
-- avoided?
|
|
|
|
|
|
|
|
-- The manifest contains an ordered list of git bundle keys.
|
2024-05-07 19:13:41 +00:00
|
|
|
newtype Manifest = Manifest { inManifest :: [Key] }
|
2024-05-06 20:25:55 +00:00
|
|
|
|
|
|
|
-- Downloads the Manifest, or if it does not exist, returns an empty
|
|
|
|
-- Manifest.
|
|
|
|
--
|
|
|
|
-- Throws errors if the remote cannot be accessed or the download fails,
|
|
|
|
-- or if the manifest file cannot be parsed.
|
2024-05-07 19:13:41 +00:00
|
|
|
--
|
|
|
|
-- This downloads the manifest to a temporary file, rather than using
|
|
|
|
-- the usual Annex.Transfer.download. The content of manifests is not
|
|
|
|
-- stable, and so it needs to re-download it fresh every time.
|
2024-05-06 20:25:55 +00:00
|
|
|
downloadManifest :: Remote -> Annex Manifest
|
|
|
|
downloadManifest rmt = ifM (checkPresent rmt mk)
|
|
|
|
( withTmpFile "GITMANIFEST" $ \tmp tmph -> do
|
|
|
|
liftIO $ hClose tmph
|
|
|
|
_ <- retrieveKeyFile rmt mk
|
|
|
|
(AssociatedFile Nothing) tmp
|
|
|
|
nullMeterUpdate NoVerify
|
|
|
|
ks <- map deserializeKey' . B8.lines <$> liftIO (B.readFile tmp)
|
|
|
|
Manifest <$> checkvalid [] ks
|
|
|
|
, return (Manifest [])
|
|
|
|
)
|
|
|
|
where
|
2024-05-07 19:13:41 +00:00
|
|
|
mk = genManifestKey (Remote.uuid rmt)
|
2024-05-06 20:25:55 +00:00
|
|
|
|
|
|
|
checkvalid c [] = return (reverse c)
|
|
|
|
checkvalid c (Just k:ks) = case fromKey keyVariety k of
|
2024-05-07 19:13:41 +00:00
|
|
|
GitBundleKey -> checkvalid (k:c) ks
|
2024-05-06 20:25:55 +00:00
|
|
|
_ -> giveup $ "Wrong type of key in manifest " ++ serializeKey k
|
|
|
|
checkvalid _ (Nothing:_) =
|
|
|
|
giveup $ "Error parsing manifest " ++ serializeKey mk
|
2024-05-07 19:13:41 +00:00
|
|
|
|
|
|
|
-- Downloads a git bundle to the annex objects directory, unless
|
|
|
|
-- the object file is already present. Returns the filename of the object
|
|
|
|
-- file.
|
|
|
|
--
|
|
|
|
-- Throws errors if the download fails, or the checksum does not verify.
|
|
|
|
--
|
|
|
|
-- This does not update the location log to indicate that the local
|
|
|
|
-- repository contains the git bundle object. Reasons not to include:
|
|
|
|
-- 1. When this is being used in a git clone, the repository will not have
|
|
|
|
-- a UUID yet.
|
|
|
|
-- 2. It would unncessarily bloat the git-annex branch, which would then
|
|
|
|
-- lead to more things needing to be pushed to the special remote,
|
|
|
|
-- and so more things pulled from it, etc.
|
|
|
|
-- 3. Git bundle objects are not usually transferred between repositories
|
|
|
|
-- except special remotes (although the user can if they want to).
|
|
|
|
downloadGitBundle :: Remote -> Key -> Annex FilePath
|
|
|
|
downloadGitBundle rmt k =
|
|
|
|
ifM (download rmt k (AssociatedFile Nothing) stdRetry noNotification)
|
|
|
|
( decodeBS <$> calcRepo (gitAnnexLocation k)
|
|
|
|
, giveup $ "Failed to download " ++ serializeKey k
|
|
|
|
)
|
|
|
|
|
|
|
|
-- Tracking refs are used to remember the refs that are currently on the
|
|
|
|
-- remote. This is different from git's remote tracking branches, since it
|
|
|
|
-- needs to track all refs on the remote, not only the refs that the user
|
|
|
|
-- chooses to fetch.
|
|
|
|
--
|
|
|
|
-- For refs/heads/master, the tracking ref is
|
|
|
|
-- refs/namespaces/git-remote-annex/uuid/refs/heads/master,
|
|
|
|
-- using the uuid of the remote. See gitnamespaces(7).
|
|
|
|
trackingRefPrefix :: Remote -> B.ByteString
|
|
|
|
trackingRefPrefix rmt = "refs/namespaces/git-remote-annex/"
|
|
|
|
<> fromUUID (Remote.uuid rmt) <> "/"
|
|
|
|
|
|
|
|
toTrackingRef :: Remote -> Ref -> Ref
|
|
|
|
toTrackingRef rmt (Ref r) = Ref $ trackingRefPrefix rmt <> r
|
|
|
|
|
|
|
|
-- If the ref is not a tracking ref, it is returned as-is.
|
|
|
|
fromTrackingRef :: Remote -> Ref -> Ref
|
|
|
|
fromTrackingRef rmt = Git.Ref.removeBase (decodeBS (trackingRefPrefix rmt))
|
|
|
|
|
|
|
|
-- Update the tracking refs to be those in the map, and no others.
|
|
|
|
updateTrackingRefs :: Remote -> M.Map Ref Sha -> Annex ()
|
|
|
|
updateTrackingRefs rmt new = do
|
|
|
|
old <- inRepo $ Git.Ref.forEachRef
|
|
|
|
[Param (decodeBS (trackingRefPrefix rmt))]
|
|
|
|
|
|
|
|
-- Delete all tracking refs that are not in the map.
|
|
|
|
forM_ (filter (\p -> M.notMember (fst p) new) old) $ \(s, r) ->
|
|
|
|
inRepo $ Git.Ref.delete s r
|
|
|
|
|
|
|
|
-- Update all changed tracking refs.
|
|
|
|
let oldmap = M.fromList (map (\(s, r) -> (r, s)) old)
|
|
|
|
forM_ (M.toList new) $ \(r, s) ->
|
|
|
|
case M.lookup r oldmap of
|
|
|
|
Just s' | s' == s -> noop
|
|
|
|
_ -> inRepo $ Git.Branch.update' r s
|