xmonad-config/lib/XMonad/Internal/DBus/Control.hs

39 lines
1.1 KiB
Haskell
Raw Normal View History

2020-03-20 00:51:36 -04:00
{-# LANGUAGE OverloadedStrings #-}
2020-04-01 22:06:00 -04:00
--------------------------------------------------------------------------------
-- | High-level interface for managing XMonad's DBus
2020-04-01 20:17:47 -04:00
module XMonad.Internal.DBus.Control
( Client
, startXMonadService
2020-04-01 20:17:47 -04:00
, stopXMonadService
) where
2020-03-20 00:51:36 -04:00
import DBus.Client
2020-03-20 00:51:36 -04:00
2020-04-01 20:17:47 -04:00
import XMonad.Internal.DBus.IntelBacklight
import XMonad.Internal.DBus.Screensaver
-- import XMonad.Internal.DBus.Workspaces
2020-04-01 20:17:47 -04:00
2020-03-20 00:51:36 -04:00
startXMonadService :: IO Client
startXMonadService = do
client <- connectSession
requestResult <- requestName client "org.xmonad" []
-- TODO if the client is not released on shutdown the owner will be
-- different
if requestResult /= NamePrimaryOwner then
putStrLn "Another service owns \"org.xmonad\""
else do
putStrLn "Started xmonad dbus client"
exportIntelBacklight client
exportScreensaver client
-- exportWorkspaces client
2020-03-20 00:51:36 -04:00
return client
stopXMonadService :: Client -> IO ()
stopXMonadService client = do
2020-03-20 15:43:32 -04:00
_ <- releaseName client "org.xmonad"
2020-03-20 00:51:36 -04:00
disconnect client
return ()