summaryrefslogtreecommitdiffhomepage
diff options
context:
space:
mode:
authorAndrea Rossato <andrea.rossato@ing.unitn.it>2007-06-27 23:45:31 +0200
committerAndrea Rossato <andrea.rossato@ing.unitn.it>2007-06-27 23:45:31 +0200
commitc40b0d2fa0e7c41254be9e24e66928c65bfd83e3 (patch)
tree03177d5ad97569167acce431cc323d75792cbb67
parent9e5978006348cc78fd5aafbc010cb828b11c0503 (diff)
downloadxmobar-c40b0d2fa0e7c41254be9e24e66928c65bfd83e3.tar.gz
xmobar-c40b0d2fa0e7c41254be9e24e66928c65bfd83e3.tar.bz2
Cpu.hs: removed Parsec and switched to ByteString
darcs-hash:20070627214531-d6583-cd9165ec4ba00eba15e2c77556a3782f47ffea15.gz
-rw-r--r--Monitors/Cpu.hs45
1 files changed, 19 insertions, 26 deletions
diff --git a/Monitors/Cpu.hs b/Monitors/Cpu.hs
index b67f772..f24b9ee 100644
--- a/Monitors/Cpu.hs
+++ b/Monitors/Cpu.hs
@@ -16,8 +16,9 @@ module Main where
import Numeric
import Control.Concurrent
-import Text.ParserCombinators.Parsec
+import Control.Concurrent.MVar
+import qualified Data.ByteString.Lazy.Char8 as B
data Config =
Config { intervall :: Int
@@ -41,40 +42,32 @@ config = defaultConfig
-- Utilities
-interSec :: IO ()
-interSec = threadDelay (intervall config)
-
-takeDigits :: Int -> Float -> Float
-takeDigits d n =
- read $ showFFloat (Just d) n ""
-
floatToPercent :: Float -> String
floatToPercent n =
showFFloat (Just 2) (n*100) "%"
+fileCPU :: IO B.ByteString
+fileCPU = B.readFile "/proc/stat"
-run :: Parser [a] -> IO String -> IO [a]
-run p input
- = do a <- input
- case (parse p "" a) of
- Left _ -> return []
- Right x -> return x
-
-fileCPU :: IO String
-fileCPU = readFile "/proc/stat"
-
-
-getNumbers :: Parser Float
-getNumbers = skipMany space >> many1 digit >>= \n -> return $ read n
+getData :: MVar [Float] -> Int -> IO ()
+getData var d =
+ do threadDelay d
+ s <- fileCPU
+ modifyMVar_ var (\_ -> return $! cpuParser s)
-parserCPU :: Parser [Float]
-parserCPU = string "cpu" >> count 4 getNumbers
+cpuParser :: B.ByteString -> [Float]
+cpuParser =
+ map read . map B.unpack . tail . B.words . flip (!!) 0 . B.lines
parseCPU :: IO [Float]
parseCPU =
- do a <- run parserCPU fileCPU
- interSec
- b <- run parserCPU fileCPU
+ do v1 <- newMVar []
+ forkIO $! getData v1 0
+ v2 <- newMVar []
+ forkIO $! getData v2 500000
+ threadDelay 750000
+ a <- readMVar v1
+ b <- readMVar v2
let dif = zipWith (-) b a
tot = foldr (+) 0 dif
percent = map (/ tot) dif