Fix bug in logging thread
It would die on newlines due to empty String blindness. Also make sure takeMVar does not block.
This commit is contained in:
parent
ccb95bcbee
commit
78ae77780b
@ -10,6 +10,7 @@ import GHCup.Utils.Prelude
|
|||||||
import GHCup.Types
|
import GHCup.Types
|
||||||
|
|
||||||
import Control.Concurrent
|
import Control.Concurrent
|
||||||
|
import Control.Concurrent.Async
|
||||||
import Control.Exception ( evaluate )
|
import Control.Exception ( evaluate )
|
||||||
import Control.Exception.Safe
|
import Control.Exception.Safe
|
||||||
import Control.Monad
|
import Control.Monad
|
||||||
@ -57,14 +58,6 @@ import qualified "unix-bytestring" System.Posix.IO.ByteString
|
|||||||
|
|
||||||
|
|
||||||
|
|
||||||
|
|
||||||
-- | Bool signals whether the regions should be cleaned.
|
|
||||||
data StopThread = StopThread Bool
|
|
||||||
deriving Show
|
|
||||||
|
|
||||||
instance Exception StopThread
|
|
||||||
|
|
||||||
|
|
||||||
data ProcessError = NonZeroExit Int ByteString [ByteString]
|
data ProcessError = NonZeroExit Int ByteString [ByteString]
|
||||||
| PTerminated ByteString [ByteString]
|
| PTerminated ByteString [ByteString]
|
||||||
| PStopped ByteString [ByteString]
|
| PStopped ByteString [ByteString]
|
||||||
@ -131,10 +124,9 @@ execLogged exe spath args lfile chdir env = do
|
|||||||
pState <- newEmptyMVar
|
pState <- newEmptyMVar
|
||||||
done <- newEmptyMVar
|
done <- newEmptyMVar
|
||||||
void
|
void
|
||||||
$ forkOS
|
$ forkIO
|
||||||
$ EX.handle (\(_ :: StopThread) -> pure ())
|
|
||||||
$ EX.handle (\(_ :: IOException) -> pure ())
|
$ EX.handle (\(_ :: IOException) -> pure ())
|
||||||
$ flip finally (putMVar done ())
|
$ flip EX.finally (putMVar done ())
|
||||||
$ (if verbose
|
$ (if verbose
|
||||||
then tee fd stdoutRead
|
then tee fd stdoutRead
|
||||||
else printToRegion fd stdoutRead 6 pState
|
else printToRegion fd stdoutRead 6 pState
|
||||||
@ -157,7 +149,7 @@ execLogged exe spath args lfile chdir env = do
|
|||||||
e <- toProcessError exe args <$!> SPPB.getProcessStatus True True pid
|
e <- toProcessError exe args <$!> SPPB.getProcessStatus True True pid
|
||||||
putMVar pState (either (const False) (const True) e)
|
putMVar pState (either (const False) (const True) e)
|
||||||
|
|
||||||
takeMVar done
|
void $ race (takeMVar done) (threadDelay (1000000 * 3))
|
||||||
closeFd stdoutRead
|
closeFd stdoutRead
|
||||||
|
|
||||||
pure e
|
pure e
|
||||||
@ -225,33 +217,41 @@ execLogged exe spath args lfile chdir env = do
|
|||||||
| BS.length bs > w && w > 5 -> BS.take (w - 4) bs <> "..."
|
| BS.length bs > w && w > 5 -> BS.take (w - 4) bs <> "..."
|
||||||
| otherwise -> bs
|
| otherwise -> bs
|
||||||
|
|
||||||
-- read an entire line from the file descriptor (removes the newline char)
|
-- Consecutively read from Fd in 512 chunks until we hit
|
||||||
readLine :: MonadIO m => Fd -> ByteString -> m (ByteString, ByteString)
|
-- newline or EOF.
|
||||||
readLine fd = go
|
readLine :: MonadIO m
|
||||||
|
=> Fd -- ^ input file descriptor
|
||||||
|
-> ByteString -- ^ rest buffer (read across newline)
|
||||||
|
-> m (ByteString, ByteString, Bool) -- ^ (full line, rest, eof)
|
||||||
|
readLine fd = \inBs -> go inBs
|
||||||
where
|
where
|
||||||
go inBs = do
|
go inBs = do
|
||||||
bs <-
|
-- if buffer is not empty, process it first
|
||||||
liftIO
|
mbs <- if BS.length inBs == 0
|
||||||
$ handleIO (\e -> if isEOFError e then pure "" else ioError e)
|
-- otherwise attempt read
|
||||||
$ SPIB.fdRead fd 512
|
then liftIO
|
||||||
let nbs = BS.append inBs bs
|
$ handleIO (\e -> if isEOFError e then pure Nothing else ioError e)
|
||||||
(line, rest) = BS.span (/= _lf) nbs
|
$ fmap Just
|
||||||
if
|
$ SPIB.fdRead fd 512
|
||||||
| BS.length rest /= 0 -> pure (line, BS.tail rest)
|
else pure $ Just inBs
|
||||||
| BS.length line == 0 -> pure (mempty, mempty)
|
case mbs of
|
||||||
| otherwise -> (\(l, r) -> (line <> l, r)) <$!> go mempty
|
Nothing -> pure ("", "", True)
|
||||||
|
Just bs -> do
|
||||||
|
-- split on newline
|
||||||
|
let (line, rest) = BS.span (/= _lf) bs
|
||||||
|
if
|
||||||
|
| BS.length rest /= 0 -> pure (line, BS.tail rest, False)
|
||||||
|
-- if rest is empty, then there was no newline, process further
|
||||||
|
| otherwise -> (\(l, r, b) -> (line <> l, r, b)) <$!> go mempty
|
||||||
|
|
||||||
readTilEOF :: MonadIO m => (ByteString -> m a) -> Fd -> m ()
|
readTilEOF :: MonadIO m => (ByteString -> m a) -> Fd -> m ()
|
||||||
readTilEOF ~action' fd' = go mempty
|
readTilEOF ~action' fd' = go mempty
|
||||||
where
|
where
|
||||||
go bs' = do
|
go bs' = do
|
||||||
(bs, rest) <- readLine fd' bs'
|
(bs, rest, eof) <- readLine fd' bs'
|
||||||
if
|
if eof
|
||||||
| BS.length bs == 0 -> liftIO
|
then liftIO $ ioError (mkIOError eofErrorType "" Nothing Nothing)
|
||||||
$ ioError (mkIOError eofErrorType "" Nothing Nothing)
|
else (void $ action' bs) >> go rest
|
||||||
| otherwise -> do
|
|
||||||
void $ action' bs
|
|
||||||
go rest
|
|
||||||
|
|
||||||
|
|
||||||
-- | Capture the stdout and stderr of the given action, which
|
-- | Capture the stdout and stderr of the given action, which
|
||||||
@ -288,13 +288,12 @@ captureOutStreams action = do
|
|||||||
done <- newEmptyMVar
|
done <- newEmptyMVar
|
||||||
_ <-
|
_ <-
|
||||||
forkIO
|
forkIO
|
||||||
$ EX.handle (\(_ :: StopThread) -> pure ())
|
|
||||||
$ EX.handle (\(_ :: IOException) -> pure ())
|
$ EX.handle (\(_ :: IOException) -> pure ())
|
||||||
$ flip finally (putMVar done ())
|
$ flip EX.finally (putMVar done ())
|
||||||
$ writeStds parentStdoutRead parentStderrRead refOut refErr
|
$ writeStds parentStdoutRead parentStderrRead refOut refErr
|
||||||
|
|
||||||
status <- SPPB.getProcessStatus True True pid
|
status <- SPPB.getProcessStatus True True pid
|
||||||
takeMVar done
|
void $ race (takeMVar done) (threadDelay (1000000 * 3))
|
||||||
|
|
||||||
case status of
|
case status of
|
||||||
-- readFd will take care of closing the fd
|
-- readFd will take care of closing the fd
|
||||||
@ -314,13 +313,13 @@ captureOutStreams action = do
|
|||||||
void
|
void
|
||||||
$ forkIO
|
$ forkIO
|
||||||
$ hideError eofErrorType
|
$ hideError eofErrorType
|
||||||
$ flip finally (putMVar doneOut ())
|
$ flip EX.finally (putMVar doneOut ())
|
||||||
$ readTilEOF (\x -> modifyIORef' rout (<> x)) pout
|
$ readTilEOF (\x -> modifyIORef' rout (<> x)) pout
|
||||||
doneErr <- newEmptyMVar
|
doneErr <- newEmptyMVar
|
||||||
void
|
void
|
||||||
$ forkIO
|
$ forkIO
|
||||||
$ hideError eofErrorType
|
$ hideError eofErrorType
|
||||||
$ flip finally (putMVar doneErr ())
|
$ flip EX.finally (putMVar doneErr ())
|
||||||
$ readTilEOF (\x -> modifyIORef' rerr (<> x)) perr
|
$ readTilEOF (\x -> modifyIORef' rerr (<> x)) perr
|
||||||
takeMVar doneOut
|
takeMVar doneOut
|
||||||
takeMVar doneErr
|
takeMVar doneErr
|
||||||
|
Loading…
Reference in New Issue
Block a user