2012-11-05 21:43:17 +00:00
|
|
|
{- git over XMPP
|
|
|
|
-
|
|
|
|
- Copyright 2012 Joey Hess <joey@kitenet.net>
|
|
|
|
-
|
|
|
|
- Licensed under the GNU GPL version 3 or higher.
|
|
|
|
-}
|
|
|
|
|
|
|
|
module Assistant.XMPP.Git where
|
|
|
|
|
|
|
|
import Assistant.Common
|
2012-11-08 18:02:37 +00:00
|
|
|
import Assistant.NetMessager
|
|
|
|
import Assistant.Types.NetMessager
|
2012-11-05 21:43:17 +00:00
|
|
|
import Assistant.XMPP
|
|
|
|
import Assistant.XMPP.Buddies
|
|
|
|
import Assistant.DaemonStatus
|
|
|
|
import Assistant.Alert
|
|
|
|
import Assistant.MakeRemote
|
|
|
|
import Assistant.Sync
|
|
|
|
import Annex.UUID
|
|
|
|
import Config
|
2012-11-06 20:36:44 +00:00
|
|
|
import Git
|
2012-11-09 19:03:16 +00:00
|
|
|
import qualified Git.Command
|
2012-11-08 20:44:23 +00:00
|
|
|
import qualified Git.Branch
|
|
|
|
import qualified Annex.Branch
|
2012-11-06 04:52:35 +00:00
|
|
|
import Locations.UserConfig
|
2012-11-05 21:43:17 +00:00
|
|
|
import qualified Types.Remote as Remote
|
2012-11-09 16:51:54 +00:00
|
|
|
import Utility.FileMode
|
2012-11-05 21:43:17 +00:00
|
|
|
|
|
|
|
import Network.Protocol.XMPP
|
|
|
|
import qualified Data.Text as T
|
2012-11-06 04:52:35 +00:00
|
|
|
import System.Posix.Env
|
|
|
|
import System.Posix.Types
|
2012-11-06 20:36:44 +00:00
|
|
|
import System.Process (std_in, std_out, std_err)
|
2012-11-06 14:14:00 +00:00
|
|
|
import Control.Concurrent
|
|
|
|
import qualified Data.ByteString as B
|
2012-11-09 19:03:16 +00:00
|
|
|
import qualified Data.Map as M
|
2012-11-06 04:52:35 +00:00
|
|
|
|
2012-11-05 21:43:17 +00:00
|
|
|
finishXMPPPairing :: JID -> UUID -> Assistant ()
|
|
|
|
finishXMPPPairing jid u = void $ alertWhile alert $
|
|
|
|
makeXMPPGitRemote buddy (baseJID jid) u
|
|
|
|
where
|
|
|
|
buddy = T.unpack $ buddyName jid
|
|
|
|
alert = pairRequestAcknowledgedAlert buddy Nothing
|
|
|
|
|
|
|
|
makeXMPPGitRemote :: String -> JID -> UUID -> Assistant Bool
|
|
|
|
makeXMPPGitRemote buddyname jid u = do
|
2012-11-09 16:51:54 +00:00
|
|
|
remote <- liftAnnex $ addRemote $ makeGitRemote buddyname xmppaddress
|
2012-11-09 18:34:06 +00:00
|
|
|
liftAnnex $ storeUUID (remoteConfig (Remote.repo remote) "uuid") u
|
2012-11-05 21:43:17 +00:00
|
|
|
syncNewRemote remote
|
|
|
|
return True
|
|
|
|
where
|
2012-11-09 16:51:54 +00:00
|
|
|
xmppaddress = "xmpp::" ++ T.unpack (formatJID $ baseJID jid)
|
2012-11-05 21:43:17 +00:00
|
|
|
|
2012-11-08 20:44:23 +00:00
|
|
|
{- Pushes the named refs to the remote, over XMPP, communicating with a
|
|
|
|
- specific client that either requested the push, or responded to our
|
2012-11-09 16:51:54 +00:00
|
|
|
- message.
|
2012-11-06 04:52:35 +00:00
|
|
|
-
|
2012-11-09 16:51:54 +00:00
|
|
|
- To handle xmpp:: urls, git push will run git-remote-xmpp, which is
|
|
|
|
- injected into its PATH, and in turn runs git-annex xmppgit. The
|
|
|
|
- dataflow them becomes:
|
2012-11-06 04:52:35 +00:00
|
|
|
-
|
|
|
|
- git push <--> git-annex xmppgit <--> xmppPush <-------> xmpp
|
|
|
|
- |
|
|
|
|
- git receive-pack <--> xmppReceivePack <---------------> xmpp
|
|
|
|
-
|
|
|
|
- The pipe between git-annex xmppgit and us is set up and communicated
|
|
|
|
- using two file descriptors, GIT_ANNEX_XMPPGIT_IN and
|
|
|
|
- GIT_ANNEX_XMPPGIT_OUT. It simply connects those up to its stdin
|
|
|
|
- and stdout, respectively, which are in turn connected to "git-push".
|
|
|
|
- There is also a GIT_ANNEX_XMPPGIT_CONTROL descriptor, to which an
|
|
|
|
- exit status is sent for xmppgit to propigate.
|
|
|
|
-
|
|
|
|
- We listen at the other end of the pipe and relay to and from XMPP.
|
|
|
|
-}
|
2012-11-08 20:44:23 +00:00
|
|
|
xmppPush :: ClientID -> Remote -> [Ref] -> Assistant Bool
|
|
|
|
xmppPush cid remote refs = runPush (SendPushRunning cid) handleDeferred $ do
|
|
|
|
sendNetMessage $ StartingPush cid
|
2012-11-06 14:46:58 +00:00
|
|
|
|
|
|
|
(Fd inf, writepush) <- liftIO createPipe
|
|
|
|
(readpush, Fd outf) <- liftIO createPipe
|
|
|
|
(Fd controlf, writecontrol) <- liftIO createPipe
|
|
|
|
|
2012-11-09 16:51:54 +00:00
|
|
|
tmp <- liftAnnex $ fromRepo gitAnnexTmpDir
|
|
|
|
let tmpdir = tmp </> "xmppgit"
|
|
|
|
installwrapper tmpdir
|
|
|
|
|
2012-11-06 14:46:58 +00:00
|
|
|
env <- liftIO getEnvironment
|
2012-11-09 16:51:54 +00:00
|
|
|
path <- liftIO getSearchPath
|
2012-11-09 19:03:16 +00:00
|
|
|
let myenv = M.fromList
|
2012-11-09 16:51:54 +00:00
|
|
|
[ ("PATH", join [searchPathSeparator] $ tmpdir:path)
|
2012-11-06 14:46:58 +00:00
|
|
|
, (relayIn, show inf)
|
|
|
|
, (relayOut, show outf)
|
|
|
|
, (relayControl, show controlf)
|
|
|
|
]
|
2012-11-09 19:03:16 +00:00
|
|
|
`M.union` M.fromList env
|
2012-11-06 14:46:58 +00:00
|
|
|
|
|
|
|
inh <- liftIO $ fdToHandle readpush
|
|
|
|
outh <- liftIO $ fdToHandle writepush
|
|
|
|
controlh <- liftIO $ fdToHandle writecontrol
|
2012-11-06 04:52:35 +00:00
|
|
|
|
2012-11-06 14:46:58 +00:00
|
|
|
t1 <- forkIO <~> toxmpp inh
|
2012-11-08 20:44:23 +00:00
|
|
|
t2 <- forkIO <~> fromxmpp outh controlh
|
2012-11-06 14:46:58 +00:00
|
|
|
|
2012-11-09 19:03:16 +00:00
|
|
|
{- This can take a long time to run, so avoid running it in the
|
|
|
|
- Annex monad. Also, override environment. -}
|
|
|
|
g <- liftAnnex gitRepo
|
|
|
|
let g' = g { gitEnv = Just $ M.toList myenv }
|
|
|
|
let name = Remote.name remote
|
|
|
|
let params = Param name : map (Param . show) refs
|
|
|
|
ok <- liftIO $ Git.Command.runBool "push" params g'
|
|
|
|
|
2012-11-10 03:27:07 +00:00
|
|
|
liftIO $ do
|
|
|
|
mapM_ killThread [t1, t2]
|
|
|
|
mapM_ hClose [inh, outh, controlh]
|
|
|
|
|
2012-11-06 14:46:58 +00:00
|
|
|
return ok
|
|
|
|
where
|
|
|
|
toxmpp inh = forever $ do
|
2012-11-09 21:40:59 +00:00
|
|
|
b <- liftIO $ B.hGetSome inh chunkSize
|
2012-11-08 20:44:23 +00:00
|
|
|
if B.null b
|
|
|
|
then liftIO $ killThread =<< myThreadId
|
|
|
|
else sendNetMessage $ SendPackOutput cid b
|
|
|
|
fromxmpp outh controlh = forever $ do
|
|
|
|
m <- waitNetPushMessage
|
|
|
|
case m of
|
2012-11-09 21:40:59 +00:00
|
|
|
(ReceivePackOutput _ b) -> liftIO $ do
|
|
|
|
B.hPut outh b
|
|
|
|
hFlush outh
|
|
|
|
(ReceivePackDone _ exitcode) -> liftIO $ do
|
2012-11-10 03:27:07 +00:00
|
|
|
hPrint controlh exitcode
|
2012-11-09 21:40:59 +00:00
|
|
|
hFlush controlh
|
2012-11-08 20:44:23 +00:00
|
|
|
_ -> noop
|
2012-11-09 16:51:54 +00:00
|
|
|
installwrapper tmpdir = liftIO $ do
|
|
|
|
createDirectoryIfMissing True tmpdir
|
|
|
|
let wrapper = tmpdir </> "git-remote-xmpp"
|
|
|
|
program <- readProgramFile
|
|
|
|
writeFile wrapper $ unlines
|
|
|
|
[ "#!/bin/sh"
|
|
|
|
, "exec " ++ program ++ " xmppgit"
|
|
|
|
]
|
|
|
|
modifyFileMode wrapper $ addModes executeModes
|
2012-11-06 04:52:35 +00:00
|
|
|
|
|
|
|
relayIn :: String
|
|
|
|
relayIn = "GIT_ANNEX_XMPPGIT_IN"
|
|
|
|
|
|
|
|
relayOut :: String
|
|
|
|
relayOut = "GIT_ANNEX_XMPPGIT_OUT"
|
|
|
|
|
|
|
|
relayControl :: String
|
|
|
|
relayControl = "GIT_ANNEX_XMPPGIT_CONTROL"
|
|
|
|
|
2012-11-06 14:14:00 +00:00
|
|
|
relayHandle :: String -> IO Handle
|
|
|
|
relayHandle var = do
|
2012-11-06 04:52:35 +00:00
|
|
|
v <- getEnv var
|
|
|
|
case readish =<< v of
|
|
|
|
Nothing -> error $ var ++ " not set"
|
2012-11-06 14:14:00 +00:00
|
|
|
Just n -> fdToHandle $ Fd n
|
2012-11-06 04:52:35 +00:00
|
|
|
|
2012-11-09 21:40:59 +00:00
|
|
|
{- Called by git-annex xmppgit.
|
|
|
|
-
|
|
|
|
- git-push is talking to us on stdin
|
|
|
|
- we're talking to git-push on stdout
|
|
|
|
- git-receive-pack is talking to us on relayIn (via XMPP)
|
|
|
|
- we're talking to git-receive-pack on relayOut (via XMPP)
|
|
|
|
-}
|
2012-11-06 04:52:35 +00:00
|
|
|
xmppGitRelay :: IO ()
|
|
|
|
xmppGitRelay = do
|
2012-11-10 03:12:54 +00:00
|
|
|
flip relay stdout =<< relayHandle relayIn
|
|
|
|
relay stdin =<< relayHandle relayOut
|
2012-11-06 04:52:35 +00:00
|
|
|
|
2012-11-06 14:14:00 +00:00
|
|
|
controlh <- relayHandle relayControl
|
2012-11-06 04:52:35 +00:00
|
|
|
s <- hGetLine controlh
|
|
|
|
exitWith $ case readish s of
|
|
|
|
Just n
|
|
|
|
| n == 0 -> ExitSuccess
|
|
|
|
| otherwise -> ExitFailure n
|
|
|
|
Nothing -> ExitFailure 1
|
2012-11-10 03:12:54 +00:00
|
|
|
where
|
|
|
|
{- Is it possible to set up pipes and not need to copy the data
|
|
|
|
- ourselves? See splice(2) -}
|
|
|
|
relay fromh toh = void $ forkIO $ forever $ do
|
|
|
|
b <- B.hGetSome fromh chunkSize
|
|
|
|
when (B.null b) $ do
|
|
|
|
hClose fromh
|
|
|
|
hClose toh
|
|
|
|
killThread =<< myThreadId
|
|
|
|
B.hPut toh b
|
|
|
|
hFlush toh
|
2012-11-05 21:43:17 +00:00
|
|
|
|
2012-11-08 18:02:37 +00:00
|
|
|
{- Relays git receive-pack stdin and stdout via XMPP, as well as propigating
|
|
|
|
- its exit status to XMPP. -}
|
|
|
|
xmppReceivePack :: ClientID -> Assistant Bool
|
2012-11-08 20:44:23 +00:00
|
|
|
xmppReceivePack cid = runPush (ReceivePushRunning cid) handleDeferred $ do
|
2012-11-06 20:08:36 +00:00
|
|
|
feeder <- asIO1 toxmpp
|
|
|
|
reader <- asIO1 fromxmpp
|
2012-11-08 18:02:37 +00:00
|
|
|
sendexitcode <- asIO1 $ sendNetMessage . ReceivePackDone cid
|
2012-11-06 20:36:44 +00:00
|
|
|
repodir <- liftAnnex $ fromRepo repoPath
|
|
|
|
let p = (proc "git" ["receive-pack", repodir])
|
|
|
|
{ std_in = CreatePipe
|
|
|
|
, std_out = CreatePipe
|
|
|
|
, std_err = Inherit
|
|
|
|
}
|
|
|
|
liftIO $ do
|
|
|
|
(Just inh, Just outh, _, pid) <- createProcess p
|
2012-11-09 21:40:59 +00:00
|
|
|
readertid <- forkIO $ reader inh
|
|
|
|
void $ feeder outh
|
2012-11-06 20:36:44 +00:00
|
|
|
code <- waitForProcess pid
|
2012-11-08 18:02:37 +00:00
|
|
|
void $ sendexitcode code
|
2012-11-09 21:40:59 +00:00
|
|
|
killThread readertid
|
2012-11-10 03:27:07 +00:00
|
|
|
hClose inh
|
|
|
|
hClose outh
|
2012-11-06 20:36:44 +00:00
|
|
|
return $ code == ExitSuccess
|
2012-11-06 20:08:36 +00:00
|
|
|
where
|
2012-11-06 20:36:44 +00:00
|
|
|
toxmpp outh = do
|
2012-11-09 21:40:59 +00:00
|
|
|
b <- liftIO $ B.hGetSome outh chunkSize
|
2012-11-10 03:27:07 +00:00
|
|
|
-- empty is EOF, so exit
|
|
|
|
unless (B.null b) $ do
|
|
|
|
sendNetMessage $ ReceivePackOutput cid b
|
|
|
|
toxmpp outh
|
2012-11-08 20:44:23 +00:00
|
|
|
fromxmpp inh = forever $ do
|
|
|
|
m <- waitNetPushMessage
|
|
|
|
case m of
|
2012-11-09 21:40:59 +00:00
|
|
|
(SendPackOutput _ b) -> liftIO $ do
|
|
|
|
B.hPut inh b
|
|
|
|
hFlush inh
|
2012-11-08 20:44:23 +00:00
|
|
|
_ -> noop
|
|
|
|
|
|
|
|
xmppRemotes :: ClientID -> Assistant [Remote]
|
|
|
|
xmppRemotes cid = case baseJID <$> parseJID cid of
|
|
|
|
Nothing -> return []
|
|
|
|
Just jid -> do
|
|
|
|
rs <- syncRemotes <$> getDaemonStatus
|
|
|
|
let want = T.unpack $ formatJID jid
|
|
|
|
liftAnnex $ filterM (matching want) rs
|
|
|
|
where
|
2012-11-09 18:34:06 +00:00
|
|
|
matching want remote = do
|
|
|
|
let r = Remote.repo remote
|
|
|
|
return $ repoIsUrl r && repoLocation r == "xmpp::" ++ want
|
2012-11-08 20:44:23 +00:00
|
|
|
|
2012-11-10 03:17:47 +00:00
|
|
|
whenXMPPRemote :: ClientID -> Assistant () -> Assistant ()
|
|
|
|
whenXMPPRemote cid = unlessM (null <$> xmppRemotes cid)
|
2012-11-08 20:44:23 +00:00
|
|
|
|
2012-11-09 20:04:55 +00:00
|
|
|
handlePushMessage :: NetMessage -> Assistant ()
|
2012-11-10 03:17:47 +00:00
|
|
|
handlePushMessage (CanPush cid) = whenXMPPRemote cid $
|
|
|
|
sendNetMessage $ PushRequest cid
|
2012-11-09 18:34:06 +00:00
|
|
|
handlePushMessage (PushRequest cid) = do
|
2012-11-08 20:44:23 +00:00
|
|
|
rs <- xmppRemotes cid
|
|
|
|
current <- liftAnnex $ inRepo Git.Branch.current
|
2012-11-09 21:40:59 +00:00
|
|
|
--let refs = catMaybes [current, Just Annex.Branch.fullname] -- TODO
|
|
|
|
let refs = [Ref "master:refs/xmpp/newmaster"]
|
2012-11-09 20:04:55 +00:00
|
|
|
forM_ rs $ \r -> xmppPush cid r refs
|
2012-11-10 03:17:47 +00:00
|
|
|
handlePushMessage (StartingPush cid) = whenXMPPRemote cid $
|
|
|
|
void $ xmppReceivePack cid
|
2012-11-09 20:04:55 +00:00
|
|
|
handlePushMessage _ = noop
|
2012-11-09 21:40:59 +00:00
|
|
|
|
2012-11-10 03:17:47 +00:00
|
|
|
handleDeferred :: NetMessage -> Assistant ()
|
|
|
|
handleDeferred = handlePushMessage
|
|
|
|
|
2012-11-09 21:40:59 +00:00
|
|
|
chunkSize :: Int
|
2012-11-10 03:21:51 +00:00
|
|
|
chunkSize = 4096
|