use async to track and manage threads
This commit is contained in:
parent
7fc6ebb765
commit
1713ed95f7
11 changed files with 77 additions and 61 deletions
|
@ -7,19 +7,39 @@
|
|||
|
||||
module Assistant.NamedThread where
|
||||
|
||||
import Assistant.Common
|
||||
import Common.Annex
|
||||
import Assistant.Types.DaemonStatus
|
||||
import Assistant.DaemonStatus
|
||||
import Assistant.Alert
|
||||
import Assistant.Monad
|
||||
|
||||
import qualified Control.Exception as E
|
||||
import Control.Concurrent
|
||||
import Control.Concurrent.Async
|
||||
import qualified Data.Map as M
|
||||
|
||||
runNamedThread :: NamedThread -> Assistant ()
|
||||
runNamedThread (NamedThread name a) = do
|
||||
d <- getAssistant id
|
||||
liftIO . go $ d { threadName = name }
|
||||
{- 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. -}
|
||||
startNamedThread :: NamedThread -> Assistant ()
|
||||
startNamedThread namedthread@(NamedThread name a) = do
|
||||
m <- startedThreads <$> getDaemonStatus
|
||||
case M.lookup name m of
|
||||
Nothing -> start
|
||||
Just aid ->
|
||||
maybe noop (const start) =<< liftIO (poll aid)
|
||||
where
|
||||
go d = do
|
||||
r <- E.try (runAssistant d a) :: IO (Either E.SomeException ())
|
||||
start = do
|
||||
d <- getAssistant id
|
||||
aid <- liftIO $ runmanaged $ d { threadName = name }
|
||||
modifyDaemonStatus_ $ \s -> s
|
||||
{ startedThreads = M.insertWith' const name aid (startedThreads s) }
|
||||
runmanaged d = do
|
||||
aid <- async $ runAssistant d a
|
||||
void $ forkIO $ manager d aid
|
||||
return aid
|
||||
manager d aid = do
|
||||
r <- waitCatch aid
|
||||
case r of
|
||||
Right _ -> noop
|
||||
Left e -> do
|
||||
|
@ -28,3 +48,10 @@ runNamedThread (NamedThread name a) = do
|
|||
-- TODO click to restart
|
||||
runAssistant d $ void $
|
||||
addAlert $ warningAlert name msg
|
||||
|
||||
{- Waits for all named threads that have been started to finish. -}
|
||||
waitNamedThreads :: Assistant ()
|
||||
waitNamedThreads = do
|
||||
m <- startedThreads <$> getDaemonStatus
|
||||
liftIO $ mapM_ wait $ M.elems m
|
||||
|
||||
|
|
Loading…
Add table
Add a link
Reference in a new issue