263 lines
9.0 KiB
Haskell
Raw Normal View History

{-# LANGUAGE PackageImports #-}
2017-08-23 12:43:25 -07:00
module Main where
import qualified Control.Concurrent.MVar as MV
import Control.Exception.Base
import Control.Monad
import Control.Monad.Reader
import Control.Monad.Trans
2018-04-27 17:36:32 -07:00
import qualified Data.ByteString.Char8 as BS
2018-03-23 21:24:38 -07:00
import Data.GI.Base
import Data.GI.Base.ManagedPtr
import Data.List
import Data.List.Split
import qualified Data.Map as M
import Data.Maybe
import Debug.Trace
2018-03-23 21:24:38 -07:00
import Foreign.ForeignPtr
import Foreign.Ptr
import qualified GI.Gtk as GI
2018-04-27 17:36:32 -07:00
import qualified GitHub.Auth as Auth
import qualified "gtk3" Graphics.UI.Gtk as Gtk
import qualified "gtk3" Graphics.UI.Gtk.Abstract.Widget as W
import qualified "gtk3" Graphics.UI.Gtk.Layout.Table as T
2018-03-23 21:24:38 -07:00
import Graphics.UI.Gtk.Types
import StatusNotifier.Tray
import System.Directory
import System.Environment
import System.FilePath.Posix
2018-03-23 21:24:38 -07:00
import System.Glib.GObject
import System.IO
import System.Log.Handler.Simple
import System.Log.Logger
import System.Process
import System.Taffybar
2018-04-27 17:36:32 -07:00
import System.Taffybar.Auth
import System.Taffybar.Compat.GtkLibs
2018-05-03 10:39:27 -07:00
import System.Taffybar.DBus
import System.Taffybar.DBus.Toggle
import System.Taffybar.Hooks
import System.Taffybar.IconImages
import System.Taffybar.Information.CPU
import System.Taffybar.Information.EWMHDesktopInfo
import System.Taffybar.Information.Memory
import System.Taffybar.Information.X11DesktopInfo
import System.Taffybar.SimpleConfig
import System.Taffybar.Widget
import System.Taffybar.Widget.Generic.PollingGraph
2018-05-10 16:05:50 -07:00
import System.Taffybar.Widget.Generic.PollingLabel
import System.Taffybar.Widget.Workspaces
import Text.Printf
2018-03-23 21:24:38 -07:00
import Text.Read hiding (lift)
import Unsafe.Coerce
buildPadBoxNoShrink orig = liftIO $ do
widget <- buildPadBox orig
-- toGIWidget widget >>= widgetPreventShrink
return widget
setMinWidth width widget = liftIO $ do
Gtk.widgetSetSizeRequest widget width (-1)
return widget
makeContents waction klass = do
widget <- waction
liftIO $ do
widgetSetClass widget "Contents"
widgetSetClass widget klass
b <- buildPadBox widget
Gtk.widgetShowAll b
return $ Gtk.toWidget b
mkRGBA (r, g, b, a) = (r/256, g/256, b/256, a/256)
blue = mkRGBA (42, 99, 140, 256)
yellow1 = mkRGBA (242, 163, 54, 256)
yellow2 = mkRGBA (254, 204, 83, 256)
yellow3 = mkRGBA (227, 134, 18, 256)
red = mkRGBA (210, 77, 37, 256)
2017-10-26 00:32:31 -07:00
myGraphConfig =
2017-05-24 21:56:34 -07:00
defaultGraphConfig
{ graphPadding = 0
2017-10-26 00:32:31 -07:00
, graphBorderWidth = 0
, graphWidth = 75
, graphBackgroundColor = (1.0, 1.0, 1.0, 0.0)
}
netCfg =
myGraphConfig
{ graphDataColors = [yellow1, yellow2]
, graphLabel = Just "net"
2017-10-26 00:32:31 -07:00
}
memCfg =
myGraphConfig
2018-04-27 17:36:32 -07:00
{ graphDataColors = [(0.129, 0.588, 0.953, 1)]
, graphLabel = Just "mem"
}
2017-05-24 21:56:34 -07:00
memCallback :: IO [Double]
memCallback = do
2016-09-16 14:11:52 -07:00
mi <- parseMeminfo
return [memoryUsedRatio mi]
getFullWorkspaceNames :: X11Property [(WorkspaceIdx, String)]
getFullWorkspaceNames = go <$> readAsListOfString Nothing "_NET_DESKTOP_FULL_NAMES"
where go = zip [WSIdx i | i <- [0..]]
2018-03-23 21:24:38 -07:00
workspaceNamesLabelSetter workspace =
fromMaybe "" . lookup (workspaceIdx workspace) <$>
liftX11Def [] getFullWorkspaceNames
2016-09-16 14:11:52 -07:00
cpuCallback = do
(_, systemLoad, totalLoad) <- cpuLoad
2016-09-16 14:11:52 -07:00
return [totalLoad, systemLoad]
containerAddReturn c w =
Gtk.containerAdd c w >> Gtk.widgetShowAll c >> return (Gtk.toWidget c)
2017-03-04 13:13:03 -08:00
underlineWidget cfg buildWidget name = do
w <- buildWidget
t <- T.tableNew 2 1 False
u <- Gtk.eventBoxNew
2017-03-04 13:13:03 -08:00
W.widgetSetSizeRequest u (-1) $ underlineHeight cfg
T.tableAttach t w 0 1 0 1 [T.Expand] [T.Expand] 0 0
T.tableAttach t u 0 1 1 2 [T.Fill] [T.Shrink] 0 0
2017-03-05 18:30:55 -08:00
Gtk.widgetSetName u (printf "%s-underline" name :: String)
Gtk.widgetShowAll t
return $ Gtk.toWidget t
myFormatEntry wsNames ((ws, wtitle, wclass), _) =
printf "%s: %s - %s" wsName (head $ splitOn "\NUL" wclass) wtitle
where
wsName = M.findWithDefault ("WS#" ++ show wsN) ws wsNames
WSIdx wsN = ws
getInterfaces = do
(_, output, _) <- readCreateProcessWithExitCode (shell "list_interfaces.sh") ""
return $ splitOn "\n" output
2018-03-23 21:24:38 -07:00
addClass klass action = do
widget <- action
lift $ widgetSetClass widget klass
2018-03-23 21:24:38 -07:00
return widget
(buildWidgetCons, _) = mkWidget
logDebug = do
handler <- streamHandler stdout DEBUG
2018-04-24 02:13:18 -07:00
logger <- getLogger "System.Taffybar"
saveGlobalLogger $ setLevel DEBUG logger
2018-04-24 02:13:18 -07:00
infoLogger <- getLogger "System.Information"
saveGlobalLogger $ setLevel DEBUG infoLogger
2018-04-27 17:36:32 -07:00
github = do
Right (token, _) <- passGet "github-token"
2018-04-28 02:01:48 -07:00
githubNotificationsNew $ defaultGithubConfig $ Auth.OAuth $ BS.pack token
2018-04-27 17:36:32 -07:00
2016-09-16 14:11:52 -07:00
main = do
interfaceNames <- getInterfaces
2017-03-05 18:30:55 -08:00
homeDirectory <- getHomeDirectory
2017-05-30 18:23:13 -07:00
let resourcesDirectory = homeDirectory </> ".lib" </> "resources"
inResourcesDirectory file = resourcesDirectory </> file
2017-10-13 22:09:08 -07:00
highContrastDirectory =
"/" </> "usr" </> "share" </> "icons" </> "HighContrast" </> "256x256"
inHighContrastDirectory file = highContrastDirectory </> file
getWorkspacePixBuf size Workspace {workspaceIdx = WSIdx wsId} =
2017-09-12 02:55:32 -07:00
pixBufFromFile size . inHighContrastDirectory <$>
2017-10-13 22:09:08 -07:00
case wsId + 1 of
2017-10-24 21:03:33 -07:00
-- 1 -> Just $ "apps" </> "utilities-terminal.png"
-- 2 -> Just $ "emblems" </> "emblem-documents.png"
-- 3 -> Just $ "actions" </> "bookmark-add.png"
-- 4 -> Just $ "devices" </> "video-display.png"
2017-10-13 22:09:08 -07:00
_ -> Nothing
2018-04-27 17:36:32 -07:00
-- buildConstantIconController :: ControllerConstructor
-- buildConstantIconController ws = do
-- cfg <- asks hudConfig
-- lift $ do
-- img <- Gtk.imageNew
-- pb <- sequence $ getWorkspacePixBuf (windowIconSize cfg) ws
-- setImage (windowIconSize cfg) img pb
-- return $ WWC ConstantIconController {cicImage = img}
makeIcon = return . IIFilePath . inResourcesDirectory
myGetIconInfo w@WindowData {windowTitle = title, windowClass = klass}
2017-05-30 18:23:13 -07:00
| "URxvt" `isInfixOf` klass = makeIcon "urxvt.png"
| "Termite" `isInfixOf` klass = makeIcon "urxvt.png"
2017-05-30 18:23:13 -07:00
| "Kodi" `isInfixOf` klass = makeIcon "kodi.png"
| "@gmail.com" `isInfixOf` title &&
"chrome" `isInfixOf` klass && "Gmail" `isInfixOf` title =
makeIcon "gmail.png"
| otherwise = do
res <- defaultGetIconInfo w
return $
case res of
IINone -> IIFilePath $ inResourcesDirectory "exe-icon.png"
_ -> res
cpuCfg =
2017-10-26 00:32:31 -07:00
myGraphConfig
{ graphDataColors = [(0, 1, 0, 1), (1, 0, 1, 0.5)]
, graphBackgroundColor = (1.0, 1.0, 1.0, 0.0)
, graphLabel = Just "cpu"
}
2017-03-05 18:30:55 -08:00
clock = textClockNew Nothing "%a %b %_d %r" 1
2016-09-19 12:08:25 -07:00
mpris = mpris2New
2016-09-16 14:11:52 -07:00
cpu = pollingGraphNew cpuCfg 0.5 cpuCallback
mem = pollingGraphNew memCfg 1 memCallback
battery = batteryBarNewWithFormat defaultBatteryConfig
"$percentage$% ($time$) - $status$" 1.0
2018-04-24 14:19:52 -07:00
myWorkspacesConfig =
defaultWorkspacesConfig
{ underlineHeight = 3
2017-07-27 19:59:23 -07:00
, underlinePadding = 2
, minWSWidgetSize = Nothing
, minIcons = 1
, getIconInfo = myGetIconInfo
, windowIconSize = 30
, widgetGap = 0
, showWorkspaceFn = hideEmpty
, updateRateLimitMicroseconds = 100000
, labelSetter = workspaceNamesLabelSetter
}
baseConfig = defaultSimpleTaffyConfig
{ startWidgets =
[ workspaces
, los >>= buildPadBox
, wnd >>= buildPadBox
2017-03-12 21:25:59 -07:00
]
, endWidgets = map (>>= buildPadBoxNoShrink)
2018-05-10 16:05:50 -07:00
[ battery
, clock >>= setMinWidth 200
, sniTrayNew
, github
, cpu
, mem
, netMonitorGraphNew netCfg Nothing
2018-05-10 16:05:50 -07:00
-- , networkMonitorNew defaultNetFormat Nothing >>= setMinWidth 200
, fsMonitorNew 60 ["/dev/sdd2"]
, mpris
]
2017-03-12 21:25:59 -07:00
, barPosition = Top
2018-04-27 17:36:32 -07:00
, barPadding = 0
2018-04-24 14:19:52 -07:00
, barHeight = (underlineHeight myWorkspacesConfig + windowIconSize myWorkspacesConfig + 15)
, widgetSpacing = 0
2017-03-12 21:25:59 -07:00
}
workspaces = workspacesNew myWorkspacesConfig
los = layoutNew defaultLayoutConfig
wnd = windowsNew defaultWindowsConfig
simpleTaffyConfig =
baseConfig
-- { startWidgets = [workspaces]
-- , centerWidgets = [makeContents (addClass "Window" wnd) "Cpu"]
-- , endWidgets = [makeContents los "Cpu"]
-- }
2018-05-03 10:39:27 -07:00
dyreTaffybar $ withLogServer $ withToggleServer $ toTaffyConfig simpleTaffyConfig
2016-09-16 14:11:52 -07:00
-- Local Variables:
-- flycheck-ghc-args: ("-Wno-missing-signatures")
-- End: