Work around problem with concurrent-output when in a non-unicode locale by avoiding use of it in such a locale.
Instead -J will behave as if it was built without concurrent-output support in this situation. Ie, it will be mostly quiet, except when there's an error. Note that it's not a problem for a filename to contain invalid utf-8 when in a utf-8 locale. That is handled ok by concurrent-output. It's only displaying unicode characters in a non-unicode locale that doesn't work.
This commit is contained in:
parent
d3130930db
commit
0f18636c8a
8 changed files with 82 additions and 45 deletions
|
@ -53,7 +53,7 @@ performCommandAction Command { cmdcheck = c, cmdname = name } seek cont = do
|
||||||
commandAction :: CommandStart -> Annex ()
|
commandAction :: CommandStart -> Annex ()
|
||||||
commandAction a = withOutputType go
|
commandAction a = withOutputType go
|
||||||
where
|
where
|
||||||
go (ConcurrentOutput n) = do
|
go o@(ConcurrentOutput n _) = do
|
||||||
ws <- Annex.getState Annex.workers
|
ws <- Annex.getState Annex.workers
|
||||||
(st, ws') <- if null ws
|
(st, ws') <- if null ws
|
||||||
then do
|
then do
|
||||||
|
@ -63,7 +63,7 @@ commandAction a = withOutputType go
|
||||||
l <- liftIO $ drainTo (n-1) ws
|
l <- liftIO $ drainTo (n-1) ws
|
||||||
findFreeSlot l
|
findFreeSlot l
|
||||||
w <- liftIO $ async
|
w <- liftIO $ async
|
||||||
$ snd <$> Annex.run st (inOwnConsoleRegion run)
|
$ snd <$> Annex.run st (inOwnConsoleRegion o run)
|
||||||
Annex.changeState $ \s -> s { Annex.workers = Right w:ws' }
|
Annex.changeState $ \s -> s { Annex.workers = Right w:ws' }
|
||||||
go _ = run
|
go _ = run
|
||||||
run = void $ includeCommandAction a
|
run = void $ includeCommandAction a
|
||||||
|
@ -155,9 +155,13 @@ allowConcurrentOutput :: Annex a -> Annex a
|
||||||
allowConcurrentOutput a = go =<< Annex.getState Annex.concurrentjobs
|
allowConcurrentOutput a = go =<< Annex.getState Annex.concurrentjobs
|
||||||
where
|
where
|
||||||
go Nothing = a
|
go Nothing = a
|
||||||
go (Just n) = Regions.displayConsoleRegions $
|
go (Just n) = ifM (liftIO concurrentOutputSupported)
|
||||||
bracket_ (setup n) cleanup a
|
( Regions.displayConsoleRegions $
|
||||||
setup = Annex.setOutput . ConcurrentOutput
|
goconcurrent (ConcurrentOutput n True)
|
||||||
|
, goconcurrent (ConcurrentOutput n False)
|
||||||
|
)
|
||||||
|
goconcurrent o = bracket_ (setup o) cleanup a
|
||||||
|
setup = Annex.setOutput
|
||||||
cleanup = do
|
cleanup = do
|
||||||
finishCommandActions
|
finishCommandActions
|
||||||
Annex.setOutput NormalOutput
|
Annex.setOutput NormalOutput
|
||||||
|
|
|
@ -212,7 +212,7 @@ commandProgressDisabled = withOutputType $ \t -> return $ case t of
|
||||||
QuietOutput -> True
|
QuietOutput -> True
|
||||||
JSONOutput -> True
|
JSONOutput -> True
|
||||||
NormalOutput -> False
|
NormalOutput -> False
|
||||||
ConcurrentOutput _ -> True
|
ConcurrentOutput {} -> True
|
||||||
|
|
||||||
{- Use to show a message that is displayed implicitly, and so might be
|
{- Use to show a message that is displayed implicitly, and so might be
|
||||||
- disabled when running a certian command that needs more control over its
|
- disabled when running a certian command that needs more control over its
|
||||||
|
|
|
@ -1,13 +1,12 @@
|
||||||
{-# OPTIONS_GHC -fno-warn-orphans #-}
|
|
||||||
|
|
||||||
{- git-annex output messages, including concurrent output to display regions
|
{- git-annex output messages, including concurrent output to display regions
|
||||||
-
|
-
|
||||||
- Copyright 2010-2015 Joey Hess <id@joeyh.name>
|
- Copyright 2010-2016 Joey Hess <id@joeyh.name>
|
||||||
-
|
-
|
||||||
- Licensed under the GNU GPL version 3 or higher.
|
- Licensed under the GNU GPL version 3 or higher.
|
||||||
-}
|
-}
|
||||||
|
|
||||||
{-# LANGUAGE CPP #-}
|
{-# LANGUAGE CPP #-}
|
||||||
|
{-# OPTIONS_GHC -fno-warn-orphans #-}
|
||||||
|
|
||||||
module Messages.Concurrent where
|
module Messages.Concurrent where
|
||||||
|
|
||||||
|
@ -20,6 +19,7 @@ import qualified System.Console.Concurrent as Console
|
||||||
import qualified System.Console.Regions as Regions
|
import qualified System.Console.Regions as Regions
|
||||||
import Control.Concurrent.STM
|
import Control.Concurrent.STM
|
||||||
import qualified Data.Text as T
|
import qualified Data.Text as T
|
||||||
|
import GHC.IO.Encoding
|
||||||
#endif
|
#endif
|
||||||
|
|
||||||
{- Outputs a message in a concurrency safe way.
|
{- Outputs a message in a concurrency safe way.
|
||||||
|
@ -29,9 +29,14 @@ import qualified Data.Text as T
|
||||||
- When built without concurrent-output support, the fallback action is run
|
- When built without concurrent-output support, the fallback action is run
|
||||||
- instead.
|
- instead.
|
||||||
-}
|
-}
|
||||||
concurrentMessage :: Bool -> String -> Annex () -> Annex ()
|
concurrentMessage :: OutputType -> Bool -> String -> Annex () -> Annex ()
|
||||||
|
#ifdef WITH_CONCURRENTOUTPUT
|
||||||
|
concurrentMessage o iserror msg fallback
|
||||||
|
| concurrentOutputEnabled o =
|
||||||
|
go =<< consoleRegion <$> Annex.getState Annex.output
|
||||||
|
#endif
|
||||||
|
| otherwise = fallback
|
||||||
#ifdef WITH_CONCURRENTOUTPUT
|
#ifdef WITH_CONCURRENTOUTPUT
|
||||||
concurrentMessage iserror msg _ = go =<< consoleRegion <$> Annex.getState Annex.output
|
|
||||||
where
|
where
|
||||||
go Nothing
|
go Nothing
|
||||||
| iserror = liftIO $ Console.errorConcurrent msg
|
| iserror = liftIO $ Console.errorConcurrent msg
|
||||||
|
@ -48,9 +53,6 @@ concurrentMessage iserror msg _ = go =<< consoleRegion <$> Annex.getState Annex.
|
||||||
rl <- takeTMVar Regions.regionList
|
rl <- takeTMVar Regions.regionList
|
||||||
putTMVar Regions.regionList
|
putTMVar Regions.regionList
|
||||||
(if r `elem` rl then rl else r:rl)
|
(if r `elem` rl then rl else r:rl)
|
||||||
|
|
||||||
#else
|
|
||||||
concurrentMessage _ _ fallback = fallback
|
|
||||||
#endif
|
#endif
|
||||||
|
|
||||||
{- Runs an action in its own dedicated region of the console.
|
{- Runs an action in its own dedicated region of the console.
|
||||||
|
@ -62,21 +64,25 @@ concurrentMessage _ _ fallback = fallback
|
||||||
- When not at a console, a region is not displayed until the action is
|
- When not at a console, a region is not displayed until the action is
|
||||||
- complete.
|
- complete.
|
||||||
-}
|
-}
|
||||||
inOwnConsoleRegion :: Annex a -> Annex a
|
inOwnConsoleRegion :: OutputType -> Annex a -> Annex a
|
||||||
|
inOwnConsoleRegion o a
|
||||||
#ifdef WITH_CONCURRENTOUTPUT
|
#ifdef WITH_CONCURRENTOUTPUT
|
||||||
inOwnConsoleRegion a = do
|
| concurrentOutputEnabled o = do
|
||||||
r <- mkregion
|
r <- mkregion
|
||||||
setregion (Just r)
|
setregion (Just r)
|
||||||
eret <- tryNonAsync a `onException` rmregion r
|
eret <- tryNonAsync a `onException` rmregion r
|
||||||
case eret of
|
case eret of
|
||||||
Left e -> do
|
Left e -> do
|
||||||
-- Add error message to region before it closes.
|
-- Add error message to region before it closes.
|
||||||
concurrentMessage True (show e) noop
|
concurrentMessage o True (show e) noop
|
||||||
rmregion r
|
rmregion r
|
||||||
throwM e
|
throwM e
|
||||||
Right ret -> do
|
Right ret -> do
|
||||||
rmregion r
|
rmregion r
|
||||||
return ret
|
return ret
|
||||||
|
#endif
|
||||||
|
| otherwise = a
|
||||||
|
#ifdef WITH_CONCURRENTOUTPUT
|
||||||
where
|
where
|
||||||
-- The region is allocated here, but not displayed until
|
-- The region is allocated here, but not displayed until
|
||||||
-- a message is added to it. This avoids unnecessary screen
|
-- a message is added to it. This avoids unnecessary screen
|
||||||
|
@ -94,8 +100,6 @@ inOwnConsoleRegion a = do
|
||||||
unless (T.null t) $
|
unless (T.null t) $
|
||||||
Console.bufferOutputSTM h t
|
Console.bufferOutputSTM h t
|
||||||
Regions.closeConsoleRegion r
|
Regions.closeConsoleRegion r
|
||||||
#else
|
|
||||||
inOwnConsoleRegion = id
|
|
||||||
#endif
|
#endif
|
||||||
|
|
||||||
{- The progress region is displayed inline with the current console region. -}
|
{- The progress region is displayed inline with the current console region. -}
|
||||||
|
@ -108,3 +112,24 @@ withProgressRegion a = do
|
||||||
instance Regions.LiftRegion Annex where
|
instance Regions.LiftRegion Annex where
|
||||||
liftRegion = liftIO . atomically
|
liftRegion = liftIO . atomically
|
||||||
#endif
|
#endif
|
||||||
|
|
||||||
|
{- The concurrent-output library uses Text, which bypasses the normal use
|
||||||
|
- of the fileSystemEncoding to roundtrip invalid characters, when in a
|
||||||
|
- non-unicode locale. Work around that problem by avoiding using
|
||||||
|
- concurrent output when not in a unicode locale. -}
|
||||||
|
concurrentOutputSupported :: IO Bool
|
||||||
|
#ifdef WITH_CONCURRENTOUTPUT
|
||||||
|
#ifndef mingw32_HOST_OS
|
||||||
|
concurrentOutputSupported = do
|
||||||
|
enc <- getLocaleEncoding
|
||||||
|
return ("UTF" `isInfixOf` textEncodingName enc)
|
||||||
|
#else
|
||||||
|
concurrentOutputSupported = return True -- Windows is always unicode
|
||||||
|
#endif
|
||||||
|
#else
|
||||||
|
concurrentOutputSupported = return False
|
||||||
|
#endif
|
||||||
|
|
||||||
|
concurrentOutputEnabled :: OutputType -> Bool
|
||||||
|
concurrentOutputEnabled (ConcurrentOutput _ b) = b
|
||||||
|
concurrentOutputEnabled _ = False
|
||||||
|
|
|
@ -21,13 +21,13 @@ outputMessage json s = withOutputType go
|
||||||
go NormalOutput = liftIO $
|
go NormalOutput = liftIO $
|
||||||
flushed $ putStr s
|
flushed $ putStr s
|
||||||
go QuietOutput = q
|
go QuietOutput = q
|
||||||
go (ConcurrentOutput _) = concurrentMessage False s q
|
go o@(ConcurrentOutput {}) = concurrentMessage o False s q
|
||||||
go JSONOutput = liftIO $ flushed json
|
go JSONOutput = liftIO $ flushed json
|
||||||
|
|
||||||
outputError :: String -> Annex ()
|
outputError :: String -> Annex ()
|
||||||
outputError s = withOutputType go
|
outputError s = withOutputType go
|
||||||
where
|
where
|
||||||
go (ConcurrentOutput _) = concurrentMessage True s (go NormalOutput)
|
go o@(ConcurrentOutput {}) = concurrentMessage o True s (go NormalOutput)
|
||||||
go _ = liftIO $ do
|
go _ = liftIO $ do
|
||||||
hFlush stdout
|
hFlush stdout
|
||||||
hPutStr stderr s
|
hPutStr stderr s
|
||||||
|
|
|
@ -46,16 +46,16 @@ metered combinemeterupdate key a = case keySize key of
|
||||||
liftIO $ clearMeter stdout meter
|
liftIO $ clearMeter stdout meter
|
||||||
return r
|
return r
|
||||||
#if WITH_CONCURRENTOUTPUT
|
#if WITH_CONCURRENTOUTPUT
|
||||||
go size (ConcurrentOutput _) = withProgressRegion $ \r -> do
|
go size o@(ConcurrentOutput {})
|
||||||
|
| concurrentOutputEnabled o = withProgressRegion $ \r -> do
|
||||||
(progress, meter) <- mkmeter size
|
(progress, meter) <- mkmeter size
|
||||||
a $ \n -> liftIO $ do
|
a $ \n -> liftIO $ do
|
||||||
setP progress $ fromBytesProcessed n
|
setP progress $ fromBytesProcessed n
|
||||||
s <- renderMeter meter
|
s <- renderMeter meter
|
||||||
Regions.setConsoleRegion r ("\n" ++ s)
|
Regions.setConsoleRegion r ("\n" ++ s)
|
||||||
maybe noop (\m -> m n) combinemeterupdate
|
maybe noop (\m -> m n) combinemeterupdate
|
||||||
#else
|
|
||||||
go _ (ConcurrentOutput _) = nometer
|
|
||||||
#endif
|
#endif
|
||||||
|
| otherwise = nometer
|
||||||
|
|
||||||
mkmeter size = do
|
mkmeter size = do
|
||||||
progress <- liftIO $ newProgress "" size
|
progress <- liftIO $ newProgress "" size
|
||||||
|
@ -69,14 +69,14 @@ metered combinemeterupdate key a = case keySize key of
|
||||||
concurrentMetered :: Maybe MeterUpdate -> Key -> (MeterUpdate -> Annex a) -> Annex a
|
concurrentMetered :: Maybe MeterUpdate -> Key -> (MeterUpdate -> Annex a) -> Annex a
|
||||||
concurrentMetered combinemeterupdate key a = withOutputType go
|
concurrentMetered combinemeterupdate key a = withOutputType go
|
||||||
where
|
where
|
||||||
go (ConcurrentOutput _) = metered combinemeterupdate key a
|
go (ConcurrentOutput {}) = metered combinemeterupdate key a
|
||||||
go _ = a (fromMaybe nullMeterUpdate combinemeterupdate)
|
go _ = a (fromMaybe nullMeterUpdate combinemeterupdate)
|
||||||
|
|
||||||
{- Poll file size to display meter, but only for concurrent output. -}
|
{- Poll file size to display meter, but only for concurrent output. -}
|
||||||
concurrentMeteredFile :: FilePath -> Maybe MeterUpdate -> Key -> Annex a -> Annex a
|
concurrentMeteredFile :: FilePath -> Maybe MeterUpdate -> Key -> Annex a -> Annex a
|
||||||
concurrentMeteredFile file combinemeterupdate key a = withOutputType go
|
concurrentMeteredFile file combinemeterupdate key a = withOutputType go
|
||||||
where
|
where
|
||||||
go (ConcurrentOutput _) = metered combinemeterupdate key $ \p ->
|
go (ConcurrentOutput {}) = metered combinemeterupdate key $ \p ->
|
||||||
watchFileSize file p a
|
watchFileSize file p a
|
||||||
go _ = a
|
go _ = a
|
||||||
|
|
||||||
|
@ -120,6 +120,6 @@ mkStderrEmitter :: Annex (String -> IO ())
|
||||||
mkStderrEmitter = withOutputType go
|
mkStderrEmitter = withOutputType go
|
||||||
where
|
where
|
||||||
#ifdef WITH_CONCURRENTOUTPUT
|
#ifdef WITH_CONCURRENTOUTPUT
|
||||||
go (ConcurrentOutput _) = return Console.errorConcurrent
|
go o | concurrentOutputEnabled o = return Console.errorConcurrent
|
||||||
#endif
|
#endif
|
||||||
go _ = return (hPutStrLn stderr)
|
go _ = return (hPutStrLn stderr)
|
||||||
|
|
|
@ -15,7 +15,7 @@ import Data.Default
|
||||||
import System.Console.Regions (ConsoleRegion)
|
import System.Console.Regions (ConsoleRegion)
|
||||||
#endif
|
#endif
|
||||||
|
|
||||||
data OutputType = NormalOutput | QuietOutput | ConcurrentOutput Int | JSONOutput
|
data OutputType = NormalOutput | QuietOutput | ConcurrentOutput Int Bool | JSONOutput
|
||||||
deriving (Show)
|
deriving (Show)
|
||||||
|
|
||||||
data SideActionBlock = NoBlock | StartBlock | InBlock
|
data SideActionBlock = NoBlock | StartBlock | InBlock
|
||||||
|
|
3
debian/changelog
vendored
3
debian/changelog
vendored
|
@ -3,6 +3,9 @@ git-annex (6.20160212) UNRELEASED; urgency=medium
|
||||||
* Support getting files from read-only repositories.
|
* Support getting files from read-only repositories.
|
||||||
* checkpresentkey: Allow to be run without an explicit remote.
|
* checkpresentkey: Allow to be run without an explicit remote.
|
||||||
* checkpresentkey: Added --batch.
|
* checkpresentkey: Added --batch.
|
||||||
|
* Work around problem with concurrent-output when in a non-unicode locale
|
||||||
|
by avoiding use of it in such a locale. Instead -J will behave as if
|
||||||
|
it was built without concurrent-output support in this situation.
|
||||||
|
|
||||||
-- Joey Hess <id@joeyh.name> Fri, 12 Feb 2016 14:03:46 -0400
|
-- Joey Hess <id@joeyh.name> Fri, 12 Feb 2016 14:03:46 -0400
|
||||||
|
|
||||||
|
|
|
@ -81,3 +81,8 @@ Plenty. In fact I've been using it for a long time - I just only recently tried
|
||||||
|
|
||||||
|
|
||||||
[[!meta title="-J can crash on displaying filenames not supported by current locale"]]
|
[[!meta title="-J can crash on displaying filenames not supported by current locale"]]
|
||||||
|
|
||||||
|
> I've worked around this by detecting the non-unicode locale and avoiding
|
||||||
|
> the fancy concurrent output which needs it. So -J will work, just not
|
||||||
|
> with concurrent progress. I think this is the best that can be done
|
||||||
|
> reasonably, so [[done]]. --[[Joey]]
|
||||||
|
|
Loading…
Reference in a new issue