{-# LANGUAGE OverloadedStrings #-} {-# LANGUAGE CPP #-} import Control.Applicative import Control.DeepSeq import Data.Bool import Data.Char import Data.Maybe import qualified Data.ByteString.Lazy.Char8 as L import qualified Data.ByteString.Lazy.Char8 as L8 import qualified Kiki import System.Directory import System.Environment import System.IO import System.Posix.User import CommandLine usage = unlines [ "cokiki [--chroot=ROOTDIR]" , " [--homedir=HOMEDIR]" , " [--passphrase-fd=FD]" , "" , "cokiki modifies system configuration to recognize generated files" , "in /var/cache/kiki. In addition to each command's documented effects" , "(see COMMANDS), the following operation will be performed on your" , "GnuPG keyring:" , "" , " master-key (generated if not present)" , " tor (generated if not prsenet)" , " ipsec (generated if not prsenet)" , " ssh-server (imported or generated if not present)" , " ssh-client (imported or gnnerated if not present)" , "" , "The /var/cache/kiki/* tree will also be refreshed." , "" , "COMMANDS" , "" , " ssh-client Modify system ssh configuration to respect" , " /var/cache/kiki/ssh_known_hosts." , "" , " ssh-server Modify system ssh configuration to use the" , " kiki-managed host key at" , " /var/cache/kiki/ssh_host_rsa_key." , "" , " strongswan Modify /etc/ipsec.conf to include settings from" , " /var/cache/kiki/ipsec.conf." ] main = do (cmd,args) <- splitAt 1 <$> getArgs uid <- getEffectiveUserID let whenRoot action | uid==0 = action | otherwise = hPutStrLn stderr "operation requires root." let sel = case cmd of ["ssh-client"] -> fmap whenRoot $ sshClient uid <$> Kiki.ㄧchroot <*> Kiki.ㄧhomedir ["ssh-server"] -> fmap whenRoot $ sshServer <$> Kiki.ㄧchroot <*> Kiki.ㄧhomedir ["strongswan"] -> fmap whenRoot $ strongswan <$> Kiki.ㄧchroot <*> Kiki.ㄧhomedir _ -> pure $ hPutStr stderr usage spec = uncurry fancy Kiki.kikiOptions "" case runArgs (parseInvocation spec args) sel of Left e -> hPutStrLn stderr $ usageErrorMessage e Right io -> io maybeReadFile :: FilePath -> IO (Maybe L.ByteString) maybeReadFile path = do doesFileExist path >>= bool (return Nothing) (Just <$> L.readFile path) sshClient uid root cmn = do -- /etc/ssh/ssh_config <-- 'GlobalKnownHostsFile /var/cache/kiki/ssh_known_hosts' sshconfig <- parseSshConfig . fromMaybe "" <$> maybeReadFile (root "/etc/ssh/ssh_config") let (ps,qs) = sshSplitAtDirective "GlobalKnownHostsFile" sshconfig myWriteFile f bs = do hPutStrLn stderr $ "Writing "++f -- L8.putStr bs L8.writeFile f bs sshconfig' <- case qs of d:ds | elem "/var/cache/kiki/ssh_known_hosts" d -> do hPutStrLn stderr "ssh-client already configured." return Nothing d:ds -> do hPutStrLn stderr "modifying GlobalKnownHostsFile directive" let hs = " " : "/var/cache/kiki/ssh_known_hosts" : drop 1 d stmt = take 1 d ++ hs return $ Just (ps ++ stmt : ds) [] -> do -- Unconfigured add fresh directive. let stmt = L8.unwords ["GlobalKnownHostsFile" , "/var/cache/kiki/ssh_known_hosts" , "/etc/ssh/ssh_known_hosts" , "/etc/ssh/ssh_known_hosts2" ] return $ Just (sshconfig ++ parseSshConfig stmt) sshconfig' `deepseq` return () -- force lazy input maybe (return ()) (myWriteFile (root "/etc/ssh/ssh_config") . unparseSshConfig) sshconfig' -- /root/.gnupg/... <-- contains known hosts from /etc/ssh/ssh_known_hosts -- /var/cache/kiki/ssh_known_hosts <-- contains known hosts from /root/.gnupg/... -- Kiki.replaceSshServerKeys root cmn Kiki.importAndRefresh root cmn sshServer root cmn = do -- /etc/ssh/sshd_config <-- 'HostKey /var/cache/kiki/ssh_host_ecdsa_key' etc. Kiki.importAndRefresh root cmn strongswan root cmn = do -- etc/ipsec.conf <-- 'include /var/cache/kiki/ipsec.conf' -- /root/.gnupg/... <-- contains newly-generated ipsec subkey Kiki.importAndRefresh root cmn -- /var/cache/kiki/ipsec.conf <-- contains configurations for each remote ipsec host -- /var/cache/kiki/ipsec.conf <-- contains '%default' configuration for this local host -- /var/cache/kiki/ipsec.d/certs <-- contains relevant certs -- /var/cache/kiki/ipsec.d/private <-- contains private key parseSshConfig bs = map tokenize $ L8.lines bs where tokenize l = L8.groupBy tokrel l' ++ [comment] where (l', comment) = L8.break (=='#') l tokrel x y = isSpace x == isSpace y unparseSshConfig ls = L8.unlines $ map L.concat $ ls sshSplitAtDirective d sshconfig = break (sshIsDirective d) sshconfig sshIsDirective d ls = case dropWhile isSpaceTok ls of g:_ | g == d -> True _ -> False where isSpaceTok "" = True isSpaceTok b = isSpace $ L8.head b #if !MIN_VERSION_base(4,7,0) bool :: a -> a -> Bool -> a bool f _ False = f bool _ t True = t #endif