darcs-2.1.98.2: a distributed, interactive, smart revision control systemSource codeContentsIndex
Darcs.External
Synopsis
backupByRenaming :: FilePath -> IO ()
backupByCopying :: FilePath -> IO ()
copyFileOrUrl :: [DarcsFlag] -> FilePath -> FilePath -> Cachable -> IO ()
speculateFileOrUrl :: String -> FilePath -> IO ()
copyFilesOrUrls :: [DarcsFlag] -> FilePath -> [String] -> FilePath -> Cachable -> IO ()
copyLocal :: [DarcsFlag] -> String -> FilePath -> IO ()
cloneFile :: FilePath -> FilePath -> IO ()
cloneTree :: FilePath -> FilePath -> IO ()
cloneTreeExcept :: [FilePath] -> FilePath -> FilePath -> IO ()
clonePartialsTree :: FilePath -> FilePath -> [FilePath] -> IO ()
clonePaths :: FilePath -> FilePath -> [FilePath] -> IO ()
fetchFilePS :: String -> Cachable -> IO ByteString
gzFetchFilePS :: String -> Cachable -> IO ByteString
sendEmail :: String -> String -> String -> String -> String -> String -> IO ()
generateEmail :: Handle -> String -> String -> String -> String -> Doc -> IO ()
sendEmailDoc :: String -> String -> String -> String -> String -> Maybe (Doc, Doc) -> Doc -> IO ()
resendEmail :: String -> String -> ByteString -> IO ()
signString :: [DarcsFlag] -> Doc -> IO Doc
verifyPS :: [DarcsFlag] -> ByteString -> IO (Maybe ByteString)
execDocPipe :: String -> [String] -> Doc -> IO Doc
execPipeIgnoreError :: String -> [String] -> Doc -> IO Doc
getTermNColors :: IO Int
pipeDoc :: String -> [String] -> Doc -> IO ExitCode
pipeDocSSH :: String -> [String] -> Doc -> IO ExitCode
execSSH :: String -> String -> IO ExitCode
maybeURLCmd :: String -> String -> IO (Maybe String)
data Cachable
= Cachable
| Uncachable
| MaxAge !CInt
viewDoc :: Doc -> IO ()
viewDocWith :: Printers -> Doc -> IO ()
Documentation
backupByRenaming :: FilePath -> IO ()Source
backupByCopying :: FilePath -> IO ()Source
copyFileOrUrl :: [DarcsFlag] -> FilePath -> FilePath -> Cachable -> IO ()Source
speculateFileOrUrl :: String -> FilePath -> IO ()Source
copyFilesOrUrls :: [DarcsFlag] -> FilePath -> [String] -> FilePath -> Cachable -> IO ()Source
copyLocal :: [DarcsFlag] -> String -> FilePath -> IO ()Source
cloneFile :: FilePath -> FilePath -> IO ()Source
cloneTree :: FilePath -> FilePath -> IO ()Source
cloneTreeExcept :: [FilePath] -> FilePath -> FilePath -> IO ()Source
clonePartialsTree :: FilePath -> FilePath -> [FilePath] -> IO ()Source
clonePaths :: FilePath -> FilePath -> [FilePath] -> IO ()Source
fetchFilePS :: String -> Cachable -> IO ByteStringSource
gzFetchFilePS :: String -> Cachable -> IO ByteStringSource
sendEmail :: String -> String -> String -> String -> String -> String -> IO ()Source
generateEmailSource
:: Handlehandle to write email to
-> StringFrom
-> StringTo
-> StringSubject
-> StringCC
-> Docbody
-> IO ()
sendEmailDocSource
:: Stringfrom
-> Stringto
-> Stringsubject
-> Stringcc
-> Stringsend command
-> Maybe (Doc, Doc)(content,bundle)
-> Docbody
-> IO ()
Send an email, optionally containing a patch bundle (more precisely, its description and the bundle itself)
resendEmail :: String -> String -> ByteString -> IO ()Source
signString :: [DarcsFlag] -> Doc -> IO DocSource
verifyPS :: [DarcsFlag] -> ByteString -> IO (Maybe ByteString)Source
execDocPipe :: String -> [String] -> Doc -> IO DocSource
execPipeIgnoreError :: String -> [String] -> Doc -> IO DocSource
getTermNColors :: IO IntSource
pipeDoc :: String -> [String] -> Doc -> IO ExitCodeSource
pipeDocSSH :: String -> [String] -> Doc -> IO ExitCodeSource
execSSH :: String -> String -> IO ExitCodeSource
Run a command on a remote location without passing it any input or reading its output. Return its ExitCode
maybeURLCmd :: String -> String -> IO (Maybe String)Source
data Cachable Source
Constructors
Cachable
Uncachable
MaxAge !CInt
show/hide Instances
viewDoc :: Doc -> IO ()Source
viewDocWith :: Printers -> Doc -> IO ()Source
Produced by Haddock version 2.4.2