2012-11-03 18:16:17 +00:00
|
|
|
|
{- git-annex XMPP client
|
|
|
|
|
-
|
|
|
|
|
- Copyright 2012 Joey Hess <joey@kitenet.net>
|
|
|
|
|
-
|
|
|
|
|
- Licensed under the GNU GPL version 3 or higher.
|
|
|
|
|
-}
|
|
|
|
|
|
|
|
|
|
module Assistant.Threads.XMPPClient where
|
|
|
|
|
|
|
|
|
|
import Assistant.Common
|
|
|
|
|
import Assistant.XMPP
|
|
|
|
|
import Assistant.XMPP.Client
|
|
|
|
|
import Assistant.NetMessager
|
|
|
|
|
import Assistant.Types.NetMessager
|
|
|
|
|
import Assistant.Types.Buddies
|
|
|
|
|
import Assistant.XMPP.Buddies
|
|
|
|
|
import Assistant.Sync
|
|
|
|
|
import Assistant.DaemonStatus
|
|
|
|
|
import qualified Remote
|
|
|
|
|
import Utility.ThreadScheduler
|
2012-11-05 23:39:08 +00:00
|
|
|
|
import Assistant.WebApp (UrlRenderer, renderUrl)
|
2012-11-03 21:34:19 +00:00
|
|
|
|
import Assistant.WebApp.Types
|
|
|
|
|
import Assistant.Alert
|
|
|
|
|
import Assistant.Pairing
|
2012-11-05 21:43:17 +00:00
|
|
|
|
import Assistant.XMPP.Git
|
|
|
|
|
import Annex.UUID
|
2012-11-03 18:16:17 +00:00
|
|
|
|
|
|
|
|
|
import Network.Protocol.XMPP
|
|
|
|
|
import Control.Concurrent
|
2012-11-03 21:34:19 +00:00
|
|
|
|
import qualified Data.Text as T
|
2012-11-03 18:16:17 +00:00
|
|
|
|
import qualified Data.Set as S
|
2012-11-05 21:43:17 +00:00
|
|
|
|
import qualified Data.Map as M
|
2012-11-03 18:16:17 +00:00
|
|
|
|
import qualified Git.Branch
|
|
|
|
|
import Data.Time.Clock
|
|
|
|
|
|
2012-11-03 21:34:19 +00:00
|
|
|
|
xmppClientThread :: UrlRenderer -> NamedThread
|
2012-11-05 23:39:08 +00:00
|
|
|
|
xmppClientThread urlrenderer = NamedThread "XMPPClient" $
|
|
|
|
|
restartableClient . xmppClient urlrenderer =<< getAssistant id
|
|
|
|
|
|
|
|
|
|
{- Runs the client, handing restart events. -}
|
|
|
|
|
restartableClient :: IO () -> Assistant ()
|
|
|
|
|
restartableClient a = forever $ do
|
|
|
|
|
tid <- liftIO $ forkIO a
|
|
|
|
|
waitNetMessagerRestart
|
|
|
|
|
liftIO $ killThread tid
|
|
|
|
|
|
|
|
|
|
xmppClient :: UrlRenderer -> AssistantData -> IO ()
|
|
|
|
|
xmppClient urlrenderer d = do
|
|
|
|
|
v <- liftAssistant $ liftAnnex getXMPPCreds
|
|
|
|
|
case v of
|
|
|
|
|
Nothing -> noop -- will be restarted once creds get configured
|
|
|
|
|
Just c -> retry (runclient c) =<< getCurrentTime
|
2012-11-03 18:16:17 +00:00
|
|
|
|
where
|
2012-11-05 23:39:08 +00:00
|
|
|
|
liftAssistant = runAssistant d
|
2012-11-08 18:02:37 +00:00
|
|
|
|
inAssistant = liftIO . liftAssistant
|
2012-11-05 23:39:08 +00:00
|
|
|
|
|
|
|
|
|
{- When the client exits, it's restarted;
|
|
|
|
|
- if it keeps failing, back off to wait 5 minutes before
|
|
|
|
|
- trying it again. -}
|
|
|
|
|
retry client starttime = do
|
|
|
|
|
e <- client
|
|
|
|
|
now <- getCurrentTime
|
|
|
|
|
if diffUTCTime now starttime > 300
|
|
|
|
|
then do
|
|
|
|
|
liftAssistant $ debug ["connection lost; reconnecting", show e]
|
|
|
|
|
retry client now
|
|
|
|
|
else do
|
|
|
|
|
liftAssistant $ debug ["connection failed; will retry", show e]
|
|
|
|
|
threadDelaySeconds (Seconds 300)
|
|
|
|
|
retry client =<< getCurrentTime
|
|
|
|
|
|
|
|
|
|
runclient c = liftIO $ connectXMPP c $ \jid -> do
|
|
|
|
|
selfjid <- bindJID jid
|
|
|
|
|
putStanza gitAnnexSignature
|
|
|
|
|
|
2012-11-08 18:02:37 +00:00
|
|
|
|
inAssistant $ debug ["connected", show selfjid]
|
2012-11-05 23:39:08 +00:00
|
|
|
|
{- The buddy list starts empty each time
|
|
|
|
|
- the client connects, so that stale info
|
|
|
|
|
- is not retained. -}
|
2012-11-08 18:02:37 +00:00
|
|
|
|
void $ inAssistant $
|
2012-11-05 23:39:08 +00:00
|
|
|
|
updateBuddyList (const noBuddies) <<~ buddyList
|
|
|
|
|
|
|
|
|
|
xmppThread $ receivenotifications selfjid
|
|
|
|
|
forever $ do
|
2012-11-08 18:02:37 +00:00
|
|
|
|
a <- inAssistant $ relayNetMessage selfjid
|
2012-11-05 23:39:08 +00:00
|
|
|
|
a
|
|
|
|
|
|
|
|
|
|
receivenotifications selfjid = forever $ do
|
|
|
|
|
l <- decodeStanza selfjid <$> getStanza
|
2012-11-09 21:51:26 +00:00
|
|
|
|
-- inAssistant $ debug ["received:", show l]
|
2012-11-05 23:39:08 +00:00
|
|
|
|
mapM_ (handle selfjid) l
|
|
|
|
|
|
2012-11-08 18:02:37 +00:00
|
|
|
|
handle _ (PresenceMessage p) = void $ inAssistant $
|
2012-11-05 23:39:08 +00:00
|
|
|
|
updateBuddyList (updateBuddies p) <<~ buddyList
|
|
|
|
|
handle _ (GotNetMessage QueryPresence) = putStanza gitAnnexSignature
|
2012-11-08 20:44:23 +00:00
|
|
|
|
handle _ (GotNetMessage (NotifyPush us)) = void $ inAssistant $ pull us
|
2012-11-08 18:02:37 +00:00
|
|
|
|
handle selfjid (GotNetMessage (PairingNotification stage c u)) =
|
|
|
|
|
maybe noop (inAssistant . pairMsgReceived urlrenderer stage u selfjid) (parseJID c)
|
2012-11-09 20:04:55 +00:00
|
|
|
|
handle _ (GotNetMessage m@(CanPush _)) = handlepushmsg m
|
|
|
|
|
handle _ (GotNetMessage m@(PushRequest _)) = handlepushmsg m
|
|
|
|
|
handle _ (GotNetMessage m@(StartingPush _)) = handlepushmsg m
|
2012-11-08 20:44:23 +00:00
|
|
|
|
handle _ (GotNetMessage m) = void $ inAssistant $ queueNetPushMessage m
|
2012-11-05 23:39:08 +00:00
|
|
|
|
handle _ (Ignorable _) = noop
|
|
|
|
|
handle _ (Unknown _) = noop
|
|
|
|
|
handle _ (ProtocolError _) = noop
|
2012-11-03 18:16:17 +00:00
|
|
|
|
|
2012-11-09 20:04:55 +00:00
|
|
|
|
handlepushmsg m = inAssistant $
|
|
|
|
|
unlessM (queueNetPushMessage m) $
|
|
|
|
|
void $ forkIO <~> handlePushMessage m
|
|
|
|
|
|
2012-11-03 20:00:38 +00:00
|
|
|
|
data XMPPEvent
|
|
|
|
|
= GotNetMessage NetMessage
|
|
|
|
|
| PresenceMessage Presence
|
2012-11-05 21:54:21 +00:00
|
|
|
|
| Ignorable ReceivedStanza
|
2012-11-03 18:16:17 +00:00
|
|
|
|
| Unknown ReceivedStanza
|
2012-11-03 21:34:19 +00:00
|
|
|
|
| ProtocolError ReceivedStanza
|
2012-11-03 18:16:17 +00:00
|
|
|
|
deriving Show
|
|
|
|
|
|
2012-11-03 20:00:38 +00:00
|
|
|
|
{- Decodes an XMPP stanza into one or more events. -}
|
|
|
|
|
decodeStanza :: JID -> ReceivedStanza -> [XMPPEvent]
|
2012-11-04 02:52:41 +00:00
|
|
|
|
decodeStanza selfjid s@(ReceivedPresence p)
|
2012-11-03 21:34:19 +00:00
|
|
|
|
| presenceType p == PresenceError = [ProtocolError s]
|
2012-11-05 21:54:21 +00:00
|
|
|
|
| presenceFrom p == Nothing = [Ignorable s]
|
|
|
|
|
| presenceFrom p == Just selfjid = [Ignorable s]
|
2012-11-05 19:40:56 +00:00
|
|
|
|
| otherwise = maybe [PresenceMessage p] decode (getGitAnnexAttrValue p)
|
2012-11-03 18:16:17 +00:00
|
|
|
|
where
|
2012-11-08 18:02:37 +00:00
|
|
|
|
decode (attr, v, _tag)
|
2012-11-05 19:40:56 +00:00
|
|
|
|
| attr == pushAttr = impliedp $ GotNetMessage $ NotifyPush $
|
|
|
|
|
decodePushNotification v
|
|
|
|
|
| attr == queryAttr = impliedp $ GotNetMessage QueryPresence
|
|
|
|
|
| otherwise = [Unknown s]
|
|
|
|
|
{- Things sent via presence imply a presence message,
|
|
|
|
|
- along with their real meaning. -}
|
2012-11-03 20:00:38 +00:00
|
|
|
|
impliedp v = [PresenceMessage p, v]
|
2012-11-05 21:54:21 +00:00
|
|
|
|
decodeStanza selfjid s@(ReceivedMessage m)
|
|
|
|
|
| messageFrom m == Nothing = [Ignorable s]
|
|
|
|
|
| messageFrom m == Just selfjid = [Ignorable s]
|
2012-11-05 19:40:56 +00:00
|
|
|
|
| messageType m == MessageError = [ProtocolError s]
|
|
|
|
|
| otherwise = maybe [Unknown s] decode (getGitAnnexAttrValue m)
|
|
|
|
|
where
|
2012-11-08 18:02:37 +00:00
|
|
|
|
decode (attr, v, tag)
|
|
|
|
|
| attr == pairAttr = use $ decodePairingNotification v
|
2012-11-09 18:34:06 +00:00
|
|
|
|
| attr == canPushAttr = use decodeCanPush
|
2012-11-08 18:02:37 +00:00
|
|
|
|
| attr == pushRequestAttr = use decodePushRequest
|
|
|
|
|
| attr == startingPushAttr = use decodeStartingPush
|
|
|
|
|
| attr == receivePackAttr = use $ decodeReceivePackOutput tag
|
|
|
|
|
| attr == sendPackAttr = use $ decodeSendPackOutput tag
|
|
|
|
|
| attr == receivePackDoneAttr = use $ decodeReceivePackDone v
|
2012-11-05 19:40:56 +00:00
|
|
|
|
| otherwise = [Unknown s]
|
2012-11-08 18:02:37 +00:00
|
|
|
|
use v = [maybe (Unknown s) GotNetMessage (v m)]
|
2012-11-03 20:00:38 +00:00
|
|
|
|
decodeStanza _ s = [Unknown s]
|
|
|
|
|
|
|
|
|
|
{- Waits for a NetMessager message to be sent, and relays it to XMPP. -}
|
|
|
|
|
relayNetMessage :: JID -> Assistant (XMPP ())
|
2012-11-05 21:43:17 +00:00
|
|
|
|
relayNetMessage selfjid = convert =<< waitNetMessage
|
2012-11-03 20:00:38 +00:00
|
|
|
|
where
|
2012-11-05 21:43:17 +00:00
|
|
|
|
convert (NotifyPush us) = return $ putStanza $ pushNotification us
|
2012-11-08 18:02:37 +00:00
|
|
|
|
convert QueryPresence = return $ putStanza presenceQuery
|
|
|
|
|
convert (PairingNotification stage c u) = withclient c $ \tojid -> do
|
|
|
|
|
changeBuddyPairing tojid True
|
|
|
|
|
return $ putStanza $ pairingNotification stage u tojid selfjid
|
2012-11-09 18:34:06 +00:00
|
|
|
|
convert (CanPush c) = sendclient c canPush
|
2012-11-08 18:02:37 +00:00
|
|
|
|
convert (PushRequest c) = sendclient c pushRequest
|
|
|
|
|
convert (StartingPush c) = sendclient c startingPush
|
|
|
|
|
convert (ReceivePackOutput c b) = sendclient c $ receivePackOutput b
|
|
|
|
|
convert (SendPackOutput c b) = sendclient c $ sendPackOutput b
|
|
|
|
|
convert (ReceivePackDone c code) = sendclient c $ receivePackDone code
|
|
|
|
|
|
|
|
|
|
sendclient c construct = withclient c $ \tojid ->
|
|
|
|
|
return $ putStanza $ construct tojid selfjid
|
|
|
|
|
withclient c a = case parseJID c of
|
|
|
|
|
Nothing -> return noop
|
2012-11-05 19:40:56 +00:00
|
|
|
|
Just tojid
|
2012-11-08 18:02:37 +00:00
|
|
|
|
| tojid == selfjid -> return noop
|
|
|
|
|
| otherwise -> a tojid
|
2012-11-03 18:16:17 +00:00
|
|
|
|
|
|
|
|
|
{- Runs a XMPP action in a separate thread, using a session to allow it
|
|
|
|
|
- to access the same XMPP client. -}
|
|
|
|
|
xmppThread :: XMPP () -> XMPP ()
|
|
|
|
|
xmppThread a = do
|
|
|
|
|
s <- getSession
|
|
|
|
|
void $ liftIO $ forkIO $
|
|
|
|
|
void $ runXMPP s a
|
|
|
|
|
|
|
|
|
|
{- We only pull from one remote out of the set listed in the push
|
|
|
|
|
- notification, as an optimisation.
|
|
|
|
|
-
|
|
|
|
|
- Note that it might be possible (though very unlikely) for the push
|
|
|
|
|
- notification to take a while to be sent, and multiple pushes happen
|
|
|
|
|
- before it is sent, so it includes multiple remotes that were pushed
|
|
|
|
|
- to at different times.
|
|
|
|
|
-
|
|
|
|
|
- It could then be the case that the remote we choose had the earlier
|
|
|
|
|
- push sent to it, but then failed to get the later push, and so is not
|
|
|
|
|
- fully up-to-date. If that happens, the pushRetryThread will come along
|
|
|
|
|
- and retry the push, and we'll get another notification once it succeeds,
|
|
|
|
|
- and pull again. -}
|
|
|
|
|
pull :: [UUID] -> Assistant ()
|
|
|
|
|
pull [] = noop
|
|
|
|
|
pull us = do
|
|
|
|
|
rs <- filter matching . syncRemotes <$> getDaemonStatus
|
|
|
|
|
debug $ "push notification for" : map (fromUUID . Remote.uuid ) rs
|
|
|
|
|
pullone rs =<< liftAnnex (inRepo Git.Branch.current)
|
|
|
|
|
where
|
|
|
|
|
matching r = Remote.uuid r `S.member` s
|
|
|
|
|
s = S.fromList us
|
|
|
|
|
|
|
|
|
|
pullone [] _ = noop
|
|
|
|
|
pullone (r:rs) branch =
|
|
|
|
|
unlessM (all id . fst <$> manualPull branch [r]) $
|
|
|
|
|
pullone rs branch
|
2012-11-03 21:34:19 +00:00
|
|
|
|
|
2012-11-05 23:39:08 +00:00
|
|
|
|
pairMsgReceived :: UrlRenderer -> PairStage -> UUID -> JID -> JID -> Assistant ()
|
|
|
|
|
pairMsgReceived urlrenderer PairReq theiruuid selfjid theirjid
|
2012-11-05 21:43:17 +00:00
|
|
|
|
-- PairReq from another client using our JID is automatically accepted.
|
|
|
|
|
| baseJID selfjid == baseJID theirjid = do
|
|
|
|
|
selfuuid <- liftAnnex getUUID
|
|
|
|
|
sendNetMessage $
|
|
|
|
|
PairingNotification PairAck (formatJID theirjid) selfuuid
|
|
|
|
|
finishXMPPPairing theirjid theiruuid
|
|
|
|
|
-- Show an alert to let the user decide if they want to pair.
|
|
|
|
|
| otherwise = do
|
|
|
|
|
let route = FinishXMPPPairR (PairKey theiruuid $ formatJID theirjid)
|
|
|
|
|
url <- liftIO $ renderUrl urlrenderer route []
|
|
|
|
|
close <- asIO1 removeAlert
|
|
|
|
|
void $ addAlert $ pairRequestReceivedAlert (T.unpack $ buddyName theirjid)
|
|
|
|
|
AlertButton
|
|
|
|
|
{ buttonUrl = url
|
|
|
|
|
, buttonLabel = T.pack "Respond"
|
|
|
|
|
, buttonAction = Just close
|
|
|
|
|
}
|
2012-11-05 23:39:08 +00:00
|
|
|
|
|
|
|
|
|
pairMsgReceived _ PairAck theiruuid _selfjid theirjid =
|
2012-11-05 21:43:17 +00:00
|
|
|
|
{- PairAck must come from one of the buddies we are pairing with;
|
|
|
|
|
- don't pair with just anyone. -}
|
|
|
|
|
whenM (isBuddyPairing theirjid) $ do
|
|
|
|
|
changeBuddyPairing theirjid False
|
|
|
|
|
selfuuid <- liftAnnex getUUID
|
|
|
|
|
sendNetMessage $
|
|
|
|
|
PairingNotification PairDone (formatJID theirjid) selfuuid
|
|
|
|
|
finishXMPPPairing theirjid theiruuid
|
2012-11-05 23:39:08 +00:00
|
|
|
|
|
|
|
|
|
pairMsgReceived _ PairDone _theiruuid _selfjid theirjid =
|
2012-11-05 21:43:17 +00:00
|
|
|
|
changeBuddyPairing theirjid False
|
|
|
|
|
|
|
|
|
|
isBuddyPairing :: JID -> Assistant Bool
|
|
|
|
|
isBuddyPairing jid = maybe False buddyPairing <$>
|
|
|
|
|
getBuddy (genBuddyKey jid) <<~ buddyList
|
|
|
|
|
|
|
|
|
|
changeBuddyPairing :: JID -> Bool -> Assistant ()
|
|
|
|
|
changeBuddyPairing jid ispairing =
|
|
|
|
|
updateBuddyList (M.adjust set key) <<~ buddyList
|
|
|
|
|
where
|
|
|
|
|
key = genBuddyKey jid
|
|
|
|
|
set b = b { buddyPairing = ispairing }
|