aboutsummaryrefslogtreecommitdiffstats
path: root/XMonad/Util/PositionStore.hs
diff options
context:
space:
mode:
authorJan Vornberger <jan.vornberger@informatik.uni-oldenburg.de>2009-11-08 20:57:35 +0100
committerJan Vornberger <jan.vornberger@informatik.uni-oldenburg.de>2009-11-08 20:57:35 +0100
commit77bfd730a1a6f970a22c4c06cce0506101470ffd (patch)
tree272c7b5e6eaaf7cf077220afbe0e13c76f8fbc3b /XMonad/Util/PositionStore.hs
parentf7f05f00f12d7f1fd77dcee9ff9a2e118e56f9c8 (diff)
downloadXMonadContrib-77bfd730a1a6f970a22c4c06cce0506101470ffd.tar.gz
XMonadContrib-77bfd730a1a6f970a22c4c06cce0506101470ffd.tar.xz
XMonadContrib-77bfd730a1a6f970a22c4c06cce0506101470ffd.zip
PositionStore utility to store information about position and size of a window
Ignore-this: 2f6e68a490deb75cba5d007b30c93fb2 darcs-hash:20091108195735-594c5-80fb89be9b363a7b0a8d4f54b968c57f4d0e9c74.gz
Diffstat (limited to 'XMonad/Util/PositionStore.hs')
-rw-r--r--XMonad/Util/PositionStore.hs81
1 files changed, 81 insertions, 0 deletions
diff --git a/XMonad/Util/PositionStore.hs b/XMonad/Util/PositionStore.hs
new file mode 100644
index 0000000..3aef67c
--- /dev/null
+++ b/XMonad/Util/PositionStore.hs
@@ -0,0 +1,81 @@
+{-# LANGUAGE DeriveDataTypeable #-}
+
+----------------------------------------------------------------------------
+-- |
+-- Module : XMonad.Util.PositionStore
+-- Copyright : (c) Jan Vornberger 2009
+-- License : BSD3-style (see LICENSE)
+--
+-- Maintainer : jan.vornberger@informatik.uni-oldenburg.de
+-- Stability : unstable
+-- Portability : not portable
+--
+-- A utility module to store information about position and size of a window.
+--
+-----------------------------------------------------------------------------
+
+module XMonad.Util.PositionStore (
+ getPosStore,
+ modifyPosStore,
+
+ posStoreInsert,
+ posStoreMove,
+ posStoreQuery,
+ posStoreRemove
+ ) where
+
+import XMonad
+import XMonad.Util.ExtensibleState
+import Graphics.X11.Xlib
+import Graphics.X11.Types
+import Data.Typeable
+import qualified Data.Map as M
+
+-- Store window positions relative to the upper left screen edge
+-- and windows sizes as well as positions as fractions of the screen size.
+-- This way windows can be easily relocated and scaled when switching screens.
+
+data PositionStore = PS (M.Map Window PosStoreRectangle)
+ deriving (Read,Show,Typeable)
+data PosStoreRectangle = PSRectangle Double Double Double Double
+ deriving (Read,Show,Typeable)
+
+instance ExtensionClass PositionStore where
+ initialValue = PS M.empty
+ extensionType = PersistentExtension
+
+getPosStore :: X (PositionStore)
+getPosStore = getState
+
+modifyPosStore :: (PositionStore -> PositionStore) -> X ()
+modifyPosStore f = do
+ posStore <- getState
+ putState (f posStore)
+
+posStoreInsert :: PositionStore -> Window -> Rectangle -> Rectangle -> PositionStore
+posStoreInsert (PS posStoreMap) w (Rectangle x y wh ht) (Rectangle srX srY srWh srHt) =
+ let offsetX = x - srX
+ offsetY = y - srY
+ in PS $ M.insert w (PSRectangle (fromIntegral offsetX / fromIntegral srWh)
+ (fromIntegral offsetY / fromIntegral srHt)
+ (fromIntegral wh / fromIntegral srWh)
+ (fromIntegral ht / fromIntegral srHt)) posStoreMap
+
+posStoreRemove :: PositionStore -> Window -> PositionStore
+posStoreRemove (PS posStoreMap) w = PS $ M.delete w posStoreMap
+
+posStoreQuery :: PositionStore -> Window -> Rectangle -> Maybe Rectangle
+posStoreQuery (PS posStoreMap) w (Rectangle srX srY srWh srHt) = do
+ (PSRectangle x y wh ht) <- M.lookup w posStoreMap
+ let realWh = fromIntegral srWh * wh
+ realHt = fromIntegral srHt * ht
+ realOffsetX = fromIntegral srWh * x
+ realOffsetY = fromIntegral srHt * y
+ return (Rectangle (srX + round realOffsetX) (srY + round realOffsetY)
+ (round realWh) (round realHt))
+
+posStoreMove :: PositionStore -> Window -> Position -> Position -> Rectangle -> Rectangle -> PositionStore
+posStoreMove posStore w x y oldSr newSr =
+ case (posStoreQuery posStore w oldSr) of
+ Nothing -> posStore -- not in store, can't move -> do nothing
+ Just (Rectangle _ _ wh ht) -> posStoreInsert posStore w (Rectangle x y wh ht) newSr