progress-meter: Live diagnostics for concurrent activity

[ bsd3, library, system ] [ Propose Tags ]

This library can be used to display a progress bar or other live diagnostics for your application. It supports partial updates from multiple threads without interfering with each other, and it has the correct behaviour when printing diagnostics that are not part of the progress bar and should just scroll by.

The System.Progress module contains a tutorial.


[Skip to Readme]

Modules

[Index]

Flags

Manual Flags

NameDescriptionDefault
devel

Development dependencies

Disabled

Use -f <flag> to enable a flag, or -f -<flag> to disable that flag. More info

Downloads

Maintainer's Corner

Package maintainers

For package maintainers and hackage trustees

Candidates

Versions [RSS] 0.1.0, 1.0.0, 1.0.0.1
Change log CHANGELOG.md
Dependencies ansi-terminal (>=0.6 && <0.8), async (>=2.1.1 && <2.2), base (>=4.8 && <4.11), stm (>=2.4 && <2.5) [details]
License BSD-3-Clause
Copyright Copyright 2017 Ertugrul Söylemez
Author Ertugrul Söylemez <esz@posteo.de>
Maintainer Ertugrul Söylemez <esz@posteo.de>
Category System
Home page https://github.com/esoeylemez/progress-meter
Bug tracker https://github.com/esoeylemez/progress-meter/issues
Source repo head: git clone https://github.com/esoeylemez/progress-meter.git
Uploaded by esz at 2017-12-25T05:42:01Z
Distributions
Reverse Dependencies 1 direct, 0 indirect [details]
Downloads 1970 total (10 in the last 30 days)
Rating (no votes yet) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs uploaded by user
Build status unknown [no reports yet]

Readme for progress-meter-1.0.0.1

[back to package description]

Progress-Meter

This library can be used to display a progress bar or other live diagnostics for your application. It supports partial updates from multiple threads without interfering with each other, and it has the correct behaviour when printing diagnostics that are not part of the progress bar and should just scroll by.

The @System.Progress@ module contains a tutorial.

Quickstart

Use the withProgress_ function to create a progress bar for the duration of an action:

withProgress_
    :: s                   -- ^ Initial state value
    -> (s -> String)       -- ^ State renderer
    -> (Meter' s -> IO r)  -- ^ Action with a progress bar
    -> IO r

You need to choose a state type and a renderer for the state that is used to display it in the terminal. Then you can use setMeter or modifyMeter to update the state value, which triggers a redraw of the progress bar:

setMeter    :: Meter' s -> s -> IO ()
modifyMeter :: Meter' s -> (s -> s) -> IO ()

To perform regular output (logging or other diagnostics that should scroll by) use the putMsgLn function:

putMsgLn :: Meter' s -> String -> IO ()

You can use the zoomMeter function to give individual threads a meter that only changes part of the state:

zoomMeter :: ((a -> a) -> s -> s) -> Meter' s -> Meter' a

Simple example

Taken from the tutorial the following uses a progress bar with state of type Int and renders it to a simple percentage display:

import Control.Concurrent
import Data.Foldable
import System.Progress

main :: IO ()
main =
    withProgress_ 0 render $ \pm -> do
        for_ [1..99] $ \p -> do
            threadDelay 20000
            setMeter pm p
        threadDelay 3000000
        setMeter pm 100
        threadDelay 1000000

    where
    render :: Int -> String
    render x = "Progress: " ++ show x ++ "%"

Complex example

The following is an example of how you can use zoomMeter to display multiple progress indicators for concurrent threads and update each of them independently. The program takes a bunch of command line arguments and launches a separate worker thread for each. The overall progress state is represented by a value of type (Map FilePath Int) that keeps track of the percentage of each individual worker:

import Control.Concurrent
import Control.Concurrent.Async
import Control.Exception
import Control.Monad
import Data.Foldable
import Data.List (intercalate)
import qualified Data.Map.Strict as M
import System.Environment
import System.Progress
import System.Random


-- Worker threads take a meter that points to an individual percentage.
-- The percentage is 'Maybe'-wrapped, because 'Nothing' represents
-- absence of the percentage.

thread :: Meter' (Maybe Int) -> FilePath -> IO ()
thread pm fp =
    -- Add the percentage for this file path at the beginning and make
    -- sure it disappears at the end
    bracket_ (setMeter pm (Just 0)) (setMeter pm Nothing) $ do

        -- Simulate real work by choosing a random delay for each thread
        delay <- randomRIO (100000, 200000)

        putMsgLn pm ("Started work on " ++ fp)

        -- Do the actual "work"
        for_ [1..99] $ \p -> do
            when (p == 50)
                 (putMsgLn pm (fp ++ " is half-way done"))
            setMeter pm (Just p)
            threadDelay delay

        putMsgLn pm ("Done with " ++ fp)


-- This function turns a meter that points to a 'Map k a' into a meter
-- that points to a specific key.  'Nothing' represents lack of that
-- particular key in the map.

zoomKey :: (Ord k) => k -> Meter' (M.Map k a) -> Meter' (Maybe a)
zoomKey k = zoomMeter (\f -> M.alter f k)


main :: IO ()
main =
    -- The initial progress state is the empty map
    withProgress_ M.empty render $ \pm ->
        getArgs >>=

        -- The 'zoomMeter' function is used here to construct a meter
        -- that points to an individual key of the map:
        mapConcurrently_ (\fp -> thread (zoomKey fp pm) fp)

    where
    -- The renderer displays something like this:
    -- a: 21% | b: 50% | c: 8%
    render :: M.Map FilePath Int -> String
    render =
        intercalate " | " .
        map (\(fp, p) -> fp ++ ": " ++ show p ++ "%") .
        M.assocs