{-# LANGUAGE OverloadedStrings #-}
module Darcs.UI.RunCommand
( runTheCommand
, runWithHooks
) where
import Darcs.Prelude
import Control.Monad ( unless, when )
import Data.List ( intercalate )
import System.Console.GetOpt( ArgOrder( Permute, RequireOrder ),
OptDescr( Option ),
getOpt )
import System.Exit ( ExitCode ( ExitSuccess ), exitWith )
import Darcs.UI.Options ( (^), odesc, oparse, parseFlags, optDescr, (?) )
import Darcs.UI.Options.All
( stdCmdActions, StdCmdAction(..)
, debugging, verbosity, Verbosity(..)
, HooksConfig(..), hooks )
import Darcs.UI.Defaults ( applyDefaults )
import Darcs.UI.External ( viewDoc )
import Darcs.UI.Flags ( DarcsFlag, matchAny, withNewRepo )
import Darcs.UI.Commands
( CommandArgs( CommandOnly, SuperCommandOnly, SuperCommandSub )
, CommandControl
, DarcsCommand
, commandName
, commandCommand
, commandPrereq
, commandExtraArgHelp
, commandExtraArgs
, commandArgdefaults
, commandCompleteArgs
, commandOptDescr
, commandName
, disambiguateCommands
, getSubcommands
, extractCommands
, superName
)
import Darcs.UI.Commands.GZCRCs ( doCRCWarnings )
import Darcs.UI.Commands.Clone ( makeRepoName, cloneToSSH )
import Darcs.UI.RunHook ( runPosthook, runPrehook )
import Darcs.UI.Usage
( getCommandHelp
, getCommandMiniHelp
, subusage
)
import Darcs.Patch.Match ( checkMatchSyntax )
import Darcs.Repository.Prefs ( Pref(Defaults), getGlobal, getPreflist )
import Darcs.Util.AtExit ( atexit )
import Darcs.Util.Exception ( die )
import Darcs.Util.Global ( setDebugMode, setTimingsMode )
import Darcs.Util.Path ( AbsolutePath, getCurrentDirectory, toPath, ioAbsoluteOrRemote, makeAbsolute )
import Darcs.Util.Printer ( (<+>), ($+$), renderString, text, vcat )
import Darcs.Util.Printer.Color ( ePutDocLn )
import Darcs.Util.Progress ( setProgressMode )
runTheCommand :: [CommandControl] -> String -> [String] -> IO ()
runTheCommand :: [CommandControl] -> String -> [String] -> IO ()
runTheCommand [CommandControl]
commandControlList String
cmd [String]
args =
(String -> IO ())
-> ((CommandArgs, [String]) -> IO ())
-> Either String (CommandArgs, [String])
-> IO ()
forall a c b. (a -> c) -> (b -> c) -> Either a b -> c
either String -> IO ()
forall a. String -> IO a
die (CommandArgs, [String]) -> IO ()
rtc (Either String (CommandArgs, [String]) -> IO ())
-> Either String (CommandArgs, [String]) -> IO ()
forall a b. (a -> b) -> a -> b
$ [CommandControl]
-> String -> [String] -> Either String (CommandArgs, [String])
disambiguateCommands [CommandControl]
commandControlList String
cmd [String]
args
where
rtc :: (CommandArgs, [String]) -> IO ()
rtc (CommandOnly DarcsCommand
c, [String]
as) = Maybe DarcsCommand -> DarcsCommand -> [String] -> IO ()
runCommand Maybe DarcsCommand
forall a. Maybe a
Nothing DarcsCommand
c [String]
as
rtc (SuperCommandOnly DarcsCommand
c, [String]
as) = DarcsCommand -> [String] -> IO ()
runRawSupercommand DarcsCommand
c [String]
as
rtc (SuperCommandSub DarcsCommand
c DarcsCommand
s, [String]
as) = Maybe DarcsCommand -> DarcsCommand -> [String] -> IO ()
runCommand (DarcsCommand -> Maybe DarcsCommand
forall a. a -> Maybe a
Just DarcsCommand
c) DarcsCommand
s [String]
as
runCommand :: Maybe DarcsCommand -> DarcsCommand -> [String] -> IO ()
runCommand :: Maybe DarcsCommand -> DarcsCommand -> [String] -> IO ()
runCommand Maybe DarcsCommand
_ DarcsCommand
_ [String]
args
| String
"-all" String -> [String] -> Bool
forall a. Eq a => a -> [a] -> Bool
forall (t :: * -> *) a. (Foldable t, Eq a) => a -> t a -> Bool
`elem` [String]
args =
String -> IO ()
forall a. String -> IO a
die String
"Are you sure you didn't mean --all rather than -all?"
runCommand Maybe DarcsCommand
msuper DarcsCommand
cmd [String]
args = do
AbsolutePath
old_wd <- IO AbsolutePath
getCurrentDirectory
let options :: [OptDescr DarcsFlag]
options = AbsolutePath -> DarcsCommand -> [OptDescr DarcsFlag]
commandOptDescr AbsolutePath
old_wd DarcsCommand
cmd
case ([DarcsFlag], [String], [String])
-> ([DarcsFlag], [String], [String])
forall a b. (a, b, [String]) -> (a, b, [String])
fixupMsgs (([DarcsFlag], [String], [String])
-> ([DarcsFlag], [String], [String]))
-> ([DarcsFlag], [String], [String])
-> ([DarcsFlag], [String], [String])
forall a b. (a -> b) -> a -> b
$ ArgOrder DarcsFlag
-> [OptDescr DarcsFlag]
-> [String]
-> ([DarcsFlag], [String], [String])
forall a.
ArgOrder a -> [OptDescr a] -> [String] -> ([a], [String], [String])
getOpt ArgOrder DarcsFlag
forall a. ArgOrder a
Permute [OptDescr DarcsFlag]
options [String]
args of
([DarcsFlag]
cmdline_flags,[String]
orig_extra,[String]
getopt_errs) -> do
Either String ()
prereq_errors <- DarcsCommand -> [DarcsFlag] -> IO (Either String ())
commandPrereq DarcsCommand
cmd [DarcsFlag]
cmdline_flags
AbsolutePath
new_wd <- IO AbsolutePath
getCurrentDirectory
[String]
user_defs <- Pref -> IO [String]
getGlobal Pref
Defaults
[String]
repo_defs <- Pref -> IO [String]
getPreflist Pref
Defaults
let ([DarcsFlag]
flags, ([String]
flag_warnings, [String]
flag_errors)) =
Maybe String
-> DarcsCommand
-> AbsolutePath
-> [String]
-> [String]
-> [DarcsFlag]
-> ([DarcsFlag], ([String], [String]))
applyDefaults ((DarcsCommand -> String) -> Maybe DarcsCommand -> Maybe String
forall a b. (a -> b) -> Maybe a -> Maybe b
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap DarcsCommand -> String
commandName Maybe DarcsCommand
msuper) DarcsCommand
cmd AbsolutePath
old_wd [String]
user_defs [String]
repo_defs [DarcsFlag]
cmdline_flags
case (forall a.
PrimOptSpec DarcsOptDescr DarcsFlag a (Maybe StdCmdAction))
-> [DarcsFlag] -> Maybe StdCmdAction
forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimOptSpec DarcsOptDescr DarcsFlag a (Maybe StdCmdAction)
forall a.
PrimOptSpec DarcsOptDescr DarcsFlag a (Maybe StdCmdAction)
stdCmdActions [DarcsFlag]
flags of
Just StdCmdAction
Help -> Doc -> IO ()
viewDoc (Doc -> IO ()) -> Doc -> IO ()
forall a b. (a -> b) -> a -> b
$ Maybe DarcsCommand -> DarcsCommand -> Doc
getCommandHelp Maybe DarcsCommand
msuper DarcsCommand
cmd
Just StdCmdAction
ListOptions -> do
Bool -> IO ()
setProgressMode Bool
False
[String]
possible_args <- DarcsCommand
-> (AbsolutePath, AbsolutePath)
-> [DarcsFlag]
-> [String]
-> IO [String]
commandCompleteArgs DarcsCommand
cmd (AbsolutePath
new_wd, AbsolutePath
old_wd) [DarcsFlag]
flags [String]
orig_extra
(String -> IO ()) -> [String] -> IO ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ String -> IO ()
putStrLn ([String] -> IO ()) -> [String] -> IO ()
forall a b. (a -> b) -> a -> b
$ [OptDescr DarcsFlag] -> [String]
optionList [OptDescr DarcsFlag]
options [String] -> [String] -> [String]
forall a. [a] -> [a] -> [a]
++ [String]
possible_args
Just StdCmdAction
Disable ->
String -> IO ()
forall a. String -> IO a
die (String -> IO ()) -> String -> IO ()
forall a b. (a -> b) -> a -> b
$ String
"Command "String -> String -> String
forall a. [a] -> [a] -> [a]
++DarcsCommand -> String
commandName DarcsCommand
cmdString -> String -> String
forall a. [a] -> [a] -> [a]
++String
" disabled with --disable option!"
Maybe StdCmdAction
Nothing -> case Either String ()
prereq_errors of
Left String
complaint -> String -> IO ()
forall a. String -> IO a
die (String -> IO ()) -> String -> IO ()
forall a b. (a -> b) -> a -> b
$
String
"Unable to '" String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
"darcs " String -> String -> String
forall a. [a] -> [a] -> [a]
++ Maybe DarcsCommand -> String
superName Maybe DarcsCommand
msuper String -> String -> String
forall a. [a] -> [a] -> [a]
++ DarcsCommand -> String
commandName DarcsCommand
cmd String -> String -> String
forall a. [a] -> [a] -> [a]
++
String
"' here:\n" String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
complaint
Right () -> do
Doc -> IO ()
ePutDocLn (Doc -> IO ()) -> Doc -> IO ()
forall a b. (a -> b) -> a -> b
$ [Doc] -> Doc
vcat ([Doc] -> Doc) -> [Doc] -> Doc
forall a b. (a -> b) -> a -> b
$ (String -> Doc) -> [String] -> [Doc]
forall a b. (a -> b) -> [a] -> [b]
map String -> Doc
text ([String] -> [Doc]) -> [String] -> [Doc]
forall a b. (a -> b) -> a -> b
$ [String]
flag_warnings
case [String]
getopt_errs [String] -> [String] -> [String]
forall a. [a] -> [a] -> [a]
++ [String]
flag_errors of
[] -> do
[String]
extra <- DarcsCommand
-> [DarcsFlag] -> AbsolutePath -> [String] -> IO [String]
commandArgdefaults DarcsCommand
cmd [DarcsFlag]
flags AbsolutePath
old_wd [String]
orig_extra
case [String] -> DarcsCommand -> Maybe DarcsCommand -> Maybe String
extraArgumentsError [String]
extra DarcsCommand
cmd Maybe DarcsCommand
msuper of
Maybe String
Nothing -> DarcsCommand
-> (AbsolutePath, AbsolutePath) -> [DarcsFlag] -> [String] -> IO ()
runWithHooks DarcsCommand
cmd (AbsolutePath
new_wd, AbsolutePath
old_wd) [DarcsFlag]
flags [String]
extra
Just String
msg -> String -> IO ()
forall a. String -> IO a
die String
msg
[String]
errors -> String -> IO ()
forall a. String -> IO a
forall (m :: * -> *) a. MonadFail m => String -> m a
fail (String -> IO ()) -> String -> IO ()
forall a b. (a -> b) -> a -> b
$ String -> [String] -> String
forall a. [a] -> [[a]] -> [a]
intercalate String
"\n" [String]
errors
fixupMsgs :: (a, b, [String]) -> (a, b, [String])
fixupMsgs :: forall a b. (a, b, [String]) -> (a, b, [String])
fixupMsgs (a
fs,b
as,[String]
es) = (a
fs,b
as,(String -> String) -> [String] -> [String]
forall a b. (a -> b) -> [a] -> [b]
map ((String
"command line: "String -> String -> String
forall a. [a] -> [a] -> [a]
++)(String -> String) -> (String -> String) -> String -> String
forall b c a. (b -> c) -> (a -> b) -> a -> c
.String -> String
chompTrailingNewline) [String]
es)
where
chompTrailingNewline :: String -> String
chompTrailingNewline String
"" = String
""
chompTrailingNewline String
s = if String -> Char
forall a. HasCallStack => [a] -> a
last String
s Char -> Char -> Bool
forall a. Eq a => a -> a -> Bool
== Char
'\n' then String -> String
forall a. HasCallStack => [a] -> [a]
init String
s else String
s
runWithHooks :: DarcsCommand
-> (AbsolutePath, AbsolutePath)
-> [DarcsFlag] -> [String] -> IO ()
runWithHooks :: DarcsCommand
-> (AbsolutePath, AbsolutePath) -> [DarcsFlag] -> [String] -> IO ()
runWithHooks DarcsCommand
cmd (AbsolutePath
new_wd, AbsolutePath
old_wd) [DarcsFlag]
flags [String]
extra = do
[MatchFlag] -> IO ()
checkMatchSyntax ([MatchFlag] -> IO ()) -> [MatchFlag] -> IO ()
forall a b. (a -> b) -> a -> b
$ PrimOptSpec DarcsOptDescr DarcsFlag a [MatchFlag]
MatchOption
matchAny MatchOption -> [DarcsFlag] -> [MatchFlag]
forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
? [DarcsFlag]
flags
OptSpec
DarcsOptDescr
DarcsFlag
(IO ())
(Verbosity -> Bool -> Bool -> IO ())
-> (Verbosity -> Bool -> Bool -> IO ()) -> [DarcsFlag] -> IO ()
forall (d :: * -> *) f a b. OptSpec d f a b -> b -> [f] -> a
oparse (PrimOptSpec
DarcsOptDescr DarcsFlag (Bool -> Bool -> IO ()) Verbosity
PrimDarcsOption Verbosity
verbosity PrimOptSpec
DarcsOptDescr DarcsFlag (Bool -> Bool -> IO ()) Verbosity
-> OptSpec DarcsOptDescr DarcsFlag (IO ()) (Bool -> Bool -> IO ())
-> OptSpec
DarcsOptDescr
DarcsFlag
(IO ())
(Verbosity -> Bool -> Bool -> IO ())
forall (d :: * -> *) f b c a.
OptSpec d f b c -> OptSpec d f a b -> OptSpec d f a c
^ OptSpec DarcsOptDescr DarcsFlag (IO ()) (Bool -> Bool -> IO ())
forall a. DarcsOption a (Bool -> Bool -> a)
debugging) Verbosity -> Bool -> Bool -> IO ()
setGlobalVariables [DarcsFlag]
flags
let hooksCfg :: HooksConfig
hooksCfg = (forall a. PrimOptSpec DarcsOptDescr DarcsFlag a HooksConfig)
-> [DarcsFlag] -> HooksConfig
forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags DarcsOption a (HooksConfig -> a)
forall a. PrimOptSpec DarcsOptDescr DarcsFlag a HooksConfig
hooks [DarcsFlag]
flags
let verb :: Verbosity
verb = PrimDarcsOption Verbosity -> [DarcsFlag] -> Verbosity
forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimOptSpec DarcsOptDescr DarcsFlag a Verbosity
PrimDarcsOption Verbosity
verbosity [DarcsFlag]
flags
ExitCode
preHookExitCode <- HookConfig -> Verbosity -> AbsolutePath -> IO ExitCode
runPrehook (HooksConfig -> HookConfig
pre HooksConfig
hooksCfg) Verbosity
verb AbsolutePath
new_wd
if ExitCode
preHookExitCode ExitCode -> ExitCode -> Bool
forall a. Eq a => a -> a -> Bool
/= ExitCode
ExitSuccess
then ExitCode -> IO ()
forall a. ExitCode -> IO a
exitWith ExitCode
preHookExitCode
else do AbsolutePath
phDir <- AbsolutePath
-> DarcsCommand -> [DarcsFlag] -> [String] -> IO AbsolutePath
getPosthookDir AbsolutePath
new_wd DarcsCommand
cmd [DarcsFlag]
flags [String]
extra
DarcsCommand
-> (AbsolutePath, AbsolutePath) -> [DarcsFlag] -> [String] -> IO ()
commandCommand DarcsCommand
cmd (AbsolutePath
new_wd, AbsolutePath
old_wd) [DarcsFlag]
flags [String]
extra
ExitCode
postHookExitCode <- HookConfig -> Verbosity -> AbsolutePath -> IO ExitCode
runPosthook (HooksConfig -> HookConfig
post HooksConfig
hooksCfg) Verbosity
verb AbsolutePath
phDir
ExitCode -> IO ()
forall a. ExitCode -> IO a
exitWith ExitCode
postHookExitCode
setGlobalVariables :: Verbosity -> Bool -> Bool -> IO ()
setGlobalVariables :: Verbosity -> Bool -> Bool -> IO ()
setGlobalVariables Verbosity
verb Bool
debug Bool
timings = do
Bool -> IO () -> IO ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when Bool
timings IO ()
setTimingsMode
Bool -> IO () -> IO ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when Bool
debug IO ()
setDebugMode
Bool -> IO () -> IO ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
when (Verbosity
verb Verbosity -> Verbosity -> Bool
forall a. Eq a => a -> a -> Bool
== Verbosity
Quiet) (IO () -> IO ()) -> IO () -> IO ()
forall a b. (a -> b) -> a -> b
$ Bool -> IO ()
setProgressMode Bool
False
Bool -> IO () -> IO ()
forall (f :: * -> *). Applicative f => Bool -> f () -> f ()
unless (Verbosity
verb Verbosity -> Verbosity -> Bool
forall a. Eq a => a -> a -> Bool
== Verbosity
Quiet) (IO () -> IO ()) -> IO () -> IO ()
forall a b. (a -> b) -> a -> b
$ IO () -> IO ()
atexit (IO () -> IO ()) -> IO () -> IO ()
forall a b. (a -> b) -> a -> b
$ Bool -> IO ()
doCRCWarnings (Verbosity
verb Verbosity -> Verbosity -> Bool
forall a. Eq a => a -> a -> Bool
== Verbosity
Verbose)
getPosthookDir :: AbsolutePath -> DarcsCommand -> [DarcsFlag] -> [String] -> IO AbsolutePath
getPosthookDir :: AbsolutePath
-> DarcsCommand -> [DarcsFlag] -> [String] -> IO AbsolutePath
getPosthookDir AbsolutePath
new_wd DarcsCommand
cmd [DarcsFlag]
flags [String]
extra | DarcsCommand -> String
commandName DarcsCommand
cmd String -> [String] -> Bool
forall a. Eq a => a -> [a] -> Bool
forall (t :: * -> *) a. (Foldable t, Eq a) => a -> t a -> Bool
`elem` [String
"get",String
"clone"] = do
case [String]
extra of
[String
inrepodir, String
outname] -> AbsolutePath
-> DarcsCommand -> [DarcsFlag] -> [String] -> IO AbsolutePath
getPosthookDir AbsolutePath
new_wd DarcsCommand
cmd (String -> [DarcsFlag] -> [DarcsFlag]
withNewRepo String
outname [DarcsFlag]
flags) [String
inrepodir]
[String
inrepodir] ->
case [DarcsFlag] -> Maybe String
cloneToSSH [DarcsFlag]
flags of
Maybe String
Nothing -> do
String
repodir <- AbsoluteOrRemotePath -> String
forall a. FilePathOrURL a => a -> String
toPath (AbsoluteOrRemotePath -> String)
-> IO AbsoluteOrRemotePath -> IO String
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> String -> IO AbsoluteOrRemotePath
ioAbsoluteOrRemote String
inrepodir
String
newRepo <- Bool -> [DarcsFlag] -> String -> IO String
makeRepoName Bool
False [DarcsFlag]
flags String
repodir
AbsolutePath -> IO AbsolutePath
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return (AbsolutePath -> IO AbsolutePath)
-> AbsolutePath -> IO AbsolutePath
forall a b. (a -> b) -> a -> b
$ AbsolutePath -> String -> AbsolutePath
makeAbsolute AbsolutePath
new_wd String
newRepo
Maybe String
_ -> AbsolutePath -> IO AbsolutePath
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return AbsolutePath
new_wd
[String]
_ -> String -> IO AbsolutePath
forall a. String -> IO a
die String
"You must provide 'clone' with either one or two arguments."
getPosthookDir AbsolutePath
new_wd DarcsCommand
_ [DarcsFlag]
_ [String]
_ = AbsolutePath -> IO AbsolutePath
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return AbsolutePath
new_wd
extraArgumentsError :: [String]
-> DarcsCommand
-> Maybe DarcsCommand
-> Maybe String
[String]
extra DarcsCommand
cmd Maybe DarcsCommand
msuper
| Int
extraArgsCmd Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
< Int
0 = Maybe String
forall a. Maybe a
Nothing
| Int
extraArgsInput Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
> Int
extraArgsCmd = String -> Maybe String
forall a. a -> Maybe a
Just String
badArg
| Int
extraArgsInput Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
< Int
extraArgsCmd = String -> Maybe String
forall a. a -> Maybe a
Just String
missingArg
| Bool
otherwise = Maybe String
forall a. Maybe a
Nothing
where
extraArgsInput :: Int
extraArgsInput = [String] -> Int
forall a. [a] -> Int
forall (t :: * -> *) a. Foldable t => t a -> Int
length [String]
extra
extraArgsCmd :: Int
extraArgsCmd = DarcsCommand -> Int
commandExtraArgs DarcsCommand
cmd
badArg :: String
badArg = String
"Bad argument: `" String -> String -> String
forall a. [a] -> [a] -> [a]
++ [String] -> String
unwords [String]
extra String -> String -> String
forall a. [a] -> [a] -> [a]
++
String
"'\n" String -> String -> String
forall a. [a] -> [a] -> [a]
++ Maybe DarcsCommand -> DarcsCommand -> String
getCommandMiniHelp Maybe DarcsCommand
msuper DarcsCommand
cmd
missingArg :: String
missingArg = String
"Missing argument: " String -> String -> String
forall a. [a] -> [a] -> [a]
++ Int -> String
forall {t}. (Eq t, Num t) => t -> String
nthArg ([String] -> Int
forall a. [a] -> Int
forall (t :: * -> *) a. Foldable t => t a -> Int
length [String]
extra Int -> Int -> Int
forall a. Num a => a -> a -> a
+ Int
1) String -> String -> String
forall a. [a] -> [a] -> [a]
++
String
"\n" String -> String -> String
forall a. [a] -> [a] -> [a]
++ Maybe DarcsCommand -> DarcsCommand -> String
getCommandMiniHelp Maybe DarcsCommand
msuper DarcsCommand
cmd
nthArg :: t -> String
nthArg t
n = t -> [String] -> String
forall {t} {a}. (Eq t, Num t, IsString a) => t -> [a] -> a
nthOf t
n (DarcsCommand -> [String]
commandExtraArgHelp DarcsCommand
cmd)
nthOf :: t -> [a] -> a
nthOf t
1 (a
h:[a]
_) = a
h
nthOf t
n (a
_:[a]
hs) = t -> [a] -> a
nthOf (t
nt -> t -> t
forall a. Num a => a -> a -> a
-t
1) [a]
hs
nthOf t
_ [] = a
"UNDOCUMENTED"
optionList :: [OptDescr DarcsFlag] -> [String]
optionList :: [OptDescr DarcsFlag] -> [String]
optionList = (OptDescr DarcsFlag -> [String])
-> [OptDescr DarcsFlag] -> [String]
forall (t :: * -> *) a b. Foldable t => (a -> [b]) -> t a -> [b]
concatMap OptDescr DarcsFlag -> [String]
forall {a}. OptDescr a -> [String]
names
where
names :: OptDescr a -> [String]
names (Option String
sos [String]
los ArgDescr a
_ String
desc) =
(Char -> String) -> String -> [String]
forall a b. (a -> b) -> [a] -> [b]
map (String -> Char -> String
short String
desc) String
sos [String] -> [String] -> [String]
forall a. [a] -> [a] -> [a]
++ (String -> String) -> [String] -> [String]
forall a b. (a -> b) -> [a] -> [b]
map (String -> String -> String
long String
desc) [String]
los
short :: String -> Char -> String
short String
d Char
o = Char
'-' Char -> String -> String
forall a. a -> [a] -> [a]
: Char
o Char -> String -> String
forall a. a -> [a] -> [a]
: String
";" String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
d
long :: String -> String -> String
long String
d String
o = String
"--" String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
o String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
";" String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
d
runRawSupercommand :: DarcsCommand -> [String] -> IO ()
runRawSupercommand :: DarcsCommand -> [String] -> IO ()
runRawSupercommand DarcsCommand
super [] =
String -> IO ()
forall a. String -> IO a
die (String -> IO ()) -> String -> IO ()
forall a b. (a -> b) -> a -> b
$ Doc -> String
renderString (Doc -> String) -> Doc -> String
forall a b. (a -> b) -> a -> b
$
Doc
"Command '" Doc -> Doc -> Doc
forall a. Semigroup a => a -> a -> a
<> String -> Doc
text (DarcsCommand -> String
commandName DarcsCommand
super) Doc -> Doc -> Doc
forall a. Semigroup a => a -> a -> a
<> Doc
"' requires a subcommand!"
Doc -> Doc -> Doc
$+$
DarcsCommand -> Doc
subusage DarcsCommand
super
runRawSupercommand DarcsCommand
super [String]
args = do
AbsolutePath
cwd <- IO AbsolutePath
getCurrentDirectory
case ([DarcsFlag], [String], [String])
-> ([DarcsFlag], [String], [String])
forall a b. (a, b, [String]) -> (a, b, [String])
fixupMsgs (([DarcsFlag], [String], [String])
-> ([DarcsFlag], [String], [String]))
-> ([DarcsFlag], [String], [String])
-> ([DarcsFlag], [String], [String])
forall a b. (a -> b) -> a -> b
$ ArgOrder DarcsFlag
-> [OptDescr DarcsFlag]
-> [String]
-> ([DarcsFlag], [String], [String])
forall a.
ArgOrder a -> [OptDescr a] -> [String] -> ([a], [String], [String])
getOpt ArgOrder DarcsFlag
forall a. ArgOrder a
RequireOrder ((DarcsOptDescr DarcsFlag -> OptDescr DarcsFlag)
-> [DarcsOptDescr DarcsFlag] -> [OptDescr DarcsFlag]
forall a b. (a -> b) -> [a] -> [b]
map (AbsolutePath -> DarcsOptDescr DarcsFlag -> OptDescr DarcsFlag
forall f. AbsolutePath -> DarcsOptDescr f -> OptDescr f
optDescr AbsolutePath
cwd) (OptSpec DarcsOptDescr DarcsFlag Any (Maybe StdCmdAction -> Any)
-> [DarcsOptDescr DarcsFlag]
forall (d :: * -> *) f a b. OptSpec d f a b -> [d f]
odesc OptSpec DarcsOptDescr DarcsFlag Any (Maybe StdCmdAction -> Any)
forall a.
PrimOptSpec DarcsOptDescr DarcsFlag a (Maybe StdCmdAction)
stdCmdActions)) [String]
args of
([DarcsFlag]
flags,[String]
_,[String]
getopt_errs) -> case (forall a.
PrimOptSpec DarcsOptDescr DarcsFlag a (Maybe StdCmdAction))
-> [DarcsFlag] -> Maybe StdCmdAction
forall (d :: * -> *) f v.
(forall a. PrimOptSpec d f a v) -> [f] -> v
parseFlags PrimOptSpec DarcsOptDescr DarcsFlag a (Maybe StdCmdAction)
forall a.
PrimOptSpec DarcsOptDescr DarcsFlag a (Maybe StdCmdAction)
stdCmdActions [DarcsFlag]
flags of
Just StdCmdAction
Help ->
Doc -> IO ()
viewDoc (Doc -> IO ()) -> Doc -> IO ()
forall a b. (a -> b) -> a -> b
$ Maybe DarcsCommand -> DarcsCommand -> Doc
getCommandHelp Maybe DarcsCommand
forall a. Maybe a
Nothing DarcsCommand
super
Just StdCmdAction
ListOptions -> do
String -> IO ()
putStrLn String
"--help"
(DarcsCommand -> IO ()) -> [DarcsCommand] -> IO ()
forall (t :: * -> *) (m :: * -> *) a b.
(Foldable t, Monad m) =>
(a -> m b) -> t a -> m ()
mapM_ (String -> IO ()
putStrLn (String -> IO ())
-> (DarcsCommand -> String) -> DarcsCommand -> IO ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. DarcsCommand -> String
commandName) ([CommandControl] -> [DarcsCommand]
extractCommands ([CommandControl] -> [DarcsCommand])
-> [CommandControl] -> [DarcsCommand]
forall a b. (a -> b) -> a -> b
$ DarcsCommand -> [CommandControl]
getSubcommands DarcsCommand
super)
Just StdCmdAction
Disable -> do
String -> IO ()
forall a. String -> IO a
die (String -> IO ()) -> String -> IO ()
forall a b. (a -> b) -> a -> b
$ Doc -> String
renderString (Doc -> String) -> Doc -> String
forall a b. (a -> b) -> a -> b
$
Doc
"Command" Doc -> Doc -> Doc
<+> String -> Doc
text (DarcsCommand -> String
commandName DarcsCommand
super) Doc -> Doc -> Doc
<+> Doc
"disabled with --disable option!"
Maybe StdCmdAction
Nothing ->
String -> IO ()
forall a. String -> IO a
die (String -> IO ()) -> String -> IO ()
forall a b. (a -> b) -> a -> b
$ Doc -> String
renderString (Doc -> String) -> Doc -> String
forall a b. (a -> b) -> a -> b
$
case [String]
getopt_errs of
[] -> String -> Doc
text String
"Invalid subcommand!" Doc -> Doc -> Doc
$+$ DarcsCommand -> Doc
subusage DarcsCommand
super
[String]
_ -> [Doc] -> Doc
vcat ((String -> Doc) -> [String] -> [Doc]
forall a b. (a -> b) -> [a] -> [b]
map String -> Doc
text [String]
getopt_errs)