aboutsummaryrefslogtreecommitdiffstats
path: root/XMonad
diff options
context:
space:
mode:
authorJan Vornberger <jan.vornberger@informatik.uni-oldenburg.de>2009-09-30 17:27:41 +0200
committerJan Vornberger <jan.vornberger@informatik.uni-oldenburg.de>2009-09-30 17:27:41 +0200
commit3db3ce9071ead1ee0ebbedbeb23a77e4f2a7e152 (patch)
treeb04a610ce80108836189babfe58e127a99049099 /XMonad
parent38b76e9c25a1203b82af19b13c6275003fa12ac3 (diff)
downloadXMonadContrib-3db3ce9071ead1ee0ebbedbeb23a77e4f2a7e152.tar.gz
XMonadContrib-3db3ce9071ead1ee0ebbedbeb23a77e4f2a7e152.tar.xz
XMonadContrib-3db3ce9071ead1ee0ebbedbeb23a77e4f2a7e152.zip
Extended GridSelect
Ignore-this: 2999d891387e4db9746061b1a42264a4 1) Added another convenience wrapper that allows to select an X() action from a given list. 2) Implemented the option to change the position of the selection diamond. (Re-recorded from Bluetile repo, rebased to current darcs) darcs-hash:20090930152741-594c5-5ae95ac1fb5ca2b22d245e9affb21832cc55b313.gz
Diffstat (limited to 'XMonad')
-rw-r--r--XMonad/Actions/GridSelect.hs33
1 files changed, 24 insertions, 9 deletions
diff --git a/XMonad/Actions/GridSelect.hs b/XMonad/Actions/GridSelect.hs
index 84c8b4f..5808447 100644
--- a/XMonad/Actions/GridSelect.hs
+++ b/XMonad/Actions/GridSelect.hs
@@ -27,6 +27,7 @@ module XMonad.Actions.GridSelect (
bringSelected,
goToSelected,
spawnSelected,
+ runSelectedAction,
fromClassName,
defaultColorizer,
colorRangeFromClassName
@@ -73,7 +74,9 @@ data GSConfig a = GSConfig {
gs_cellpadding :: Integer,
gs_colorizer :: a -> Bool -> X (String, String),
gs_font :: String,
- gs_navigate :: NavigateMap
+ gs_navigate :: NavigateMap,
+ gs_originFractX :: Double,
+ gs_originFractY :: Double
}
type NavigateMap = M.Map (KeyMask,KeySym) (TwoDPosition -> TwoDPosition)
@@ -114,9 +117,11 @@ diamondLayer n = let ul = [ (x,n-x) | x <- [0..n] ]
diamond :: (Enum a, Num a) => [(a, a)]
diamond = concatMap diamondLayer [0..]
-diamondRestrict :: (Enum t, Num t, Ord t) => t -> t -> [(t, t)]
-diamondRestrict x y = L.filter (\(x',y') -> abs x' <= x && abs y' <= y) .
- L.takeWhile (\(x',y') -> abs x' + abs y' <= x+y) $ diamond
+diamondRestrict :: Integer -> Integer -> Integer -> Integer -> [(Integer, Integer)]
+diamondRestrict x y originX originY =
+ L.filter (\(x',y') -> abs x' <= x && abs y' <= y) .
+ map (\(x', y') -> (x' + fromInteger originX, y' + fromInteger originY)) .
+ take 1000 $ diamond
tupadd :: (Num t1, Num t) => (t, t1) -> (t, t1) -> (t, t1)
tupadd (a,b) (c,d) = (a+c,b+d)
@@ -208,8 +213,8 @@ handle (ks,_) (KeyEvent {ev_event_type = t, ev_state = m })
handle _ (ButtonEvent { ev_event_type = t, ev_x = x, ev_y = y })
| t == buttonRelease = do
- TwoDState { td_elementmap = elmap, td_paneX = px, td_paneY = py,
- td_gsconfig = (GSConfig ch cw _ _ _ _) } <- get
+ (TwoDState { td_elementmap = elmap, td_paneX = px, td_paneY = py,
+ td_gsconfig = (GSConfig ch cw _ _ _ _ _ _) }) <- get
let gridX = (fi x - (px - cw) `div` 2) `div` cw
gridY = (fi y - (py - ch) `div` 2) `div` ch
case lookup (gridX,gridY) elmap of
@@ -316,10 +321,13 @@ gridselect gsconfig elmap =
restriction ss cs = ((fromInteger ss)/(fromInteger $ cs gsconfig)-1)/2
restrictX = floor $ restriction screenWidth gs_cellwidth
restrictY = floor $ restriction screenHeight gs_cellheight
- elmap' = zip (diamondRestrict restrictX restrictY) elmap
+ originPosX = floor $ ((gs_originFractX gsconfig) - (1/2)) * 2 * fromIntegral restrictX
+ originPosY = floor $ ((gs_originFractY gsconfig) - (1/2)) * 2 * fromIntegral restrictY
+ coords = diamondRestrict restrictX restrictY originPosX originPosY
+ elmap' = zip coords elmap
evalTwoD (updateAllElements >> eventLoop)
- (TwoDState (0,0)
+ (TwoDState (head coords)
elmap'
gsconfig
font
@@ -365,7 +373,7 @@ defaultGSConfig = buildDefaultGSConfig fromClassName
-- | Builds a default gs config from a colorizer function.
buildDefaultGSConfig :: (a -> Bool -> X (String,String)) -> GSConfig a
-buildDefaultGSConfig col = GSConfig 50 130 10 col "xft:Sans-8" defaultGSNav
+buildDefaultGSConfig col = GSConfig 50 130 10 col "xft:Sans-8" defaultGSNav (1/2) (1/2)
defaultGSNav :: NavigateMap
defaultGSNav = M.map tupadd $ M.fromList
@@ -400,3 +408,10 @@ defaultGSSpawnConfig = buildDefaultGSConfig defaultColorizer
spawnSelected :: GSConfig String -> [String] -> X ()
spawnSelected conf lst = gridselect conf (zip lst lst) >>= flip whenJust spawn
+-- | Select an action and run it in the X monad
+runSelectedAction :: GSConfig (X ()) -> [(String, X ())] -> X ()
+runSelectedAction conf actions = do
+ selectedActionM <- gridselect conf actions
+ case selectedActionM of
+ Just selectedAction -> selectedAction
+ Nothing -> return ()