summaryrefslogtreecommitdiffhomepage
path: root/src/Plugins
diff options
context:
space:
mode:
authorJochen Keil <jochen.keil@gmail.com>2012-08-08 12:12:17 +0200
committerJochen Keil <jochen.keil@gmail.com>2012-08-08 12:24:15 +0200
commitaa507d0bda3919e1885edb327b855908f2aafcb8 (patch)
tree456a05c9fe398c494202f6f60dcfaaadc749f72c /src/Plugins
parente339854d14b37f7e5db5835bf2dbcfe3164fc438 (diff)
downloadxmobar-aa507d0bda3919e1885edb327b855908f2aafcb8.tar.gz
xmobar-aa507d0bda3919e1885edb327b855908f2aafcb8.tar.bz2
BufferedPipeReader: A plugin for temporary data display
This plugin allows to display data from multiple pipes. New data will always overwrite the currently displayed data. However, if a timeout is specified, the previous content is restored. Configuration works like this: BufferedPipeReader <Alias> [ ( Timeout, "/path/to/fifo/pipe" ), (..), .. ] If Timeout is set to 0 then the content is persistent, i.e. it will be reset to any previous value, it will itself become the previous value. If Timeout is set to a negative value the earth will stop spinning, so don't do it.
Diffstat (limited to 'src/Plugins')
-rw-r--r--src/Plugins/BufferedPipeReader.hs78
1 files changed, 78 insertions, 0 deletions
diff --git a/src/Plugins/BufferedPipeReader.hs b/src/Plugins/BufferedPipeReader.hs
new file mode 100644
index 0000000..1fb9dcb
--- /dev/null
+++ b/src/Plugins/BufferedPipeReader.hs
@@ -0,0 +1,78 @@
+-----------------------------------------------------------------------------
+-- |
+-- Module : Plugins.BufferedPipeReader
+-- Copyright : (c) Jochen Keil
+-- License : BSD-style (see LICENSE)
+--
+-- Maintainer : Jochen Keil <jochen dot keil at gmail dot com>
+-- Stability : unstable
+-- Portability : unportable
+--
+-- A plugin for reading (temporarily) from named pipes with reset
+--
+-----------------------------------------------------------------------------
+
+module Plugins.BufferedPipeReader where
+
+import Control.Monad(forM_, when)
+import Control.Concurrent
+import Control.Concurrent.STM
+import System.IO
+-- import System.IO.Unsafe(unsafePerformIO)
+
+import Plugins
+
+data BufferedPipeReader = BufferedPipeReader String [(Int, String)]
+ deriving (Read, Show)
+
+-- pipeState :: MVar String
+-- pipeState = unsafePerformIO $ newMVar ""
+
+-- pipe :: (String -> IO ()) -> Handle -> IO ()
+-- pipe cb h = hGetLineSafe h >>= cb
+
+instance Exec BufferedPipeReader where
+ alias ( BufferedPipeReader a _ ) = a
+ start ( BufferedPipeReader _ ps ) cb = do
+
+ (chan, str, rst) <- initV
+ forM_ ps $ \p -> forkIO $ reader p chan
+ writer chan str rst
+
+ where
+ initV :: IO ( TChan (Int, String), TVar String, TVar Bool )
+ initV = atomically $ do
+ tc <- newTChan
+ ts <- newTVar ""
+ tb <- newTVar False
+ return (tc, ts, tb)
+
+ reader :: (Int, FilePath) -> TChan (Int, String) -> IO ()
+ reader p@(to, fp) tc = do
+ openFile fp ReadWriteMode >>= hGetLineSafe >>= \dt ->
+ atomically $ writeTChan tc (to, dt)
+ reader p tc
+
+ writer :: TChan (Int, String) -> TVar String -> TVar Bool -> IO ()
+ writer tc ts otb = do
+ (to, dt, ntb) <- update
+ cb dt
+ when (to /= 0) $ sfork $ reset to ts ntb
+ writer tc ts ntb
+
+ where
+ sfork :: IO () -> IO ()
+ sfork f = forkIO f >> return ()
+
+ update :: IO (Int, String, TVar Bool)
+ update = atomically $ do
+ (to, dt) <- readTChan tc
+ when (to == 0) $ writeTVar ts dt
+ writeTVar otb False
+ tb <- newTVar True
+ return (to, dt, tb)
+
+ reset :: Int -> TVar String -> TVar Bool -> IO ()
+ reset to ts tb = do
+ threadDelay ( to * 100 * 1000 )
+ readTVarIO tb >>= flip when ( readTVarIO ts >>= cb )