This repository has been archived on 2025-03-02. You can view files and clone it, but cannot push or open issues or pull requests.
phi/lib/Phi/Widgets/Taskbar.hs

407 lines
17 KiB
Haskell
Raw Normal View History

2011-07-16 02:43:19 +02:00
{-# LANGUAGE TypeFamilies, DeriveDataTypeable, TypeSynonymInstances #-}
2011-07-14 22:50:03 +02:00
2011-07-16 02:43:19 +02:00
module Phi.Widgets.Taskbar ( IconStyle
, idIconStyle
, desaturateIconStyle
, TaskStyle(..)
, TaskbarConfig(..)
2011-07-14 22:50:03 +02:00
, defaultTaskbarConfig
, taskbar
) where
import Control.Concurrent
import Control.Monad
2011-07-15 09:17:57 +02:00
import Control.Monad.State
import Control.Monad.Trans
2011-07-14 22:50:03 +02:00
2011-07-15 15:31:46 +02:00
import Data.Array.MArray
import Data.Bits
2011-07-15 09:17:57 +02:00
import Data.Char
2011-07-15 15:31:46 +02:00
import Data.Function
import Data.List
2011-07-15 09:17:57 +02:00
import Data.Maybe
2011-07-14 22:50:03 +02:00
import Data.Typeable
2011-07-15 15:31:46 +02:00
import Data.Word
2011-07-15 09:17:57 +02:00
import qualified Data.Map as M
2011-07-14 22:50:03 +02:00
2011-07-15 09:17:57 +02:00
import Foreign.C.Types
2011-07-14 22:50:03 +02:00
2011-07-15 09:17:57 +02:00
import Graphics.Rendering.Cairo
2011-07-14 22:50:03 +02:00
import Graphics.Rendering.Pango.Cairo
import Graphics.Rendering.Pango.Enums (PangoRectangle(..))
import Graphics.Rendering.Pango.Layout
2011-07-15 15:31:46 +02:00
import Graphics.Rendering.Pango.Font
2011-07-14 22:50:03 +02:00
2011-07-15 09:17:57 +02:00
import Graphics.X11.Xlib (Window)
import qualified Graphics.X11.Xlib as Xlib
import qualified Graphics.X11.Xlib.Extras as XExtras
import Codec.Binary.UTF8.String
2011-07-14 22:50:03 +02:00
import Phi.Phi
import Phi.Types
2011-07-15 09:17:57 +02:00
import Phi.Border
2011-07-14 22:50:03 +02:00
import Phi.Widget
2011-07-15 09:17:57 +02:00
import Phi.X11.Atoms
2011-07-14 22:50:03 +02:00
2011-07-16 02:43:19 +02:00
type IconStyle = Surface -> Render ()
instance Show IconStyle where
show _ = "IconStyle"
idIconStyle :: IconStyle
idIconStyle = flip withPatternForSurface setSource
desaturateIconStyle :: Double -> IconStyle
desaturateIconStyle v icon = do
w <- imageSurfaceGetWidth icon
h <- imageSurfaceGetHeight icon
renderWithSimilarSurface ContentColorAlpha w h $ \surface1 -> do
renderWithSimilarSurface ContentColor w h $ \surface2 -> do
renderWith surface1 $ do
renderWith surface2 $ do
withPatternForSurface icon setSource
paint
setOperator OperatorHslSaturation
setSourceRGBA 0 0 0 (1-v)
paint
withPatternForSurface surface2 setSource
paint
setOperator OperatorDestIn
withPatternForSurface icon setSource
paint
withPatternForSurface surface1 setSource
data TaskStyle = TaskStyle { taskFont :: !String
, taskColor :: !Color
, taskBorder :: !BorderConfig
, taskIconStyle :: !IconStyle
} deriving Show
data TaskbarConfig = TaskbarConfig { taskMaxSize :: !Int
2011-07-15 15:31:46 +02:00
, showDesktops :: !Bool
2011-07-16 02:43:19 +02:00
, normalTaskStyle :: !TaskStyle
, activeTaskStyle :: !TaskStyle
2011-07-15 09:17:57 +02:00
} deriving Show
2011-07-14 22:50:03 +02:00
2011-07-16 02:43:19 +02:00
defaultStyle :: TaskStyle
defaultStyle = TaskStyle { taskFont = "Sans 8"
, taskColor = (0, 0, 0, 1)
, taskBorder = defaultBorderConfig
, taskIconStyle = idIconStyle
}
2011-07-14 22:50:03 +02:00
defaultTaskbarConfig :: TaskbarConfig
2011-07-16 02:43:19 +02:00
defaultTaskbarConfig = TaskbarConfig { taskMaxSize = 150
2011-07-15 09:17:57 +02:00
, showDesktops = False
2011-07-16 02:43:19 +02:00
, normalTaskStyle = defaultStyle
, activeTaskStyle = defaultStyle {taskBorder = defaultBorderConfig { borderColor = (1, 1, 1, 1) }}
2011-07-15 09:17:57 +02:00
}
2011-07-14 22:50:03 +02:00
data Taskbar = Taskbar TaskbarConfig deriving Show
2011-07-15 15:31:46 +02:00
instance Show Surface where
show _ = "Surface <?>"
2011-07-15 09:17:57 +02:00
data TaskbarState = TaskbarState { taskbarActiveWindow :: !Window
, taskbarDesktopCount :: !Int
, taskbarWindows :: ![Window]
, taskbarWindowStates :: !(M.Map Window WindowState)
2011-07-16 01:28:47 +02:00
, taskbarWindowIcons :: !(M.Map Window [(Int, Surface)])
2011-07-15 09:17:57 +02:00
} deriving Show
data WindowState = WindowState { windowTitle :: !String
, windowDesktop :: !Int
, windowVisible :: !Bool
} deriving (Show, Eq)
2011-07-16 01:28:47 +02:00
data TaskbarMessage = WindowListUpdate [Xlib.Window] (M.Map Window WindowState) (M.Map Window [(Int, Surface)])
2011-07-15 09:17:57 +02:00
| DesktopCountUpdate Int
| ActiveWindowUpdate Window
deriving (Show, Typeable)
2011-07-14 22:50:03 +02:00
instance WidgetClass Taskbar where
type WidgetData Taskbar = TaskbarState
initWidget (Taskbar _) phi dispvar = do
2011-07-15 09:17:57 +02:00
forkIO $ taskbarRunner phi dispvar
2011-07-15 15:31:46 +02:00
return $ TaskbarState 0 0 [] M.empty M.empty
2011-07-14 22:50:03 +02:00
minSize _ = 0
weight _ = 1
2011-07-16 02:43:19 +02:00
render (Taskbar config) TaskbarState { taskbarActiveWindow = activeWindow
, taskbarDesktopCount = desktopCount
, taskbarWindows = windows
, taskbarWindowStates = windowStates
, taskbarWindowIcons = windowIcons
} w h = do
2011-07-15 09:17:57 +02:00
let desktopWindows = map (\desktop -> (desktop, filter (fromMaybe False . fmap (windowOnDesktop desktop) . flip M.lookup windowStates) windows)) $ take desktopCount [0..]
windowCount = sum $ map (length . snd) $ desktopWindows
when (windowCount /= 0) $ do
let windowWidth = min (taskMaxSize config) (w `div` windowCount)
forM_ (zip [0..] $ join $ map snd desktopWindows) $ \(i, window) -> do
2011-07-16 02:43:19 +02:00
let style = (if window == activeWindow then activeTaskStyle else normalTaskStyle) config
(r, g, b, a) = taskColor style
leftBorder = (borderLeft $ margin $ taskBorder style) + (borderWidth $ taskBorder style) + (borderLeft $ padding $ taskBorder style)
rightBorder = (borderRight $ margin $ taskBorder style) + (borderWidth $ taskBorder style) + (borderRight $ padding $ taskBorder style)
h' = h - (borderV $ margin $ taskBorder style)
2011-07-15 15:31:46 +02:00
mstate = M.lookup window windowStates
micons = M.lookup window windowIcons
case (mstate, micons) of
(Just state, Just icons) -> do
save
2011-07-16 02:43:19 +02:00
drawBorder (taskBorder style) (i*windowWidth) 0 windowWidth h
2011-07-15 15:31:46 +02:00
clip
2011-07-16 02:43:19 +02:00
setSourceRGBA r g b a
renderText style (fromIntegral (i*windowWidth + leftBorder + h' + 3)) 0 (windowWidth - leftBorder - h' - 3 - rightBorder) h $ windowTitle state
2011-07-15 15:31:46 +02:00
restore
2011-07-16 01:28:47 +02:00
case bestIcon h' icons of
2011-07-16 02:43:19 +02:00
Just icon -> do
2011-07-15 15:31:46 +02:00
save
2011-07-16 02:43:19 +02:00
translate (fromIntegral $ i*windowWidth + leftBorder) (fromIntegral $ borderTop $ margin $ taskBorder style)
2011-07-15 15:31:46 +02:00
imageW <- imageSurfaceGetWidth icon
imageH <- imageSurfaceGetHeight icon
2011-07-16 01:28:47 +02:00
2011-07-15 15:31:46 +02:00
let scalef = (fromIntegral h')/(fromIntegral $ max imageW imageH)
scale scalef scalef
2011-07-16 01:28:47 +02:00
when (imageH < imageW) $
translate 0 $ (fromIntegral (imageW-imageH))/2
2011-07-16 02:43:19 +02:00
taskIconStyle style icon
2011-07-15 15:31:46 +02:00
paint
restore
Nothing -> return ()
_ -> return ()
2011-07-15 09:17:57 +02:00
handleMessage _ priv m = case (fromMessage m) of
2011-07-15 15:31:46 +02:00
Just (WindowListUpdate windows windowStates icons) -> priv {taskbarWindows = windows, taskbarWindowStates = windowStates, taskbarWindowIcons = icons}
2011-07-15 09:17:57 +02:00
Just (DesktopCountUpdate count) -> priv {taskbarDesktopCount = count}
Just (ActiveWindowUpdate window) -> priv {taskbarActiveWindow = window}
_ -> priv
2011-07-16 02:43:19 +02:00
renderText :: TaskStyle -> Int -> Int -> Int -> Int -> String -> Render ()
renderText style x y w h text = do
2011-07-15 15:31:46 +02:00
layout <- createLayout ""
(_, PangoRectangle _ _ textWidth textHeight) <- liftIO $ do
2011-07-16 02:43:19 +02:00
layoutSetMarkup layout $ "<span font='" ++ (taskFont style) ++ "'>" ++ (escapeMarkup text) ++ "</span>"
2011-07-15 15:31:46 +02:00
layoutSetWidth layout $ Just $ fromIntegral w
layoutSetEllipsize layout EllipsizeEnd
layoutGetExtents layout
moveTo ((fromIntegral x) + ((fromIntegral w) - textWidth)/2) ((fromIntegral y) + ((fromIntegral h) - textHeight)/2)
showLayout layout
2011-07-16 01:28:47 +02:00
bestIcon :: Int -> [(Int, Surface)] -> Maybe Surface
bestIcon h icons = findBest $ sortBy compareIcons icons
where
compareIcons = flip (compare `on` fst)
findBest (a1:a2:ax) = if (fst a2) < h then Just $ snd a1 else findBest (a2:ax)
findBest [a] = Just $ snd a
findBest [] = Nothing
2011-07-15 15:31:46 +02:00
2011-07-15 09:17:57 +02:00
windowOnDesktop :: Int -> WindowState -> Bool
windowOnDesktop desktop state = (windowVisible state) && (desktop == windowDesktop state)
taskbarRunner :: Phi -> Display -> IO ()
taskbarRunner phi dispvar = do
2011-07-15 15:31:46 +02:00
(windows, states, icons) <- liftIO $ withDisplay dispvar $ \disp -> do
(windows, states, icons) <- getWindowStates disp (getAtoms dispvar) [] M.empty M.empty
2011-07-15 09:17:57 +02:00
desktopCount <- getDesktopCount disp (getAtoms dispvar)
activeWindow <- getActiveWindow disp (getAtoms dispvar)
2011-07-15 15:31:46 +02:00
sendMessage phi $ WindowListUpdate windows states icons
2011-07-15 09:17:57 +02:00
sendMessage phi $ DesktopCountUpdate desktopCount
sendMessage phi $ ActiveWindowUpdate activeWindow
2011-07-15 15:31:46 +02:00
return (windows, states, icons)
2011-07-15 09:17:57 +02:00
sendMessage phi Repaint
2011-07-15 15:31:46 +02:00
flip evalStateT (windows, states, icons) $ forever $ do
2011-07-15 09:17:57 +02:00
m <- receiveMessage phi
case (fromMessage m) of
Just event@XExtras.PropertyEvent {} ->
handlePropertyUpdate phi dispvar event
_ ->
return ()
2011-07-15 15:31:46 +02:00
2011-07-16 01:28:47 +02:00
handlePropertyUpdate :: Phi -> Display -> XExtras.Event -> StateT ([Window], M.Map Window WindowState, M.Map Window [(Int, Surface)]) IO ()
2011-07-15 09:17:57 +02:00
handlePropertyUpdate phi dispvar XExtras.PropertyEvent {XExtras.ev_atom = atom, XExtras.ev_window = window} = do
let atoms = getAtoms dispvar
when (elem atom $ map ($ atoms) [ atom_NET_ACTIVE_WINDOW
, atom_NET_NUMBER_OF_DESKTOPS
, atom_NET_CLIENT_LIST
2011-07-15 15:31:46 +02:00
, atom_NET_WM_ICON
2011-07-15 09:17:57 +02:00
, atom_NET_WM_NAME
, atomWM_NAME
, atom_NET_WM_DESKTOP
, atom_NET_WM_STATE
]) $ withDisplay dispvar $ \disp -> do
let rootwin = Xlib.defaultRootWindow disp
if (window == rootwin)
then do
when (atom == atom_NET_ACTIVE_WINDOW atoms) $ do
activeWindow <- liftIO $ getActiveWindow disp atoms
sendMessage phi $ ActiveWindowUpdate activeWindow
sendMessage phi Repaint
when (atom == atom_NET_NUMBER_OF_DESKTOPS atoms) $ do
desktopCount <- liftIO $ getDesktopCount disp atoms
sendMessage phi $ DesktopCountUpdate desktopCount
sendMessage phi Repaint
when (atom == atom_NET_CLIENT_LIST atoms) $ do
2011-07-15 15:31:46 +02:00
(windows, windowStates, icons) <- get
(windows', windowStates', icons') <- liftIO $ getWindowStates disp atoms windows windowStates icons
2011-07-15 09:17:57 +02:00
2011-07-15 15:31:46 +02:00
when (windows /= windows') $ do
sendMessage phi $ WindowListUpdate windows' windowStates' icons'
2011-07-15 09:17:57 +02:00
sendMessage phi Repaint
2011-07-15 15:31:46 +02:00
put (windows', windowStates', icons')
2011-07-15 09:17:57 +02:00
else do
2011-07-15 15:31:46 +02:00
(windows, windowStates, icons) <- get
2011-07-15 09:17:57 +02:00
when (elem window windows) $ do
2011-07-15 15:31:46 +02:00
when (atom == atom_NET_WM_ICON atoms) $ do
icon <- liftIO $ getWindowIcons disp atoms window
let icons' = M.insert window icon icons
sendMessage phi $ WindowListUpdate windows windowStates icons'
2011-07-15 09:17:57 +02:00
sendMessage phi Repaint
2011-07-15 15:31:46 +02:00
put (windows, windowStates, icons')
when (atom /= atom_NET_WM_ICON atoms) $ do
let windowState = M.lookup window windowStates
windowState' <- liftIO $ getWindowState disp atoms window
when (windowState /= (Just windowState')) $ do
let windowStates' = M.insert window windowState' windowStates
sendMessage phi $ WindowListUpdate windows windowStates' icons
sendMessage phi Repaint
put (windows, windowStates', icons)
2011-07-15 09:17:57 +02:00
getDesktopCount :: Xlib.Display -> Atoms -> IO Int
getDesktopCount disp atoms =
liftM (fromIntegral . fromMaybe 0 . join . fmap listToMaybe) $ XExtras.getWindowProperty32 disp (atom_NET_NUMBER_OF_DESKTOPS atoms) $ Xlib.defaultRootWindow disp
getActiveWindow :: Xlib.Display -> Atoms -> IO Window
getActiveWindow disp atoms =
liftM (fromIntegral . fromMaybe 0 . join . fmap listToMaybe) $ XExtras.getWindowProperty32 disp (atom_NET_ACTIVE_WINDOW atoms) $ Xlib.defaultRootWindow disp
2011-07-16 01:28:47 +02:00
getWindowStates :: Xlib.Display -> Atoms -> [Window] -> M.Map Window WindowState -> M.Map Window [(Int, Surface)]
-> IO ([Window], M.Map Window WindowState, M.Map Window [(Int, Surface)])
2011-07-15 15:31:46 +02:00
getWindowStates disp atoms oldWindows windowStates windowIcons = do
2011-07-15 09:17:57 +02:00
windows <- getWindowList disp atoms oldWindows
let windowStates' = map (\w -> (w, M.lookup w windowStates)) windows
2011-07-15 15:31:46 +02:00
windowIcons' = map (\w -> (w, M.lookup w windowIcons)) windows
2011-07-15 09:17:57 +02:00
newWindowStates <- mapM getWindowState' windowStates'
2011-07-15 15:31:46 +02:00
newWindowIcons <- mapM getWindowIcons' windowIcons'
2011-07-15 09:17:57 +02:00
2011-07-15 15:31:46 +02:00
return (windows, M.fromList newWindowStates, M.fromList newWindowIcons)
2011-07-15 09:17:57 +02:00
where
getWindowState' (window, Just windowState) = return (window, windowState)
getWindowState' (window, Nothing) = do
windowState <- getWindowState disp atoms window
return (window, windowState)
2011-07-15 15:31:46 +02:00
getWindowIcons' (window, Just icons) = return (window, icons)
getWindowIcons' (window, Nothing) = do
icons <- getWindowIcons disp atoms window
return (window, icons)
2011-07-15 09:17:57 +02:00
2011-07-15 15:31:46 +02:00
getWindowState :: Xlib.Display -> Atoms -> Window -> IO WindowState
2011-07-15 09:17:57 +02:00
getWindowState disp atoms window = do
Xlib.selectInput disp window Xlib.propertyChangeMask
netwmname <- liftM (fmap (decode . map fromIntegral)) $ XExtras.getWindowProperty8 disp (atom_NET_WM_NAME atoms) window
wmname <- case netwmname of
Just name -> return name
Nothing -> liftM (map unsignedChr . fromMaybe []) $ XExtras.getWindowProperty8 disp (atomWM_NAME atoms) window
workspace <- liftM (fromIntegral . fromMaybe 0xFFFFFFFF . join . fmap listToMaybe) $ XExtras.getWindowProperty32 disp (atom_NET_WM_DESKTOP atoms) window
visible <- showWindow disp atoms window
return $ WindowState wmname workspace visible
where
unsignedChr = chr . fromIntegral . (fromIntegral :: (CChar -> CUChar))
2011-07-16 01:28:47 +02:00
getWindowIcons :: Xlib.Display -> Atoms -> Window -> IO [(Int, Surface)]
2011-07-15 15:31:46 +02:00
getWindowIcons disp atoms window = XExtras.getWindowProperty32 disp (atom_NET_WM_ICON atoms) window >>= readIcons . fromMaybe []
2011-07-16 01:28:47 +02:00
readIcons :: [CLong] -> IO [(Int, Surface)]
2011-07-15 15:31:46 +02:00
readIcons (width:height:iconData) = do
if ((fromIntegral $ length iconData) < (width*height)) then return [] else do
let (thisIcon, rest) = splitAt (fromIntegral (width*height)) iconData
icon <- createImageSurface FormatARGB32 (fromIntegral width) (fromIntegral height)
surfaceData <- imageSurfaceGetPixels icon :: IO (SurfaceData Int Word32)
forM_ (zip thisIcon [1..]) $ \(e, i) -> writeArray surfaceData i $ premultiply $ fromIntegral e
surfaceMarkDirty icon
moreIcons <- readIcons rest
2011-07-16 01:28:47 +02:00
return $ (fromIntegral $ max width height, icon):moreIcons
2011-07-15 15:31:46 +02:00
readIcons _ = return []
premultiply :: Word32 -> Word32
premultiply c = a .|. r .|. g .|. b
where
amask = 0xFF000000
rmask = 0x00FF0000
gmask = 0x0000FF00
bmask = 0x000000FF
a = c .&. amask
pm mask = (((c .&. mask) * (a `shiftR` 24)) `div` 0xFF) .&. mask
r = pm rmask
g = pm gmask
b = pm bmask
2011-07-15 09:17:57 +02:00
showWindow :: Xlib.Display -> Atoms -> Window -> IO Bool
showWindow disp atoms window = do
states <- liftM (map fromIntegral . fromMaybe []) $ XExtras.getWindowProperty32 disp (atom_NET_WM_STATE atoms) window
transientForHint <- XExtras.getTransientForHint disp window
windowType <- liftM (fromMaybe (atom_NET_WM_WINDOW_TYPE_NORMAL atoms) . fmap fromIntegral . join . fmap listToMaybe) $ XExtras.getWindowProperty32 disp (atom_NET_WM_STATE atoms) window
return $ not $ or [ elem (atom_NET_WM_STATE_SKIP_TASKBAR atoms) states
, transientForHint /= Nothing
, elem windowType $ map ($ atoms) [ atom_NET_WM_WINDOW_TYPE_DOCK
, atom_NET_WM_WINDOW_TYPE_DESKTOP
, atom_NET_WM_WINDOW_TYPE_TOOLBAR
, atom_NET_WM_WINDOW_TYPE_MENU
, atom_NET_WM_WINDOW_TYPE_SPLASH
]
]
2011-07-15 15:31:46 +02:00
2011-07-15 09:17:57 +02:00
getWindowList :: Xlib.Display -> Atoms -> [Window] -> IO [Window]
getWindowList disp atoms windows = do
newWindows <- liftM (map fromIntegral . join . maybeToList) $ XExtras.getWindowProperty32 disp (atom_NET_CLIENT_LIST atoms) $ Xlib.defaultRootWindow disp
return $ (filter (flip elem newWindows) windows) ++ (filter (not . flip elem windows) newWindows)
2011-07-14 22:50:03 +02:00
taskbar :: TaskbarConfig -> Widget
taskbar config = do
Widget $ Taskbar config