% Copyright (C) 2002-2004 David Roundy % % This program is free software; you can redistribute it and/or modify % it under the terms of the GNU General Public License as published by % the Free Software Foundation; either version 2, or (at your option) % any later version. % % This program is distributed in the hope that it will be useful, % but WITHOUT ANY WARRANTY; without even the implied warranty of % MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the % GNU General Public License for more details. % % You should have received a copy of the GNU General Public License % along with this program; see the file COPYING. If not, write to % the Free Software Foundation, Inc., 51 Franklin Street, Fifth Floor, % Boston, MA 02110-1301, USA. \subsection{darcs push} \begin{code} {-# OPTIONS_GHC -cpp #-} {-# LANGUAGE CPP #-} module Darcs.Commands.Push ( push ) where import System.Exit ( exitWith, ExitCode( ExitSuccess, ExitFailure ) ) import Control.Monad ( when ) import Data.Char ( toUpper ) import Workaround ( getCurrentDirectory ) import Darcs.Commands ( DarcsCommand(..) ) import Darcs.Arguments ( DarcsFlag( DryRun, Verbose, Quiet, Sign, SignAs, NoSign, SignSSL ), definePatches, working_repo_dir, summary, print_dry_run_message_and_exit, applyas, match_several, fixUrl, deps_sel, all_interactive, dry_run, nolinks, remote_repo, network_options, set_default, sign, allow_unrelated_repos ) import Darcs.Hopefully ( hopefully ) import Darcs.Repository ( withRepoReadLock, ($-), identifyRepositoryFor, slurp_recorded, read_repo, amInRepository, checkUnrelatedRepos ) import Darcs.Patch ( description ) import Darcs.Ordered ( RL(..), (:>)(..), (:\/:)(..), nullFL, reverseRL, mapFL_FL, unsafeUnRL, mapRL, lengthRL ) import Darcs.Repository.Prefs ( defaultrepo, set_defaultrepo, get_preflist ) import Darcs.External ( maybeURLCmd, signString ) import Darcs.URL ( is_url, is_file ) import Darcs.SelectChanges ( with_selected_changes ) import Darcs.Utils ( formatPath ) import Darcs.Patch.Depends ( get_common_and_uncommon ) import Darcs.Patch.Bundle ( make_bundle ) import Printer ( vcat, empty, text, ($$), (<+>), putDocLn, errorDoc ) import Darcs.RemoteApply ( remote_apply, apply_as ) import Darcs.Email ( make_email ) import English (englishNum, Noun(..)) #include "impossible.h" \end{code} \begin{code} push_description :: String push_description = "Copy and apply patches from this repository to another one." \end{code} \options{push} \haskell{push_help} \begin{code} push_help :: String push_help = "Push is the opposite of pull. Push allows you to copy changes from the\n"++ "current repository into another repository.\n" \end{code} \begin{code} push :: DarcsCommand push = DarcsCommand {command_name = "push", command_help = push_help, command_description = push_description, command_extra_args = 1, command_extra_arg_help = ["[REPOSITORY]"], command_command = push_cmd, command_prereq = amInRepository, command_get_arg_possibilities = get_preflist "repos", command_argdefaults = defaultrepo, command_advanced_options = [applyas, nolinks, remote_repo] ++ network_options, command_basic_options = [match_several, deps_sel, all_interactive, sign]++dry_run++[summary, working_repo_dir, set_default, allow_unrelated_repos]} \end{code} \begin{code} push_cmd :: [DarcsFlag] -> [String] -> IO () push_cmd opts [""] = push_cmd opts [] push_cmd opts [unfixedrepodir] = let am_verbose = Verbose `elem` opts am_quiet = Quiet `elem` opts putVerbose s = when am_verbose $ putDocLn s putInfo s = when (not am_quiet) $ putDocLn s in do repodir <- fixUrl opts unfixedrepodir -- Test to make sure we aren't trying to push to the current repo here <- getCurrentDirectory when (repodir == here) $ fail "Can't push to current repository!" -- absolute '.' also taken into account by fix_filepath (bundle,num_to_pull) <- withRepoReadLock opts $- \repository -> do if is_url repodir then do when (apply_as opts /= Nothing) $ let msg = text "Cannot --apply-as when pushing to URLs" in if DryRun `elem` opts then putInfo $ text "NOTE: " <+> msg $$ text "" else errorDoc msg maybeapply <- maybeURLCmd "APPLY" repodir when (maybeapply == Nothing) $ let lprot = takeWhile (/= ':') repodir prot = map toUpper lprot msg = text ("Pushing to "++lprot++" URLs is not supported.\n"++ "You may be able to hack this to work"++ " using DARCS_APPLY_"++prot) in if DryRun `elem` opts then putInfo $ text "NOTE:" <+> msg $$ text "" else errorDoc msg else do when (want_sign opts) $ let msg = text "Signing doesn't make sense for local repositories or when pushing over ssh." in if DryRun `elem` opts then putInfo $ text "NOTE:" <+> msg else errorDoc msg them <- identifyRepositoryFor repository repodir >>= read_repo old_default <- get_preflist "defaultrepo" set_defaultrepo repodir opts when (old_default == [repodir]) $ let pushing = if DryRun `elem` opts then "Would push" else "Pushing" in putInfo $ text $ pushing++" to "++formatPath repodir++"..." us <- read_repo repository case get_common_and_uncommon (us, them) of (common, us' :\/: them') -> do checkUnrelatedRepos opts common us them putVerbose $ text "We have the following patches to push:" $$ (vcat $ mapRL description $ head $ unsafeUnRL us') firstUs <- case us' of NilRL:<:NilRL -> do putInfo $ text "No recorded local changes to push!" exitWith ExitSuccess NilRL -> bug "push_cmd: us' is empty!" (x:<:_) -> return x s <- slurp_recorded repository with_selected_changes "push" opts s (reverseRL firstUs) $ \ (to_be_pushed:>_) -> do definePatches to_be_pushed print_dry_run_message_and_exit "push" opts to_be_pushed when (nullFL to_be_pushed) $ do putInfo $ text "You don't want to push any patches, and that's fine with me!" exitWith ExitSuccess let num_to_pull = lengthRL $ head $ unsafeUnRL them' bundle = make_bundle [] (bug "using slurpy in make_bundle called from Push") common (mapFL_FL hopefully to_be_pushed) return (bundle, num_to_pull) sbundle <- signString opts bundle let body = if is_file repodir then sbundle else make_email repodir [] Nothing sbundle Nothing rval <- remote_apply opts repodir body let pull_reminder = if num_to_pull > 0 then text $ "(By the way, the remote repository has " ++ show num_to_pull ++ " " ++ englishNum num_to_pull (Noun "patch") " to pull.)" else empty case rval of ExitFailure ec -> do putStrLn $ "Apply failed!" exitWith (ExitFailure ec) ExitSuccess -> putInfo $ text "Push successful." $$ pull_reminder push_cmd _ _ = impossible \end{code} \begin{code} want_sign :: [DarcsFlag] -> Bool want_sign opts = case opts of [] -> False Sign:_ -> True (SignAs _):_ -> True (SignSSL _):_ -> True NoSign:_ -> False _:opts' -> want_sign opts' \end{code} For obvious reasons, you can only push to repositories to which you have write access. In addition, you can only push to repos that you access either on the local file system or with ssh. In order to apply with ssh, darcs must also be installed on the remote computer. The command invoked to run ssh may be configured by the \verb!DARCS_SSH! environment variable (see subsection~\ref{env:DARCS_SSH}). The command invoked via ssh is always \verb!darcs!, i.e.\ the darcs executable must be in the default path on the remote machine. Push works by creating a patch bundle, and then running darcs apply in the target repository using that patch bundle. This means that the default options for \emph{apply} in the \emph{target} repository (such as, for example, \verb!--test!) will affect the behavior of push. This also means that push is somewhat less efficient than pull. When you receive an error message such as \begin{verbatim} bash: darcs: command not found \end{verbatim} then this means that the darcs on the remote machine could not be started. Make sure that the darcs executable is called \verb!darcs! and is found in the default path. The default path can be different in interactive and in non-interactive shells. Say \begin{verbatim} ssh login@remote.machine darcs \end{verbatim} to try whether the remote darcs can be found, or \begin{verbatim} ssh login@remote.machine 'echo $PATH' \end{verbatim} (note the single quotes) to check the default path. \begin{options} --apply-as \end{options} If you give the \verb!--apply-as! flag, darcs will use sudo to apply the changes as a different user. This can be useful if you want to set up a system where several users can modify the same repository, but you don't want to allow them full write access. This isn't secure against skilled malicious attackers, but at least can protect your repository from clumsy, inept or lazy users. \begin{options} --matches, --patches, --tags, --no-deps \end{options} The \verb!--patches!, \verb!--matches!, \verb!--tags!, and \verb!--no-deps! options can be used to select which patches to push, as described in subsection~\ref{selecting}. When there are conflicts, the behavior of push is determined by the default flags to \verb!apply! in the \emph{target} repository. Most commonly, for pushed-to repositories, you'd like to have \verb!--dont-allow-conflicts! as a default option to apply (by default, it is already the default\ldots). If this is the case, when there are conflicts on push, darcs will fail with an error message. You can then resolve by pulling the conflicting patch, recording a resolution and then pushing the resolution together with the conflicting patch. Darcs does not have an explicit way to tell you which patch conflicted, only the file name. You may want to pull all the patches from the remote repository just to be sure. If you don't want to do this in your working directory, you can create another darcs working directory for this purpose. If you want, you could set the target repository to use \verb!--allow-conflicts!. In this case conflicting patches will be applied, but the conflicts will not be marked in the working directory. If, on the other hand, you have \verb!--mark-conflicts! specified as a default flag for apply in the target repository, when there is a conflict, it will be marked in the working directory of the target repository. In this case, you should resolve the conflict in the target repository itself.