Skip to content
Snippets Groups Projects
Commit 4e30d8df authored by Jens Nolte's avatar Jens Nolte
Browse files

Refactor Block types

- PushBlock becomes Block.
- Block and PushBlock differentiate in their Proxy upstream type.
- Exit codes are unified as ExitBlock.
parent aa33baf8
No related branches found
No related tags found
No related merge requests found
...@@ -78,8 +78,8 @@ getBatteryState path = maybe getBatteryStateCharge (return . Just) =<< getBatter ...@@ -78,8 +78,8 @@ getBatteryState path = maybe getBatteryStateCharge (return . Just) =<< getBatter
| otherwise -> BatteryOther | otherwise -> BatteryOther
batteryBlock :: PullBlock batteryBlock :: Block
batteryBlock = forever $ do batteryBlock = pullBlock $ forever $ do
batteryPaths <- liftIO $ map ((apiPath <> "/") <>) . filter (T.isPrefixOf "BAT" . T.pack) <$> getDirectoryContents apiPath batteryPaths <- liftIO $ map ((apiPath <> "/") <>) . filter (T.isPrefixOf "BAT" . T.pack) <$> getDirectoryContents apiPath
batteryStates <- liftIO $ mapM getBatteryState batteryPaths batteryStates <- liftIO $ mapM getBatteryState batteryPaths
isPlugged <- liftIO getPluggedState isPlugged <- liftIO getPluggedState
...@@ -101,9 +101,9 @@ batteryBlock = forever $ do ...@@ -101,9 +101,9 @@ batteryBlock = forever $ do
_ -> return . return $ False _ -> return . return $ False
updateBatteryBlock :: Bool -> [BatteryState] -> Block () updateBatteryBlock :: Bool -> [BatteryState] -> PullBlock' ()
updateBatteryBlock _ [] = updateBlockEmpty updateBatteryBlock _ [] = sendEmptyBlockUpdate
updateBatteryBlock isPlugged bs = updateBlock $ (shortText.~shortText') $ mkBlockOutput fullText' updateBatteryBlock isPlugged bs = sendBlockUpdate $ (shortText.~shortText') $ mkBlockOutput fullText'
where where
fullText' :: BlockText fullText' :: BlockText
fullText' = overallPercentage <> optionalEachBattery <> optionalOverallEstimate fullText' = overallPercentage <> optionalEachBattery <> optionalOverallEstimate
......
...@@ -4,7 +4,7 @@ module QBar.Blocks.CpuUsage where ...@@ -4,7 +4,7 @@ module QBar.Blocks.CpuUsage where
import Control.Applicative ((<|>)) import Control.Applicative ((<|>))
import Control.Lens import Control.Lens
import Control.Monad.State (StateT, evalStateT) import Control.Monad.State (StateT, evalStateT, lift)
import qualified Data.Attoparsec.Text.Lazy as AT import qualified Data.Attoparsec.Text.Lazy as AT
import qualified Data.Text.Lazy as T import qualified Data.Text.Lazy as T
import QBar.BlockOutput import QBar.BlockOutput
...@@ -112,15 +112,15 @@ data CpuBlockState ...@@ -112,15 +112,15 @@ data CpuBlockState
makeLenses ''CpuBlockState makeLenses ''CpuBlockState
cpuUsageBlock :: Int -> PullBlock cpuUsageBlock :: Int -> Block
cpuUsageBlock decimalPlaces = evalStateT cpuUsageBlock' createState cpuUsageBlock decimalPlaces = pullBlock $ evalStateT cpuUsageBlock' createState
where where
cpuUsageBlock' :: StateT CpuBlockState Block PullMode cpuUsageBlock' :: StateT CpuBlockState PullBlock' ExitBlock
cpuUsageBlock' = do cpuUsageBlock' = forever $ do
updateState updateState
importance <- cpuUsageImportance importance <- cpuUsageImportance
updateBlock . mkBlockOutput . importantText importance =<< ("💻\xFE0E " <>) <$> cpuUsageText text <- ("💻\xFE0E " <>) <$> cpuUsageText
cpuUsageBlock' lift $ sendBlockUpdate $ mkBlockOutput $ importantText importance text
createState :: CpuBlockState createState :: CpuBlockState
createState = createState =
CpuBlockState CpuBlockState
......
...@@ -9,10 +9,10 @@ import Data.Time.Format ...@@ -9,10 +9,10 @@ import Data.Time.Format
import Data.Time.LocalTime import Data.Time.LocalTime
dateBlock :: PushBlock dateBlock :: Block
dateBlock = schedulePullBlock' (everyNSeconds 60) $ forever $ do dateBlock = pullBlock' (everyNSeconds 60) $ forever $ do
zonedTime <- liftIO getZonedTime zonedTime <- liftIO getZonedTime
let date = T.pack (formatTime defaultTimeLocale "%a %F" zonedTime) let date = T.pack (formatTime defaultTimeLocale "%a %F" zonedTime)
let time = T.pack (formatTime defaultTimeLocale "%R" zonedTime) let time = T.pack (formatTime defaultTimeLocale "%R" zonedTime)
let text = normalText ("📅\xFE0E " <> date <> " ") <> activeText time let text = normalText ("📅\xFE0E " <> date <> " ") <> activeText time
updateBlock $ mkBlockOutput text sendBlockUpdate $ mkBlockOutput text
module QBar.Blocks.Pipe where module QBar.Blocks.Pipe where
import QBar.BlockOutput
import QBar.ControlSocket import QBar.ControlSocket
import QBar.Core import QBar.Core
import QBar.TagParser import QBar.TagParser
...@@ -22,16 +21,16 @@ runPipeClient enableEvents mainOptions = do ...@@ -22,16 +21,16 @@ runPipeClient enableEvents mainOptions = do
void $ waitEitherCancel hostTask inputTask void $ waitEitherCancel hostTask inputTask
where where
-- |Special block that reads the processes stdin line-by-line and shows the latest line in the block. Must never be used in a 'server' process or when stdin/stdout is used in another way. -- |Special block that reads the processes stdin line-by-line and shows the latest line in the block. Must never be used in a 'server' process or when stdin/stdout is used in another way.
pipeBlock :: Producer String BarIO () -> PushBlock pipeBlock :: Producer String BarIO () -> Block
pipeBlock source = PushMode <$ source >-> pack pipeBlock source = ExitBlock <$ source >-> pack
where where
pack :: Pipe String BlockUpdate BarIO () pack :: Pipe String BlockUpdate BarIO ()
pack = forever $ do pack = forever $ do
value <- await value <- await
yield (attachHandler . parseTags' . T.pack $ value, DefaultUpdate) let output = parseTags' . T.pack $ value
attachHandler :: BlockOutput -> BlockState if enableEvents
attachHandler = if enableEvents then mkBlockState' pipeBlockName handler else mkBlockState then pushBlockUpdate' handler output
else pushBlockUpdate output
handler :: BlockEventHandler handler :: BlockEventHandler
handler event = liftIO $ BSC.hPutStrLn stderr $ encode event handler event = liftIO $ BSC.hPutStrLn stderr $ encode event
pipeBlockName :: Text
pipeBlockName = "pipe"
...@@ -17,8 +17,8 @@ import System.Process.Typed (Process, shell, setStdin, setStdout, ...@@ -17,8 +17,8 @@ import System.Process.Typed (Process, shell, setStdin, setStdout,
getStdout, closed, createPipe, readProcessStdout, startProcess, stopProcess) getStdout, closed, createPipe, readProcessStdout, startProcess, stopProcess)
scriptBlock :: FilePath -> PullBlock scriptBlock :: FilePath -> Block
scriptBlock path = forever $ updateBlock =<< (lift blockScriptAction) scriptBlock path = pullBlock $ forever $ sendBlockUpdate =<< (lift blockScriptAction)
where where
blockScriptAction :: BarIO BlockOutput blockScriptAction :: BarIO BlockOutput
blockScriptAction = do blockScriptAction = do
...@@ -35,26 +35,26 @@ scriptBlock path = forever $ updateBlock =<< (lift blockScriptAction) ...@@ -35,26 +35,26 @@ scriptBlock path = forever $ updateBlock =<< (lift blockScriptAction)
(text:_) -> parseTags' text (text:_) -> parseTags' text
[] -> emptyBlock [] -> emptyBlock
persistentScriptBlock :: FilePath -> PushBlock persistentScriptBlock :: FilePath -> Block
-- The outer catchP only catches errors that occur during process creation -- The outer catchP only catches errors that occur during process creation
persistentScriptBlock path = catchP startScriptProcess handleError persistentScriptBlock path = catchP startScriptProcess handleError
where where
handleError :: IOException -> PushBlock handleError :: IOException -> Block
handleError e = do handleError e = do
updateBlock . mkErrorOutput $ T.pack (show e) pushBlockUpdate . mkErrorOutput $ T.pack (show e)
exitBlock exitBlock
handleErrorWithProcess :: (Process i o e) -> IOException -> PushBlock handleErrorWithProcess :: (Process i o e) -> IOException -> Block
handleErrorWithProcess process e = do handleErrorWithProcess process e = do
stopProcess process stopProcess process
handleError e handleError e
startScriptProcess :: PushBlock startScriptProcess :: Block
startScriptProcess = do startScriptProcess = do
let processConfig = setStdin closed $ setStdout createPipe $ shell path let processConfig = setStdin closed $ setStdout createPipe $ shell path
process <- startProcess processConfig process <- startProcess processConfig
-- The inner catchP catches errors that happen after the process has been created -- The inner catchP catches errors that happen after the process has been created
-- This handler will also make sure the process is stopped -- This handler will also make sure the process is stopped
catchP (blockFromHandle $ getStdout process) (handleErrorWithProcess process) catchP (blockFromHandle $ getStdout process) (handleErrorWithProcess process)
blockFromHandle :: Handle -> PushBlock blockFromHandle :: Handle -> Block
blockFromHandle handle = forever $ do blockFromHandle handle = forever $ do
line <- liftIO $ TIO.hGetLine handle line <- liftIO $ TIO.hGetLine handle
updateBlock $ parseTags' line pushBlockUpdate $ parseTags' line
...@@ -107,7 +107,7 @@ instance IsStream BlockStream where ...@@ -107,7 +107,7 @@ instance IsStream BlockStream where
(cache, updateCacheC, sealCache) <- newCache' (cache, updateCacheC, sealCache) <- newCache'
(eventOutput, eventInput, eventSeal) <- liftIO $ spawn' unbounded (eventOutput, eventInput, eventSeal) <- liftIO $ spawn' unbounded
bar <- askBar bar <- askBar
addBlock cache addBlockCache cache
prefix <- liftIO $ (<> "_") <$> randomIdentifier prefix <- liftIO $ (<> "_") <$> randomIdentifier
let blockConsumer = updateBarP bar >-> attachHandlerP eventOutput prefix >-> updateCacheC let blockConsumer = updateBarP bar >-> attachHandlerP eventOutput prefix >-> updateCacheC
let eventProducer = fromInput eventInput let eventProducer = fromInput eventInput
......
...@@ -21,6 +21,7 @@ import Data.Int (Int64) ...@@ -21,6 +21,7 @@ import Data.Int (Int64)
import Data.Maybe (fromMaybe) import Data.Maybe (fromMaybe)
import qualified Data.Text.Lazy as T import qualified Data.Text.Lazy as T
import Pipes import Pipes
import Pipes.Core
import Pipes.Concurrent import Pipes.Concurrent
import Pipes.Safe (SafeT, runSafeT) import Pipes.Safe (SafeT, runSafeT)
import qualified Pipes.Prelude as PP import qualified Pipes.Prelude as PP
...@@ -38,10 +39,7 @@ data BlockEvent = Click { ...@@ -38,10 +39,7 @@ data BlockEvent = Click {
$(deriveJSON defaultOptions ''BlockEvent) $(deriveJSON defaultOptions ''BlockEvent)
data PushMode = PushMode data ExitBlock = ExitBlock
data PullMode = PullMode
data CachedMode = CachedMode
type BlockEventHandler = BlockEvent -> BarIO () type BlockEventHandler = BlockEvent -> BarIO ()
...@@ -49,36 +47,37 @@ type BlockState = Maybe (BlockOutput, Maybe BlockEventHandler) ...@@ -49,36 +47,37 @@ type BlockState = Maybe (BlockOutput, Maybe BlockEventHandler)
data BlockUpdateReason = DefaultUpdate | PullUpdate | UserUpdate data BlockUpdateReason = DefaultUpdate | PullUpdate | UserUpdate
type BlockUpdate = (BlockState, BlockUpdateReason) type BlockUpdate = (BlockState, BlockUpdateReason)
type Block = Producer BlockUpdate BarIO
-- |Block that 'yield's an update whenever the block should be changed -- |Block that 'yield's an update whenever the block should be changed
type PushBlock = Block PushMode type Block' = Producer BlockUpdate BarIO
-- |Block that generates an update on 'yield'. Should only be pulled when an update is required. type Block = Producer BlockUpdate BarIO ExitBlock
type PullBlock = Block PullMode
-- |Block that 'respond's with an update whenever it receives a 'PullSignal'.
type PullBlock' = Server PullSignal BlockUpdate BarIO
type PullBlock = Server PullSignal BlockUpdate BarIO ExitBlock
data PullSignal = PullSignal
-- |Cache that holds multiple BlockStates. When iterated it always immediately 'yield's the latest update, so it should only be pulled when a bar update has been requested. -- |Cache that holds multiple BlockStates. When iterated it always immediately 'yield's the latest update, so it should only be pulled when a bar update has been requested.
type BlockCache = Producer [BlockState] BarIO CachedMode type BlockCache = Producer [BlockState] BarIO ExitBlock
class IsCachable a where class IsCachable a where
toCachedBlock :: a -> BlockCache toCachedBlock :: a -> BlockCache
instance IsCachable PushBlock where instance IsCachable Block where
toCachedBlock = cachePushBlock toCachedBlock = cacheBlock
instance IsCachable PullBlock where instance IsCachable PullBlock where
toCachedBlock = cachePushBlock . schedulePullBlock toCachedBlock = cacheBlock . pullBlock
instance IsCachable BlockCache where instance IsCachable BlockCache where
toCachedBlock = id toCachedBlock = id
class IsBlockMode a where class IsBlock a where
exitBlock :: Block a exitBlock :: a
instance IsBlockMode PushMode where instance IsBlock Block where
exitBlock = return PushMode exitBlock = return ExitBlock
instance IsBlockMode PullMode where instance IsBlock PullBlock where
exitBlock = return PullMode exitBlock = return ExitBlock
exitCache :: BlockCache exitCache :: BlockCache
exitCache = return CachedMode exitCache = return ExitBlock
type BarIO = SafeT (ReaderT Bar IO) type BarIO = SafeT (ReaderT Bar IO)
...@@ -115,26 +114,27 @@ askBar :: MonadBarIO m => m Bar ...@@ -115,26 +114,27 @@ askBar :: MonadBarIO m => m Bar
askBar = liftBarIO $ lift ask askBar = liftBarIO $ lift ask
class (MonadBarIO m) => MonadBlock m where sendBlockUpdate :: BlockOutput -> Proxy a' a PullSignal BlockUpdate BarIO ()
liftBlock :: Block a -> m a sendBlockUpdate blockOutput = void . respond $ (Just (blockOutput, Nothing), PullUpdate)
instance MonadBlock Block where
liftBlock = id sendBlockUpdate' :: BlockEventHandler -> BlockOutput -> Proxy a' a PullSignal BlockUpdate BarIO ()
instance (MonadBlock m) => MonadBlock (StateT a m) where sendBlockUpdate' blockEventHandler blockOutput = void . respond $ (Just (blockOutput, Just blockEventHandler), PullUpdate)
liftBlock = lift . liftBlock
instance (MonadBlock m) => MonadBlock (ReaderT a m) where -- |Update a block by removing the current output
liftBlock = lift . liftBlock sendEmptyBlockUpdate :: Proxy a' a PullSignal BlockUpdate BarIO ()
instance (MonadBlock m, Monoid a) => MonadBlock (WriterT a m) where sendEmptyBlockUpdate = void . respond $ (Nothing, PullUpdate)
liftBlock = lift . liftBlock
updateBlock :: MonadBlock m => BlockOutput -> m () pushBlockUpdate :: BlockOutput -> Proxy a' a () BlockUpdate BarIO ()
updateBlock blockOutput = liftBlock . yield $ (Just (blockOutput, Nothing), DefaultUpdate) pushBlockUpdate blockOutput = void . respond $ (Just (blockOutput, Nothing), DefaultUpdate)
updateBlock' :: MonadBlock m => BlockEventHandler -> BlockOutput -> m () pushBlockUpdate' :: BlockEventHandler -> BlockOutput -> Proxy a' a () BlockUpdate BarIO ()
updateBlock' blockEventHandler blockOutput = liftBlock . yield $ (Just (blockOutput, Just blockEventHandler), DefaultUpdate) pushBlockUpdate' blockEventHandler blockOutput = void . respond $ (Just (blockOutput, Just blockEventHandler), DefaultUpdate)
-- |Update a block by removing the current output -- |Update a block by removing the current output
updateBlockEmpty :: MonadBlock m => m () pushEmptyBlockUpdate :: Proxy a' a () BlockUpdate BarIO ()
updateBlockEmpty = liftBlock . yield $ (Nothing, DefaultUpdate) pushEmptyBlockUpdate = void . respond $ (Nothing, DefaultUpdate)
mkBlockState :: BlockOutput -> BlockState mkBlockState :: BlockOutput -> BlockState
...@@ -162,27 +162,30 @@ runBarIO bar action = liftIO $ runReaderT (runSafeT action) bar ...@@ -162,27 +162,30 @@ runBarIO bar action = liftIO $ runReaderT (runSafeT action) bar
defaultInterval :: Interval defaultInterval :: Interval
defaultInterval = everyNSeconds 10 defaultInterval = everyNSeconds 10
-- |Converts a 'PullBlock' to a 'PushBlock' by running it whenever the 'defaultInterval' is triggered. -- |Converts a 'PullBlock' to a 'Block' by running it whenever the 'defaultInterval' is triggered.
schedulePullBlock :: PullBlock -> PushBlock pullBlock :: PullBlock -> Block
schedulePullBlock = schedulePullBlock' defaultInterval pullBlock = pullBlock' defaultInterval
-- |Converts a 'PullBlock' to a 'PushBlock' by running it whenever the 'defaultInterval' is triggered. -- |Converts a 'PullBlock' to a 'Block' by running it whenever the 'defaultInterval' is triggered.
schedulePullBlock' :: Interval -> PullBlock -> PushBlock pullBlock' :: Interval -> PullBlock -> Block
schedulePullBlock' interval pullBlock = PushMode <$ pullBlock >-> sleepToNextInterval pullBlock' interval pb = pb >>~ addPullSignal >-> sleepToNextInterval
where where
sleepToNextInterval :: Pipe BlockUpdate BlockUpdate BarIO PullMode addPullSignal :: BlockUpdate -> Proxy PullSignal BlockUpdate () BlockUpdate BarIO ExitBlock
addPullSignal = respond >=> const (request PullSignal) >=> addPullSignal
sleepToNextInterval :: Pipe BlockUpdate BlockUpdate BarIO ExitBlock
sleepToNextInterval = do sleepToNextInterval = do
event <- liftIO Event.new event <- liftIO Event.new
forever $ do forever $ do
(state, _) <- await (state, reason) <- await
if hasEventHandler state if hasEventHandler state
then do then do
-- If state already has an event handler, we do not attach another one -- If state already has an event handler, we do not attach another one
yield (state, PullUpdate) yield (state, reason)
sleepUntilInterval interval sleepUntilInterval interval
else do else do
-- Attach a click handler that will trigger a block update -- Attach a click handler that will trigger a block update
yield (updateEventHandler (triggerOnClick event) state, PullUpdate) yield (updateEventHandler (triggerOnClick event) state, reason)
scheduler <- askSleepScheduler scheduler <- askSleepScheduler
result <- liftIO $ do result <- liftIO $ do
...@@ -248,9 +251,10 @@ newCache'' = do ...@@ -248,9 +251,10 @@ newCache'' = do
Nothing -> exitCache Nothing -> exitCache
Just value -> yield value >> cache Just value -> yield value >> cache
-- |Creates a cache from a push block. -- |Creates a cache from a block.
cachePushBlock :: PushBlock -> BlockCache cacheBlock :: Block -> BlockCache
cachePushBlock pushBlock = newCache $ () <$ (pushBlock >-> updateBarP >-> addBlockName >-> PP.map (\a -> [a])) -- 'Block's 'yield' an update whenever they want to update the cache.
cacheBlock pushBlock = newCache $ () <$ (pushBlock >-> updateBarP >-> addBlockName >-> PP.map (\a -> [a]))
where where
updateBarP :: Pipe BlockUpdate BlockState BarIO r updateBarP :: Pipe BlockUpdate BlockState BarIO r
updateBarP = forever $ do updateBarP = forever $ do
...@@ -292,11 +296,16 @@ autoPadding = autoPadding' 0 0 ...@@ -292,11 +296,16 @@ autoPadding = autoPadding' 0 0
padShortText :: Int64 -> BlockOutput -> BlockOutput padShortText :: Int64 -> BlockOutput -> BlockOutput
padShortText len = over (shortText._Just) $ \s -> padString (len - printedLength s) <> s padShortText len = over (shortText._Just) $ \s -> padString (len - printedLength s) <> s
addBlock :: IsCachable a => a -> BarIO () addBlock :: Block -> BarIO ()
addBlock block = do addBlock block = do
newBlockChan' <- newBlockChan <$> askBar newBlockChan' <- newBlockChan <$> askBar
liftIO $ atomically $ writeTChan newBlockChan' $ toCachedBlock block liftIO $ atomically $ writeTChan newBlockChan' $ toCachedBlock block
addBlockCache :: BlockCache -> BarIO ()
addBlockCache cache = do
newBlockChan' <- newBlockChan <$> askBar
liftIO $ atomically $ writeTChan newBlockChan' cache
updateBar :: MonadBarIO m => BlockUpdateReason -> m () updateBar :: MonadBarIO m => BlockUpdateReason -> m ()
updateBar reason = liftIO =<< requestBarUpdate <$> askBar <*> return reason updateBar reason = liftIO =<< requestBarUpdate <$> askBar <*> return reason
......
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment