{-# LANGUAGE CPP, ForeignFunctionInterface #-}
module Darcs.UI.External
( sendEmail
, generateEmail
, sendEmailDoc
, resendEmail
, signString
, verifyPS
, execDocPipe
, pipeDoc
, pipeDocSSH
, viewDoc
, viewDocWith
, haveSendmail
, sendmailPath
, diffProgram
, darcsProgram
, editText
, editFile
, setDarcsEncodings
, getSystemEncoding
, isUTF8Locale
) where
import Darcs.Prelude
import Data.Maybe ( isJust, isNothing, maybeToList )
import Control.Monad ( unless, when, filterM, liftM2, void )
import Control.Concurrent.MVar ( MVar )
import System.Exit ( ExitCode(..) )
import System.Environment
( getEnv
, getExecutablePath
)
import System.IO ( hPutStr, hPutStrLn, hClose,
hIsTerminalDevice, stdout, stderr, Handle )
import System.Directory ( doesFileExist,
findExecutable )
import System.FilePath.Posix ( (</>) )
import System.Process ( createProcess, proc, CreateProcess(..), runInteractiveProcess, waitForProcess, StdStream(..) )
import System.Process.Internals ( ProcessHandle )
#ifndef WIN32
import GHC.IO.Encoding
( getFileSystemEncoding
, setForeignEncoding
, setLocaleEncoding )
#endif
import Foreign.C.String ( CString, peekCString )
import Control.Concurrent ( forkIO, newEmptyMVar, putMVar, takeMVar )
import Control.Exception
( try, finally, catch, IOException )
import System.IO.Error ( ioeGetErrorType )
import GHC.IO.Exception ( IOErrorType(ResourceVanished) )
import Data.Char ( toLower )
import Text.Regex
#if defined (HAVE_MAPI)
import Foreign.C ( withCString )
#endif
#ifdef HAVE_MAPI
import Foreign.Ptr ( nullPtr )
import Darcs.Util.Lock ( canonFilename, writeDocBinFile )
#endif
import Darcs.UI.Options.All ( Sign(..), Verify(..), Compression(..) )
import Darcs.Util.Path
( AbsolutePath
, toFilePath
, FilePathLike
)
import Darcs.Util.Progress ( withoutProgress, debugMessage )
import Darcs.Util.ByteString (linesPS, unlinesPS)
import qualified Data.ByteString as B (ByteString, empty, null, readFile
,hGetContents, writeFile, hPut, length
,take, concat, drop, isPrefixOf, singleton, append)
import qualified Data.ByteString.Char8 as BC (unpack, pack)
import Darcs.Util.Lock
( withTemp
, withNamedTemp
, withOpenTemp
)
import Darcs.Util.Ssh ( getSSH, SSHCmd(..) )
import Darcs.Util.CommandLine ( parseCmd, addUrlencoded )
import Darcs.Util.Exception ( catchall )
import Darcs.Util.Exec ( execInteractive, exec, Redirect(..), withoutNonBlock )
import Darcs.Util.URL ( SshFilePath, sshUhost )
import Darcs.Util.Printer ( Doc, Printers, hPutDocLnWith, hPutDoc, hPutDocLn, hPutDocWith, ($$), renderPS,
simplePrinters,
hPutDocCompr,
text, empty, packedString, vcat, renderString )
import qualified Darcs.Util.Ratified as Ratified
import Darcs.UI.Email ( formatHeader )
sendmailPath :: IO String
sendmailPath = do
l <- filterM doesFileExist $ liftM2 (</>)
[ "/usr/sbin", "/sbin", "/usr/lib" ]
[ "sendmail" ]
ex <- findExecutable "sendmail"
when (isNothing ex && null l) $ fail "Cannot find the \"sendmail\" program."
return $ head $ maybeToList ex ++ l
diffProgram :: IO String
diffProgram = do
l <- filterM (fmap isJust . findExecutable) [ "gdiff", "gnudiff", "diff" ]
when (null l) $ fail "Cannot find the \"diff\" program."
return $ head l
darcsProgram :: IO String
darcsProgram = getExecutablePath
pipeDoc :: String -> [String] -> Doc -> IO ExitCode
pipeDoc = pipeDocInternal (PipeToOther simplePrinters)
data WhereToPipe = PipeToSsh Compression
| PipeToOther Printers
pipeDocInternal :: WhereToPipe -> String -> [String] -> Doc -> IO ExitCode
pipeDocInternal whereToPipe c args inp = withoutNonBlock $ withoutProgress $
do debugMessage $ "Exec: " ++ unwords (map show (c:args))
(Just i,_,_,pid) <- createProcess (proc c args){ std_in = CreatePipe
, delegate_ctlc = True}
debugMessage "Start transferring data"
case whereToPipe of
PipeToSsh GzipCompression -> hPutDocCompr i inp
PipeToSsh NoCompression -> hPutDoc i inp
PipeToOther printers -> hPutDocWith printers i inp
hClose i
rval <- waitForProcess pid
debugMessage "Finished transferring data"
when (rval == ExitFailure 127) $
putStrLn $ "Command not found:\n "++ show (c:args)
return rval
pipeDocSSH :: Compression -> SshFilePath -> [String] -> Doc -> IO ExitCode
pipeDocSSH compress remoteAddr args input = do
(ssh, ssh_args) <- getSSH SSH
pipeDocInternal (PipeToSsh compress) ssh (ssh_args ++ ("--":sshUhost remoteAddr:args)) input
sendEmail :: String -> String -> String -> String -> String -> String -> IO ()
sendEmail f t s cc scmd body =
sendEmailDoc f t s cc scmd Nothing (text body)
generateEmail
:: Handle
-> String
-> String
-> String
-> String
-> Doc
-> IO ()
generateEmail h f t s cc body = do
putHeader "To" t
putHeader "From" f
putHeader "Subject" s
unless (null cc) $ putHeader "Cc" cc
putHeader "X-Mail-Originator" "Darcs Version Control System"
hPutDocLn h body
where putHeader field value
= B.hPut h (B.append (formatHeader field value) newline)
newline = B.singleton 10
haveSendmail :: IO Bool
haveSendmail = (sendmailPath >> return True) `catch` (\(_ :: IOException) -> return False)
sendEmailDoc
:: String
-> String
-> String
-> String
-> String
-> Maybe (Doc, Doc)
-> Doc
-> IO ()
sendEmailDoc _ "" _ "" _ _ _ = return ()
sendEmailDoc f "" s cc scmd mbundle body =
sendEmailDoc f cc s "" scmd mbundle body
sendEmailDoc f t s cc scmd mbundle body = do
use_sendmail <- haveSendmail
if use_sendmail || scmd /= "" then
withOpenTemp $ \(h,fn) -> do
generateEmail h f t s cc body
hClose h
withOpenTemp $ \(hat,at) -> do
ftable' <- case mbundle of
Just (content,bundle) -> do
hPutDocLn hat bundle
return [ ('b', renderString content) , ('a', at) ]
Nothing ->
return [ ('b', renderString body) ]
hClose hat
let ftable = [ ('t',addressOnly t),('c',cc),('f',f),('s',s) ] ++ ftable'
r <- execSendmail ftable scmd fn
when (r /= ExitSuccess) $ fail ("failed to send mail to: "
++ t ++ cc_list cc
++ "\nPerhaps sendmail is not configured.")
#ifdef HAVE_MAPI
else do
r <- withCString t $ \tp ->
withCString f $ \fp ->
withCString cc $ \ccp ->
withCString s $ \sp ->
withOpenTemp $ \(h,fn) -> do
hPutDoc h body
hClose h
writeDocBinFile "mailed_patch" body
cfn <- canonFilename fn
withCString cfn $ \pcfn ->
c_send_email fp tp ccp sp nullPtr pcfn
when (r /= 0) $ fail ("failed to send mail to: " ++ t)
#else
else fail "no mail facility (sendmail or mapi) located at configure time!"
#endif
where addressOnly a =
case dropWhile (/= '<') a of
('<':a2) -> takeWhile (/= '>') a2
_ -> a
cc_list [] = []
cc_list c = " and cc'ed " ++ c
resendEmail :: String -> String -> B.ByteString -> IO ()
resendEmail "" _ _ = return ()
resendEmail t scmd body = do
use_sendmail <- haveSendmail
if use_sendmail || scmd /= ""
then
withOpenTemp $ \(h,fn) -> do
hPutStrLn h $ "To: "++ t
hPutStrLn h $ find_from (linesPS body)
hPutStrLn h $ find_subject (linesPS body)
hPutDocLn h $ fixit $ linesPS body
hClose h
let ftable = [('t',t)]
r <- execSendmail ftable scmd fn
when (r /= ExitSuccess) $ fail ("failed to send mail to: " ++ t)
else
#ifdef HAVE_MAPI
fail "Don't know how to resend email with MAPI"
#else
fail "no mail facility (sendmail or mapi) located at configure time (use the sendmail-command option)!"
#endif
where br = BC.pack "\r"
darcsurl = BC.pack "DarcsURL:"
content = BC.pack "Content-"
from_start = BC.pack "From:"
subject_start = BC.pack "Subject:"
fixit (l:ls)
| B.null l = packedString B.empty $$ vcat (map packedString ls)
| l == br = packedString B.empty $$ vcat (map packedString ls)
| B.take 9 l == darcsurl || B.take 8 l == content
= packedString l $$ fixit ls
| otherwise = fixit ls
fixit [] = empty
find_from (l:ls) | B.take 5 l == from_start = BC.unpack l
| otherwise = find_from ls
find_from [] = "From: unknown"
find_subject (l:ls) | B.take 8 l == subject_start = BC.unpack l
| otherwise = find_subject ls
find_subject [] = "Subject: (no subject)"
execSendmail :: [(Char,String)] -> String -> String -> IO ExitCode
execSendmail ftable scmd fn =
if scmd == "" then do
cmd <- sendmailPath
exec cmd ["-i", "-t"] (File fn, Null, AsIs)
else case parseCmd (addUrlencoded ftable) scmd of
Right (arg0:opts, wantstdin) ->
do let stdin = if wantstdin then File fn else Null
exec arg0 opts (stdin, Null, AsIs)
Left e -> fail $ "failed to send mail, invalid sendmail-command: "++show e
_ -> fail "failed to send mail, invalid sendmail-command"
#ifdef HAVE_MAPI
foreign import ccall "win32/send_email.h send_email" c_send_email
:: CString ->
CString ->
CString ->
CString ->
CString ->
CString ->
IO Int
#endif
execPSPipe :: String -> [String] -> B.ByteString -> IO B.ByteString
execPSPipe c args ps = fmap renderPS
$ execDocPipe c args
$ packedString ps
execAndGetOutput :: FilePath -> [String] -> Doc
-> IO (ProcessHandle, MVar (), B.ByteString)
execAndGetOutput c args instr = do
(i,o,e,pid) <- runInteractiveProcess c args Nothing Nothing
_ <- forkIO $ hPutDoc i instr >> hClose i
mvare <- newEmptyMVar
_ <- forkIO ((Ratified.hGetContents e >>=
hPutStr stderr)
`finally` putMVar mvare ())
out <- B.hGetContents o
return (pid, mvare, out)
execDocPipe :: String -> [String] -> Doc -> IO Doc
execDocPipe c args instr = withoutProgress $ do
(pid, mvare, out) <- execAndGetOutput c args instr
rval <- waitForProcess pid
takeMVar mvare
case rval of
ExitFailure ec ->fail $ "External program '"++c++
"' failed with exit code "++ show ec
ExitSuccess -> return $ packedString out
signString :: Sign -> Doc -> IO Doc
signString NoSign d = return d
signString Sign d = signPGP [] d
signString (SignAs keyid) d = signPGP ["--local-user", keyid] d
signString (SignSSL idf) d = signSSL idf d
signPGP :: [String] -> Doc -> IO Doc
signPGP args = execDocPipe "gpg" ("--clearsign":args)
signSSL :: String -> Doc -> IO Doc
signSSL idfile t =
withTemp $ \cert -> do
opensslPS ["req", "-new", "-key", idfile,
"-outform", "PEM", "-days", "365"]
(BC.pack "\n\n\n\n\n\n\n\n\n\n\n")
>>= opensslPS ["x509", "-req", "-extensions",
"v3_ca", "-signkey", idfile,
"-outform", "PEM", "-days", "365"]
>>= opensslPS ["x509", "-outform", "PEM"]
>>= B.writeFile cert
opensslDoc ["smime", "-sign", "-signer", cert,
"-inkey", idfile, "-noattr", "-text"] t
where opensslDoc = execDocPipe "openssl"
opensslPS = execPSPipe "openssl"
verifyPS :: Verify -> B.ByteString -> IO (Maybe B.ByteString)
verifyPS NoVerify ps = return $ Just ps
verifyPS (VerifyKeyring pks) ps = verifyGPG pks ps
verifyPS (VerifySSL auks) ps = verifySSL auks ps
verifyGPG :: AbsolutePath -> B.ByteString -> IO (Maybe B.ByteString)
verifyGPG goodkeys s =
withOpenTemp $ \(th,tn) -> do
B.hPut th s
hClose th
rval <- exec "gpg" ["--batch","--no-default-keyring",
"--keyring",fix_path $ toFilePath goodkeys, "--verify"]
(File tn, Null, Null)
case rval of
ExitSuccess -> return $ Just gpg_fixed_s
_ -> return Nothing
where gpg_fixed_s = let
not_begin_signature x =
x /= BC.pack "-----BEGIN PGP SIGNED MESSAGE-----"
&&
x /= BC.pack "-----BEGIN PGP SIGNED MESSAGE-----\r"
in unlinesPS $ map fix_line $ tail $ dropWhile not_begin_signature $ linesPS s
fix_line x | B.length x < 3 = x
| BC.pack "- -" `B.isPrefixOf` x = B.drop 2 x
| otherwise = x
#if defined(WIN32)
fix_sep c | c=='/' = '\\' | otherwise = c
fix_path p = map fix_sep p
#else
fix_path p = p
#endif
verifySSL :: AbsolutePath -> B.ByteString -> IO (Maybe B.ByteString)
verifySSL goodkeys s = do
certdata <- opensslPS ["smime", "-pk7out"] s
>>= opensslPS ["pkcs7", "-print_certs"]
cruddy_pk <- opensslPS ["x509", "-pubkey"] certdata
let key_used = B.concat $ tail $
takeWhile (/= BC.pack"-----END PUBLIC KEY-----")
$ linesPS cruddy_pk
in do allowed_keys <- linesPS `fmap` B.readFile (toFilePath goodkeys)
if key_used `notElem` allowed_keys
then return Nothing
else withTemp $ \cert ->
withTemp $ \on ->
withOpenTemp $ \(th,tn) -> do
B.hPut th s
hClose th
B.writeFile cert certdata
rval <- exec "openssl" ["smime", "-verify", "-CAfile",
cert, "-certfile", cert]
(File tn, File on, Null)
case rval of
ExitSuccess -> Just `fmap` B.readFile on
_ -> return Nothing
where opensslPS = execPSPipe "openssl"
viewDoc :: Doc -> IO ()
viewDoc = viewDocWith simplePrinters
viewDocWith :: Printers -> Doc -> IO ()
viewDocWith pr msg = do
isTerminal <- hIsTerminalDevice stdout
void $ if isTerminal && lengthGreaterThan (20 :: Int) (lines $ renderString msg)
then do mbViewerPlusArgs <- getViewer
case mbViewerPlusArgs of
Just viewerPlusArgs -> do
let (viewer : args) = words viewerPlusArgs
pipeDocToPager viewer args pr msg
Nothing -> return $ ExitFailure 127
`ortryrunning` pipeDocToPager "less" ["-RK"] pr msg
`ortryrunning` pipeDocToPager "more" [] pr msg
#ifdef WIN32
`ortryrunning` pipeDocToPager "more.com" [] pr msg
#endif
`ortryrunning` pipeDocToPager "" [] pr msg
else pipeDocToPager "" [] pr msg
where lengthGreaterThan n _ | n <= 0 = True
lengthGreaterThan _ [] = False
lengthGreaterThan n (_:xs) = lengthGreaterThan (n-1) xs
getViewer :: IO (Maybe String)
getViewer = Just `fmap` (getEnv "DARCS_PAGER" `catchall` getEnv "PAGER")
`catchall`
return Nothing
pipeDocToPager :: String -> [String] -> Printers -> Doc -> IO ExitCode
pipeDocToPager "" _ pr inp = do
hPutDocLnWith pr stdout inp
return ExitSuccess
pipeDocToPager c args pr inp = pipeDocInternal (PipeToOther pr) c args inp
ortryrunning :: IO ExitCode
-> IO ExitCode
-> IO ExitCode
a `ortryrunning` b = do
ret <- try a
case ret of
(Right (ExitFailure 126)) -> b
(Right (ExitFailure 127)) -> b
#ifdef WIN32
(Right (ExitFailure 9009)) -> b
#endif
(Right x) -> return x
(Left (e :: IOException)) -> case ioeGetErrorType e of
ResourceVanished -> return ExitSuccess
_ -> b
editText :: String -> B.ByteString -> IO B.ByteString
editText desc txt = withNamedTemp desc $ \f -> do
B.writeFile f txt
_ <- runEditor f
B.readFile f
editFile :: FilePathLike p
=> p
-> IO (ExitCode, Bool)
editFile ff = do
old_content <- file_content
ec <- runEditor f
new_content <- file_content
return (ec, new_content /= old_content)
where
f = toFilePath ff
file_content = do
exists <- doesFileExist f
if exists then do content <- B.readFile f
return $ Just content
else return Nothing
runEditor :: FilePath
-> IO ExitCode
runEditor f = do
ed <- getEditor
let mf = Just f
execInteractive ed mf
`ortryrunning` execInteractive "vi" mf
`ortryrunning` execInteractive "emacs" mf
`ortryrunning` execInteractive "emacs -nw" mf
#ifdef WIN32
`ortryrunning` execInteractive "edit" mf
#endif
getEditor :: IO String
getEditor = getEnv "DARCS_EDITOR" `catchall`
getEnv "VISUAL" `catchall`
getEnv "EDITOR" `catchall` return "nano"
setDarcsEncodings :: IO ()
#ifdef WIN32
setDarcsEncodings = return ()
#else
setDarcsEncodings = do
e <- getFileSystemEncoding
setForeignEncoding e
setLocaleEncoding e
#endif
foreign import ccall "system_encoding.h get_system_encoding"
get_system_encoding :: IO CString
getSystemEncoding :: IO String
getSystemEncoding = do
enc <- get_system_encoding
peekCString enc
isUTF8Locale :: String -> Bool
isUTF8Locale codeName = case normalizeEncoding codeName of
"ascii" -> True
"646" -> True
"ansi_x3_4_1968" -> True
"ansi_x3.4_1986" -> True
"cp367" -> True
"csascii" -> True
"ibm367" -> True
"iso646_us" -> True
"iso_646.irv_1991" -> True
"iso_ir_6" -> True
"us" -> True
"us_ascii" -> True
"utf_8" -> True
"u8" -> True
"utf" -> True
"utf8" -> True
"utf8_ucs2" -> True
"utf8_ucs4" -> True
_ -> False
where
normalizeEncoding s = map toLower $ subRegex sep s "_"
sep = mkRegex "[^0-9A-Za-z]+"