2012-10-30 18:34:48 +00:00
|
|
|
{- git-annex assistant named threads.
|
|
|
|
-
|
|
|
|
- Copyright 2012 Joey Hess <joey@kitenet.net>
|
|
|
|
-
|
|
|
|
- Licensed under the GNU GPL version 3 or higher.
|
|
|
|
-}
|
|
|
|
|
2013-02-06 19:38:41 +00:00
|
|
|
{-# LANGUAGE CPP #-}
|
|
|
|
|
2012-10-30 18:34:48 +00:00
|
|
|
module Assistant.NamedThread where
|
|
|
|
|
2013-01-26 03:14:32 +00:00
|
|
|
import Common.Annex
|
2013-01-26 06:09:33 +00:00
|
|
|
import Assistant.Types.NamedThread
|
|
|
|
import Assistant.Types.ThreadName
|
2013-01-26 03:14:32 +00:00
|
|
|
import Assistant.Types.DaemonStatus
|
2013-04-03 21:44:34 +00:00
|
|
|
import Assistant.Types.UrlRenderer
|
2012-10-30 18:34:48 +00:00
|
|
|
import Assistant.DaemonStatus
|
2013-01-26 03:14:32 +00:00
|
|
|
import Assistant.Monad
|
2012-10-30 18:34:48 +00:00
|
|
|
|
2013-01-26 03:14:32 +00:00
|
|
|
import Control.Concurrent
|
|
|
|
import Control.Concurrent.Async
|
|
|
|
import qualified Data.Map as M
|
2013-01-26 06:09:33 +00:00
|
|
|
import qualified Control.Exception as E
|
2012-10-30 18:34:48 +00:00
|
|
|
|
2013-02-06 19:38:41 +00:00
|
|
|
#ifdef WITH_WEBAPP
|
|
|
|
import Assistant.WebApp.Types
|
2013-04-04 05:48:26 +00:00
|
|
|
import Assistant.Types.Alert
|
2013-02-06 19:38:41 +00:00
|
|
|
import Assistant.Alert
|
|
|
|
import qualified Data.Text as T
|
|
|
|
#endif
|
|
|
|
|
2013-01-26 03:14:32 +00:00
|
|
|
{- Starts a named thread, if it's not already running.
|
|
|
|
-
|
|
|
|
- Named threads are run by a management thread, so if they crash
|
|
|
|
- an alert is displayed, allowing the thread to be restarted. -}
|
2013-04-03 21:44:34 +00:00
|
|
|
startNamedThread :: UrlRenderer -> NamedThread -> Assistant ()
|
2013-02-06 19:38:41 +00:00
|
|
|
startNamedThread urlrenderer namedthread@(NamedThread name a) = do
|
2013-01-26 03:14:32 +00:00
|
|
|
m <- startedThreads <$> getDaemonStatus
|
|
|
|
case M.lookup name m of
|
|
|
|
Nothing -> start
|
2013-01-26 06:09:33 +00:00
|
|
|
Just (aid, _) -> do
|
|
|
|
r <- liftIO (E.try (poll aid) :: IO (Either E.SomeException (Maybe (Either E.SomeException ()))))
|
|
|
|
case r of
|
|
|
|
Right Nothing -> noop
|
|
|
|
_ -> start
|
2012-10-30 18:34:48 +00:00
|
|
|
where
|
2013-01-26 03:14:32 +00:00
|
|
|
start = do
|
|
|
|
d <- getAssistant id
|
|
|
|
aid <- liftIO $ runmanaged $ d { threadName = name }
|
2013-01-26 06:09:33 +00:00
|
|
|
restart <- asIO $ startNamedThread urlrenderer namedthread
|
2013-01-26 03:14:32 +00:00
|
|
|
modifyDaemonStatus_ $ \s -> s
|
2013-01-26 06:09:33 +00:00
|
|
|
{ startedThreads = M.insertWith' const name (aid, restart) (startedThreads s) }
|
2013-01-26 03:14:32 +00:00
|
|
|
runmanaged d = do
|
|
|
|
aid <- async $ runAssistant d a
|
|
|
|
void $ forkIO $ manager d aid
|
|
|
|
return aid
|
|
|
|
manager d aid = do
|
2013-01-26 06:09:33 +00:00
|
|
|
r <- E.try (wait aid) :: IO (Either E.SomeException ())
|
2012-10-30 18:34:48 +00:00
|
|
|
case r of
|
|
|
|
Right _ -> noop
|
|
|
|
Left e -> do
|
2013-01-26 06:09:33 +00:00
|
|
|
let msg = unwords
|
2013-02-06 19:43:23 +00:00
|
|
|
[ fromThreadName $ threadName d
|
2013-01-26 06:09:33 +00:00
|
|
|
, "crashed:", show e
|
|
|
|
]
|
2012-10-30 18:34:48 +00:00
|
|
|
hPutStrLn stderr msg
|
2013-02-06 19:38:41 +00:00
|
|
|
#ifdef WITH_WEBAPP
|
2013-04-04 05:48:26 +00:00
|
|
|
button <- runAssistant d $ mkAlertButton
|
|
|
|
(T.pack "Restart Thread")
|
|
|
|
urlrenderer
|
|
|
|
(RestartThreadR name)
|
|
|
|
runAssistant d $ void $ addAlert $
|
|
|
|
(warningAlert (fromThreadName name) msg)
|
|
|
|
{ alertButton = Just button }
|
2013-02-06 19:38:41 +00:00
|
|
|
#endif
|
2013-01-26 03:14:32 +00:00
|
|
|
|
2013-01-27 11:43:05 +00:00
|
|
|
namedThreadId :: NamedThread -> Assistant (Maybe ThreadId)
|
|
|
|
namedThreadId (NamedThread name _) = do
|
|
|
|
m <- startedThreads <$> getDaemonStatus
|
|
|
|
return $ asyncThreadId . fst <$> M.lookup name m
|
|
|
|
|
2013-01-26 06:09:33 +00:00
|
|
|
{- Waits for all named threads that have been started to finish.
|
|
|
|
-
|
|
|
|
- Note that if a named thread crashes, it will probably
|
|
|
|
- cause this to crash as well. Also, named threads that are started
|
|
|
|
- after this is called will not be waited on. -}
|
2013-01-26 03:14:32 +00:00
|
|
|
waitNamedThreads :: Assistant ()
|
|
|
|
waitNamedThreads = do
|
|
|
|
m <- startedThreads <$> getDaemonStatus
|
2013-01-26 06:09:33 +00:00
|
|
|
liftIO $ mapM_ (wait . fst) $ M.elems m
|
2013-01-26 03:14:32 +00:00
|
|
|
|