{-# LANGUAGE OverloadedStrings #-}
module Darcs.UI.Flags
( F.DarcsFlag
, remoteDarcs
, diffingOpts
, diffOpts
, scanKnown
, wantGuiPause
, isInteractive
, willRemoveLogFile
, includeBoring
, lookForAdds
, lookForMoves
, lookForReplaces
, setDefault
, allowConflicts
, hasXmlOutput
, hasLogfile
, quiet
, verbose
, enumeratePatches
, fixRemoteRepos
, fixUrl
, pathsFromArgs
, pathSetFromArgs
, getRepourl
, getAuthor
, promptAuthor
, getEasyAuthor
, getSendmailCmd
, fileHelpAuthor
, environmentHelpEmail
, getSubject
, getInReplyTo
, getCc
, environmentHelpSendmail
, getOutput
, getDate
, workRepo
, withNewRepo
, O.compress
, O.diffAlgorithm
, O.reorder
, O.minimize
, O.editDescription
, O.externalMerge
, O.maxCount
, O.matchAny
, O.withContext
, O.allowCaseDifferingFilenames
, O.allowWindowsReservedFilenames
, O.changesReverse
, O.usePacks
, O.onlyToFiles
, O.amendUnrecord
, O.verbosity
, O.useCache
, O.useIndex
, O.umask
, O.dryRun
, O.runTest
, O.testChanges
, O.setScriptsExecutable
, O.withWorkingDir
, O.leaveTestDir
, O.remoteRepos
, O.cloneKind
, O.patchIndexNo
, O.patchIndexYes
, O.xmlOutput
, O.selectDeps
, O.author
, O.patchFormat
, O.charset
, O.siblings
, O.applyAs
, O.enumPatches
) where
import Darcs.Prelude
import Data.List ( intercalate )
import Data.List.Ordered ( nubSort )
import Data.Maybe
( isJust
, maybeToList
, isNothing
, catMaybes
)
import Control.Monad ( unless )
import System.Directory ( doesDirectoryExist, createDirectory )
import System.FilePath.Posix ( (</>) )
import System.Environment ( lookupEnv )
import qualified Darcs.UI.Options.Flags as F ( DarcsFlag(RemoteRepo) )
import Darcs.UI.Options ( Config, (?), (^), oparse, parseFlags, unparseOpt )
import qualified Darcs.UI.Options.All as O
import Darcs.Util.Exception ( catchall )
import Darcs.Util.File ( withCurrentDirectory )
import Darcs.Util.Prompt
( askUser
, askUserListItem
)
import Darcs.Util.Lock ( writeTextFile )
import Darcs.Repository.Flags ( WorkRepo(..) )
import Darcs.Repository.Prefs
( getPreflist
, getGlobal
, globalPrefsDirDoc
, globalPrefsDir
, prefsDirPath
)
import Darcs.Util.IsoDate ( getIsoDateTime, cleanLocalDate )
import Darcs.Util.Path
( AbsolutePath
, AbsolutePathOrStd
, toFilePath
, makeSubPathOf
, ioAbsolute
, makeAbsoluteOrStd
, AnchoredPath
, floatSubPath
, inDarcsdir
)
import Darcs.Util.Printer ( pathlist, putDocLn, text, ($$), (<+>) )
import Darcs.Util.Printer.Color ( ePutDocLn )
import Darcs.Util.URL ( isValidLocalPath )
verbose :: Config -> Bool
verbose :: Config -> Bool
verbose = (forall a. Eq a => a -> a -> Bool
== Verbosity
O.Verbose) forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimDarcsOption Verbosity
O.verbosity
quiet :: Config -> Bool
quiet :: Config -> Bool
quiet = (forall a. Eq a => a -> a -> Bool
== Verbosity
O.Quiet) forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimDarcsOption Verbosity
O.verbosity
remoteDarcs :: Config -> O.RemoteDarcs
remoteDarcs :: Config -> RemoteDarcs
remoteDarcs = NetworkOptions -> RemoteDarcs
O.remoteDarcs forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimDarcsOption NetworkOptions
O.network
enumeratePatches :: Config -> Bool
enumeratePatches :: Config -> Bool
enumeratePatches = (forall a. Eq a => a -> a -> Bool
== EnumPatches
O.YesEnumPatches) forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimDarcsOption EnumPatches
O.enumPatches
diffOpts :: O.UseIndex -> O.LookForAdds -> O.IncludeBoring -> O.DiffAlgorithm -> (O.UseIndex, O.ScanKnown, O.DiffAlgorithm)
diffOpts :: UseIndex
-> LookForAdds
-> IncludeBoring
-> DiffAlgorithm
-> (UseIndex, ScanKnown, DiffAlgorithm)
diffOpts UseIndex
use_index LookForAdds
look_for_adds IncludeBoring
include_boring DiffAlgorithm
diff_alg =
(UseIndex
use_index, LookForAdds -> IncludeBoring -> ScanKnown
scanKnown LookForAdds
look_for_adds IncludeBoring
include_boring, DiffAlgorithm
diff_alg)
scanKnown :: O.LookForAdds -> O.IncludeBoring -> O.ScanKnown
scanKnown :: LookForAdds -> IncludeBoring -> ScanKnown
scanKnown LookForAdds
O.NoLookForAdds IncludeBoring
_ = ScanKnown
O.ScanKnown
scanKnown LookForAdds
O.YesLookForAdds IncludeBoring
O.NoIncludeBoring = ScanKnown
O.ScanAll
scanKnown LookForAdds
O.YesLookForAdds IncludeBoring
O.YesIncludeBoring = ScanKnown
O.ScanBoring
diffingOpts :: Config -> (O.UseIndex, O.ScanKnown, O.DiffAlgorithm)
diffingOpts :: Config -> (UseIndex, ScanKnown, DiffAlgorithm)
diffingOpts Config
flags = UseIndex
-> LookForAdds
-> IncludeBoring
-> DiffAlgorithm
-> (UseIndex, ScanKnown, DiffAlgorithm)
diffOpts (PrimDarcsOption UseIndex
O.useIndex forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
? Config
flags) (Config -> LookForAdds
lookForAdds Config
flags)
(forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimDarcsOption IncludeBoring
O.includeBoring Config
flags) (PrimDarcsOption DiffAlgorithm
O.diffAlgorithm forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
? Config
flags)
wantGuiPause :: Config -> O.WantGuiPause
wantGuiPause :: Config -> WantGuiPause
wantGuiPause Config
fs =
if (Config -> Bool
hasDiffCmd Config
fs Bool -> Bool -> Bool
|| Config -> Bool
hasExternalMerge Config
fs) Bool -> Bool -> Bool
&& Config -> Bool
hasPause Config
fs
then WantGuiPause
O.YesWantGuiPause
else WantGuiPause
O.NoWantGuiPause
where
hasDiffCmd :: Config -> Bool
hasDiffCmd = forall a. Maybe a -> Bool
isJust forall b c a. (b -> c) -> (a -> b) -> a -> c
. ExternalDiff -> Maybe [Char]
O.diffCmd forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimDarcsOption ExternalDiff
O.extDiff
hasExternalMerge :: Config -> Bool
hasExternalMerge = (forall a. Eq a => a -> a -> Bool
/= ExternalMerge
O.NoExternalMerge) forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimDarcsOption ExternalMerge
O.externalMerge
hasPause :: Config -> Bool
hasPause = (forall a. Eq a => a -> a -> Bool
== WantGuiPause
O.YesWantGuiPause) forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimDarcsOption WantGuiPause
O.pauseForGui
isInteractive :: Bool -> Config -> Bool
isInteractive :: Bool -> Config -> Bool
isInteractive Bool
def = forall (d :: * -> *) f a b. OptSpec d f a b -> b -> [f] -> a
oparse (forall a. DarcsOption a (DryRun -> XmlOutput -> a)
O.dryRunXml forall (d :: * -> *) f b c a.
OptSpec d f b c -> OptSpec d f a b -> OptSpec d f a c
^ PrimDarcsOption (Maybe ChangesFormat)
O.changesFormat forall (d :: * -> *) f b c a.
OptSpec d f b c -> OptSpec d f a b -> OptSpec d f a c
^ PrimDarcsOption (Maybe Bool)
O.interactive) DryRun -> XmlOutput -> Maybe ChangesFormat -> Maybe Bool -> Bool
decide
where
decide :: O.DryRun -> O.XmlOutput -> Maybe O.ChangesFormat -> Maybe Bool -> Bool
decide :: DryRun -> XmlOutput -> Maybe ChangesFormat -> Maybe Bool -> Bool
decide DryRun
_ XmlOutput
_ Maybe ChangesFormat
_ (Just Bool
True) = Bool
True
decide DryRun
_ XmlOutput
_ Maybe ChangesFormat
_ (Just Bool
False) = Bool
False
decide DryRun
_ XmlOutput
_ (Just ChangesFormat
O.CountPatches) Maybe Bool
Nothing = Bool
False
decide DryRun
_ XmlOutput
O.YesXml Maybe ChangesFormat
_ Maybe Bool
Nothing = Bool
False
decide DryRun
O.YesDryRun XmlOutput
_ Maybe ChangesFormat
_ Maybe Bool
Nothing = Bool
False
decide DryRun
_ XmlOutput
_ Maybe ChangesFormat
_ Maybe Bool
Nothing = Bool
def
willRemoveLogFile :: Config -> Bool
willRemoveLogFile :: Config -> Bool
willRemoveLogFile = Logfile -> Bool
O._rmlogfile forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimDarcsOption Logfile
O.logfile
includeBoring :: Config -> Bool
includeBoring :: Config -> Bool
includeBoring Config
cfg = case forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimDarcsOption IncludeBoring
O.includeBoring Config
cfg of
IncludeBoring
O.NoIncludeBoring -> Bool
False
IncludeBoring
O.YesIncludeBoring -> Bool
True
lookForAdds :: Config -> O.LookForAdds
lookForAdds :: Config -> LookForAdds
lookForAdds = LookFor -> LookForAdds
O.adds forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimDarcsOption LookFor
O.lookfor
lookForReplaces :: Config -> O.LookForReplaces
lookForReplaces :: Config -> LookForReplaces
lookForReplaces = LookFor -> LookForReplaces
O.replaces forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimDarcsOption LookFor
O.lookfor
lookForMoves :: Config -> O.LookForMoves
lookForMoves :: Config -> LookForMoves
lookForMoves = LookFor -> LookForMoves
O.moves forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimDarcsOption LookFor
O.lookfor
setDefault :: Bool -> Config -> O.SetDefault
setDefault :: Bool -> Config -> SetDefault
setDefault Bool
defYes = forall b a. b -> (a -> b) -> Maybe a -> b
maybe SetDefault
def Bool -> SetDefault
noDef forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimDarcsOption (Maybe Bool)
O.setDefault where
def :: SetDefault
def = if Bool
defYes then Bool -> SetDefault
O.YesSetDefault Bool
False else Bool -> SetDefault
O.NoSetDefault Bool
False
noDef :: Bool -> SetDefault
noDef Bool
yes = if Bool
yes then Bool -> SetDefault
O.YesSetDefault Bool
True else Bool -> SetDefault
O.NoSetDefault Bool
True
allowConflicts :: Config -> O.AllowConflicts
allowConflicts :: Config -> AllowConflicts
allowConflicts = forall b a. b -> (a -> b) -> Maybe a -> b
maybe AllowConflicts
O.NoAllowConflicts forall a. a -> a
id forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimDarcsOption (Maybe AllowConflicts)
O.conflictsNo
fixRemoteRepos :: AbsolutePath -> Config -> IO Config
fixRemoteRepos :: AbsolutePath -> Config -> IO Config
fixRemoteRepos AbsolutePath
d = forall (t :: * -> *) (m :: * -> *) a b.
(Traversable t, Monad m) =>
(a -> m b) -> t a -> m (t b)
mapM Flag -> IO Flag
fixRemoteRepo where
fixRemoteRepo :: Flag -> IO Flag
fixRemoteRepo (F.RemoteRepo [Char]
p) = [Char] -> Flag
F.RemoteRepo forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
`fmap` AbsolutePath -> [Char] -> IO [Char]
fixUrl AbsolutePath
d [Char]
p
fixRemoteRepo Flag
f = forall (m :: * -> *) a. Monad m => a -> m a
return Flag
f
fixUrl :: AbsolutePath -> String -> IO String
fixUrl :: AbsolutePath -> [Char] -> IO [Char]
fixUrl AbsolutePath
d [Char]
f = if [Char] -> Bool
isValidLocalPath [Char]
f
then forall a. FilePathLike a => a -> [Char]
toFilePath forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
`fmap` forall p a. FilePathLike p => p -> IO a -> IO a
withCurrentDirectory AbsolutePath
d ([Char] -> IO AbsolutePath
ioAbsolute [Char]
f)
else forall (m :: * -> *) a. Monad m => a -> m a
return [Char]
f
pathsFromArgs :: (AbsolutePath, AbsolutePath) -> [String] -> IO [AnchoredPath]
pathsFromArgs :: (AbsolutePath, AbsolutePath) -> [[Char]] -> IO [AnchoredPath]
pathsFromArgs (AbsolutePath, AbsolutePath)
fps [[Char]]
args = forall a. [Maybe a] -> [a]
catMaybes forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (AbsolutePath, AbsolutePath) -> [[Char]] -> IO [Maybe AnchoredPath]
maybeFixSubPaths (AbsolutePath, AbsolutePath)
fps [[Char]]
args
pathSetFromArgs :: (AbsolutePath, AbsolutePath)
-> [String]
-> IO (Maybe [AnchoredPath])
pathSetFromArgs :: (AbsolutePath, AbsolutePath)
-> [[Char]] -> IO (Maybe [AnchoredPath])
pathSetFromArgs (AbsolutePath, AbsolutePath)
_ [] = forall (m :: * -> *) a. Monad m => a -> m a
return forall a. Maybe a
Nothing
pathSetFromArgs (AbsolutePath, AbsolutePath)
fps [[Char]]
args = do
[AnchoredPath]
pathSet <- forall a. Ord a => [a] -> [a]
nubSort forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. [Maybe a] -> [a]
catMaybes forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (AbsolutePath, AbsolutePath) -> [[Char]] -> IO [Maybe AnchoredPath]
maybeFixSubPaths (AbsolutePath, AbsolutePath)
fps [[Char]]
args
case [AnchoredPath]
pathSet of
[] -> forall (m :: * -> *) a. MonadFail m => [Char] -> m a
fail [Char]
"No valid arguments were given."
[AnchoredPath]
_ -> forall (m :: * -> *) a. Monad m => a -> m a
return forall a b. (a -> b) -> a -> b
$ forall a. a -> Maybe a
Just [AnchoredPath]
pathSet
maybeFixSubPaths :: (AbsolutePath, AbsolutePath)
-> [String]
-> IO [Maybe AnchoredPath]
maybeFixSubPaths :: (AbsolutePath, AbsolutePath) -> [[Char]] -> IO [Maybe AnchoredPath]
maybeFixSubPaths (AbsolutePath
r, AbsolutePath
o) [[Char]]
fs = do
[Maybe AnchoredPath]
fixedFs <- forall (t :: * -> *) (m :: * -> *) a b.
(Traversable t, Monad m) =>
(a -> m b) -> t a -> m (t b)
mapM (forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap Maybe AnchoredPath -> Maybe AnchoredPath
dropInDarcsdir forall b c a. (b -> c) -> (a -> b) -> a -> c
. [Char] -> IO (Maybe AnchoredPath)
fixit) [[Char]]
fs
let bads :: [[Char]]
bads = forall a b. (a, b) -> b
snd forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a b. [(a, b)] -> ([a], [b])
unzip forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. (a -> Bool) -> [a] -> [a]
filter (forall a. Maybe a -> Bool
isNothing forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a b. (a, b) -> a
fst) forall a b. (a -> b) -> a -> b
$ forall a b. [a] -> [b] -> [(a, b)]
zip [Maybe AnchoredPath]
fixedFs [[Char]]
fs
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
unless (forall (t :: * -> *) a. Foldable t => t a -> Bool
null [[Char]]
bads) forall a b. (a -> b) -> a -> b
$
Doc -> IO ()
ePutDocLn forall a b. (a -> b) -> a -> b
$ [Char] -> Doc
text [Char]
"Ignoring invalid repository paths:" Doc -> Doc -> Doc
<+> [[Char]] -> Doc
pathlist [[Char]]
bads
forall (m :: * -> *) a. Monad m => a -> m a
return [Maybe AnchoredPath]
fixedFs
where
dropInDarcsdir :: Maybe AnchoredPath -> Maybe AnchoredPath
dropInDarcsdir (Just AnchoredPath
p) | AnchoredPath -> Bool
inDarcsdir AnchoredPath
p = forall a. Maybe a
Nothing
dropInDarcsdir Maybe AnchoredPath
mp = Maybe AnchoredPath
mp
fixit :: [Char] -> IO (Maybe AnchoredPath)
fixit [Char]
"" = forall (m :: * -> *) a. Monad m => a -> m a
return forall a. Maybe a
Nothing
fixit [Char]
p = do AbsolutePath
ap <- forall p a. FilePathLike p => p -> IO a -> IO a
withCurrentDirectory AbsolutePath
o forall a b. (a -> b) -> a -> b
$ [Char] -> IO AbsolutePath
ioAbsolute [Char]
p
case AbsolutePath -> AbsolutePath -> Maybe SubPath
makeSubPathOf AbsolutePath
r AbsolutePath
ap of
Just SubPath
sp -> forall (m :: * -> *) a. Monad m => a -> m a
return forall a b. (a -> b) -> a -> b
$ forall a. a -> Maybe a
Just forall a b. (a -> b) -> a -> b
$ SubPath -> AnchoredPath
floatSubPath SubPath
sp
Maybe SubPath
Nothing -> do
AbsolutePath
absolutePathByRepodir <- forall p a. FilePathLike p => p -> IO a -> IO a
withCurrentDirectory AbsolutePath
r forall a b. (a -> b) -> a -> b
$ [Char] -> IO AbsolutePath
ioAbsolute [Char]
p
forall (m :: * -> *) a. Monad m => a -> m a
return forall a b. (a -> b) -> a -> b
$ SubPath -> AnchoredPath
floatSubPath forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> AbsolutePath -> AbsolutePath -> Maybe SubPath
makeSubPathOf AbsolutePath
r AbsolutePath
absolutePathByRepodir
getRepourl :: Config -> Maybe String
getRepourl :: Config -> Maybe [Char]
getRepourl Config
fs = case forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimDarcsOption (Maybe [Char])
O.possiblyRemoteRepo Config
fs of
Maybe [Char]
Nothing -> forall a. Maybe a
Nothing
Just [Char]
d -> if Bool -> Bool
not ([Char] -> Bool
isValidLocalPath [Char]
d) then forall a. a -> Maybe a
Just [Char]
d else forall a. Maybe a
Nothing
fileHelpAuthor :: [String]
fileHelpAuthor :: [[Char]]
fileHelpAuthor = [
[Char]
"Each patch is attributed to its author, usually by email address (for",
[Char]
"example, `Fred Bloggs <fred@example.net>`). Darcs looks in several",
[Char]
"places for this author string: the `--author` option, the files",
[Char]
"`_darcs/prefs/author` (in the repository) and `" forall a. [a] -> [a] -> [a]
++ [Char]
globalPrefsDirDoc forall a. [a] -> [a] -> [a]
++ [Char]
"author` (in your",
[Char]
"home directory), and the environment variables `$DARCS_EMAIL` and",
[Char]
"`$EMAIL`. If none of those exist, Darcs will prompt you for an author",
[Char]
"string and write it to `" forall a. [a] -> [a] -> [a]
++ [Char]
globalPrefsDirDoc forall a. [a] -> [a] -> [a]
++ [Char]
"author`. Note that if you have more",
[Char]
"than one email address, you can put them all in `" forall a. [a] -> [a] -> [a]
++ [Char]
globalPrefsDirDoc forall a. [a] -> [a] -> [a]
++ [Char]
"author`,",
[Char]
"one author per line. Darcs will still prompt you for an author, but it",
[Char]
"allows you to select from the list, or to type in an alternative."
]
environmentHelpEmail :: ([String], [String])
environmentHelpEmail :: ([[Char]], [[Char]])
environmentHelpEmail = ([[Char]
"DARCS_EMAIL",[Char]
"EMAIL"], [[Char]]
fileHelpAuthor)
getAuthor :: Maybe String -> Bool -> IO String
getAuthor :: Maybe [Char] -> Bool -> IO [Char]
getAuthor (Just [Char]
author) Bool
_ = forall (m :: * -> *) a. Monad m => a -> m a
return [Char]
author
getAuthor Maybe [Char]
Nothing Bool
pipe =
if Bool
pipe
then [Char] -> IO [Char]
askUser [Char]
"Who is the author? "
else Bool -> Bool -> IO [Char]
promptAuthor Bool
True Bool
False
promptAuthor :: Bool
-> Bool
-> IO String
promptAuthor :: Bool -> Bool -> IO [Char]
promptAuthor Bool
store Bool
alwaysAsk = do
[[Char]]
as <- IO [[Char]]
getEasyAuthor
case [[Char]]
as of
[[Char]
a] -> if Bool
alwaysAsk then
Bool -> IO [Char] -> IO [Char] -> IO [Char]
askForAuthor Bool
False ([[Char]] -> IO [Char]
fancyPrompt [[Char]]
as) ([[Char]] -> IO [Char]
fancyPrompt [[Char]]
as)
else forall (m :: * -> *) a. Monad m => a -> m a
return [Char]
a
[] -> Bool -> IO [Char] -> IO [Char] -> IO [Char]
askForAuthor Bool
True IO [Char]
shortPrompt IO [Char]
longPrompt
[[Char]]
_ -> Bool -> IO [Char] -> IO [Char] -> IO [Char]
askForAuthor Bool
False ([[Char]] -> IO [Char]
fancyPrompt [[Char]]
as) ([[Char]] -> IO [Char]
fancyPrompt [[Char]]
as)
where
shortPrompt :: IO [Char]
shortPrompt = [Char] -> IO [Char]
askUser [Char]
"What is your email address? "
longPrompt :: IO [Char]
longPrompt = [Char] -> IO [Char]
askUser [Char]
"What is your email address (e.g. Fred Bloggs <fred@example.net>)? "
fancyPrompt :: [[Char]] -> IO [Char]
fancyPrompt [[Char]]
xs =
do Doc -> IO ()
putDocLn forall a b. (a -> b) -> a -> b
$ [Char] -> Doc
text [Char]
"" Doc -> Doc -> Doc
$$
[Char] -> Doc
text [Char]
"You have saved the following email addresses to your global settings:"
[Char]
str <- [Char] -> [[Char]] -> IO [Char]
askUserListItem [Char]
"Please select an email address for this repository: " ([[Char]]
xs forall a. [a] -> [a] -> [a]
++ [[Char]
"Other"])
if [Char]
str forall a. Eq a => a -> a -> Bool
== [Char]
"Other"
then IO [Char]
longPrompt
else forall (m :: * -> *) a. Monad m => a -> m a
return [Char]
str
askForAuthor :: Bool -> IO [Char] -> IO [Char] -> IO [Char]
askForAuthor Bool
storeGlobal IO [Char]
askfn1 IO [Char]
askfn2 = do
Bool
aminrepo <- [Char] -> IO Bool
doesDirectoryExist [Char]
prefsDirPath
if Bool
aminrepo Bool -> Bool -> Bool
&& Bool
store then do
[Char]
prefsdir <- if Bool
storeGlobal
then IO [Char]
tryGlobalPrefsDir
else forall (m :: * -> *) a. Monad m => a -> m a
return [Char]
prefsDirPath
Doc -> IO ()
putDocLn forall a b. (a -> b) -> a -> b
$
[Char] -> Doc
text [Char]
"Each patch is attributed to its author, usually by email address (for" Doc -> Doc -> Doc
$$
[Char] -> Doc
text [Char]
"example, `Fred Bloggs <fred@example.net>'). Darcs could not determine" Doc -> Doc -> Doc
$$
[Char] -> Doc
text [Char]
"your email address, so you will be prompted for it." Doc -> Doc -> Doc
$$
[Char] -> Doc
text [Char]
"" Doc -> Doc -> Doc
$$
[Char] -> Doc
text ([Char]
"Your address will be stored in " forall a. [a] -> [a] -> [a]
++ [Char]
prefsdir)
if [Char]
prefsdir forall a. Eq a => a -> a -> Bool
/= [Char]
prefsDirPath then
Doc -> IO ()
putDocLn forall a b. (a -> b) -> a -> b
$
[Char] -> Doc
text [Char]
"It will be used for all patches you record in ALL repositories." Doc -> Doc -> Doc
$$
[Char] -> Doc
text ([Char]
"If you move that file to " forall a. [a] -> [a] -> [a]
++ [Char]
prefsDirPath [Char] -> [Char] -> [Char]
</> [Char]
"author" forall a. [a] -> [a] -> [a]
++ [Char]
", it will") Doc -> Doc -> Doc
$$
[Char] -> Doc
text [Char]
"be used for patches recorded in this repository only."
else
Doc -> IO ()
putDocLn forall a b. (a -> b) -> a -> b
$
[Char] -> Doc
text [Char]
"It will be used for all patches you record in this repository only." Doc -> Doc -> Doc
$$
[Char] -> Doc
text ([Char]
"If you move that file to " forall a. [a] -> [a] -> [a]
++ [Char]
globalPrefsDirDoc forall a. [a] -> [a] -> [a]
++ [Char]
"author, it will") Doc -> Doc -> Doc
$$
[Char] -> Doc
text [Char]
"be used for all patches recorded in ALL repositories."
[Char]
add <- IO [Char]
askfn1
forall p. FilePathLike p => p -> [Char] -> IO ()
writeTextFile ([Char]
prefsdir [Char] -> [Char] -> [Char]
</> [Char]
"author") forall a b. (a -> b) -> a -> b
$
[[Char]] -> [Char]
unlines [[Char]
"# " forall a. [a] -> [a] -> [a]
++ [Char]
line | [Char]
line <- [[Char]]
fileHelpAuthor] forall a. [a] -> [a] -> [a]
++ [Char]
"\n" forall a. [a] -> [a] -> [a]
++ [Char]
add
forall (m :: * -> *) a. Monad m => a -> m a
return [Char]
add
else IO [Char]
askfn2
tryGlobalPrefsDir :: IO [Char]
tryGlobalPrefsDir = do
Maybe [Char]
maybeprefsdir <- IO (Maybe [Char])
globalPrefsDir
case Maybe [Char]
maybeprefsdir of
Maybe [Char]
Nothing -> do
[Char] -> IO ()
putStrLn [Char]
"WARNING: Global preference directory could not be found."
forall (m :: * -> *) a. Monad m => a -> m a
return [Char]
prefsDirPath
Just [Char]
dir -> do Bool
exists <- [Char] -> IO Bool
doesDirectoryExist [Char]
dir
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
unless Bool
exists forall a b. (a -> b) -> a -> b
$ [Char] -> IO ()
createDirectory [Char]
dir
forall (m :: * -> *) a. Monad m => a -> m a
return [Char]
dir
getEasyAuthor :: IO [String]
getEasyAuthor :: IO [[Char]]
getEasyAuthor =
forall {a}. [IO [a]] -> IO [a]
firstNotNullIO [ (forall a. Int -> [a] -> [a]
take Int
1 forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall {a}. [[a]] -> [[a]]
nonblank) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
`fmap` [Char] -> IO [[Char]]
getPreflist [Char]
"author"
, forall {a}. [[a]] -> [[a]]
nonblank forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
`fmap` [Char] -> IO [[Char]]
getGlobal [Char]
"author"
, forall a. Maybe a -> [a]
maybeToList forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
`fmap` [Char] -> IO (Maybe [Char])
lookupEnv [Char]
"DARCS_EMAIL"
, forall a. Maybe a -> [a]
maybeToList forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
`fmap` [Char] -> IO (Maybe [Char])
lookupEnv [Char]
"EMAIL"
]
where
nonblank :: [[a]] -> [[a]]
nonblank = forall a. (a -> Bool) -> [a] -> [a]
filter (Bool -> Bool
not forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (t :: * -> *) a. Foldable t => t a -> Bool
null)
firstNotNullIO :: [IO [a]] -> IO [a]
firstNotNullIO [] = forall (m :: * -> *) a. Monad m => a -> m a
return []
firstNotNullIO (IO [a]
e:[IO [a]]
es) = do
[a]
v <- IO [a]
e forall a. IO a -> IO a -> IO a
`catchall` forall (m :: * -> *) a. Monad m => a -> m a
return []
if forall (t :: * -> *) a. Foldable t => t a -> Bool
null [a]
v then [IO [a]] -> IO [a]
firstNotNullIO [IO [a]]
es else forall (m :: * -> *) a. Monad m => a -> m a
return [a]
v
getDate :: Bool -> IO String
getDate :: Bool -> IO [Char]
getDate Bool
hasPipe = if Bool
hasPipe then [Char] -> IO [Char]
cleanLocalDate forall (m :: * -> *) a b. Monad m => (a -> m b) -> m a -> m b
=<< [Char] -> IO [Char]
askUser [Char]
"What is the date? "
else IO [Char]
getIsoDateTime
environmentHelpSendmail :: ([String], [String])
environmentHelpSendmail :: ([[Char]], [[Char]])
environmentHelpSendmail = ([[Char]
"SENDMAIL"], [
[Char]
"On Unix, the `darcs send` command relies on sendmail(8). The",
[Char]
"`--sendmail-command` or $SENDMAIL environment variable can be used to",
[Char]
"provide an explicit path to this program; otherwise the standard",
[Char]
"locations /usr/sbin/sendmail and /usr/lib/sendmail will be tried."])
getSendmailCmd :: Config -> IO (Maybe String)
getSendmailCmd :: Config -> IO (Maybe [Char])
getSendmailCmd Config
fs =
case forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimDarcsOption (Maybe [Char])
O.sendmailCmd Config
fs of
Maybe [Char]
Nothing -> [Char] -> IO (Maybe [Char])
lookupEnv [Char]
"SENDMAIL"
Maybe [Char]
justcmd -> forall (m :: * -> *) a. Monad m => a -> m a
return Maybe [Char]
justcmd
getOutput :: Config -> FilePath -> Maybe AbsolutePathOrStd
getOutput :: Config -> [Char] -> Maybe AbsolutePathOrStd
getOutput Config
fs [Char]
fp = forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap Output -> AbsolutePathOrStd
go (forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimDarcsOption (Maybe Output)
O.output Config
fs) where
go :: Output -> AbsolutePathOrStd
go (O.Output AbsolutePathOrStd
ap) = AbsolutePathOrStd
ap
go (O.OutputAutoName AbsolutePath
ap) = AbsolutePath -> [Char] -> AbsolutePathOrStd
makeAbsoluteOrStd AbsolutePath
ap [Char]
fp
getSubject :: Config -> Maybe String
getSubject :: Config -> Maybe [Char]
getSubject = HeaderFields -> Maybe [Char]
O._subject forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimDarcsOption HeaderFields
O.headerFields
getCc :: Config -> String
getCc :: Config -> [Char]
getCc = forall a. [a] -> [[a]] -> [a]
intercalate [Char]
" , " forall b c a. (b -> c) -> (a -> b) -> a -> c
. HeaderFields -> [[Char]]
O._cc forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimDarcsOption HeaderFields
O.headerFields
getInReplyTo :: Config -> Maybe String
getInReplyTo :: Config -> Maybe [Char]
getInReplyTo = HeaderFields -> Maybe [Char]
O._inReplyTo forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimDarcsOption HeaderFields
O.headerFields
hasXmlOutput :: Config -> Bool
hasXmlOutput :: Config -> Bool
hasXmlOutput = (forall a. Eq a => a -> a -> Bool
== XmlOutput
O.YesXml) forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimDarcsOption XmlOutput
O.xmlOutput
hasLogfile :: Config -> Maybe AbsolutePath
hasLogfile :: Config -> Maybe AbsolutePath
hasLogfile = Logfile -> Maybe AbsolutePath
O._logfile forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimDarcsOption Logfile
O.logfile
workRepo :: Config -> WorkRepo
workRepo :: Config -> WorkRepo
workRepo = forall (d :: * -> *) f a b. OptSpec d f a b -> b -> [f] -> a
oparse (PrimDarcsOption (Maybe [Char])
O.repoDir forall (d :: * -> *) f b c a.
OptSpec d f b c -> OptSpec d f a b -> OptSpec d f a c
^ PrimDarcsOption (Maybe [Char])
O.possiblyRemoteRepo) Maybe [Char] -> Maybe [Char] -> WorkRepo
go
where
go :: Maybe [Char] -> Maybe [Char] -> WorkRepo
go (Just [Char]
s) Maybe [Char]
_ = [Char] -> WorkRepo
WorkRepoDir [Char]
s
go Maybe [Char]
Nothing (Just [Char]
s) = [Char] -> WorkRepo
WorkRepoPossibleURL [Char]
s
go Maybe [Char]
Nothing Maybe [Char]
Nothing = WorkRepo
WorkRepoCurrentDir
withNewRepo :: String -> Config -> Config
withNewRepo :: [Char] -> Config -> Config
withNewRepo [Char]
dir = forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> v -> [f] -> [f]
unparseOpt PrimDarcsOption (Maybe [Char])
O.newRepo (forall a. a -> Maybe a
Just [Char]
dir)