diff options
author | anton.pirogov <anton.pirogov@gmail.com> | 2015-03-03 22:01:43 +0100 |
---|---|---|
committer | anton.pirogov <anton.pirogov@gmail.com> | 2015-03-03 22:01:43 +0100 |
commit | 3080d581602127eab35dbe49a85b1e3e719c97ae (patch) | |
tree | 82500135bcebe836a92e40c28ebd3776a0ffdcab /XMonad/Layout | |
parent | 9699b2ade674f760fee0dafd1a3de4d680d65845 (diff) | |
download | XMonadContrib-3080d581602127eab35dbe49a85b1e3e719c97ae.tar.gz XMonadContrib-3080d581602127eab35dbe49a85b1e3e719c97ae.tar.xz XMonadContrib-3080d581602127eab35dbe49a85b1e3e719c97ae.zip |
Added messages to adjust the gap dynamically
Ignore-this: 891ca1ccca183d6af8e4aa4bf6d843fb
darcs-hash:20150303210143-8e960-aa36510443a7db957524b163230b1e4357d181b5.gz
Diffstat (limited to '')
-rw-r--r-- | XMonad/Layout/Spacing.hs | 20 |
1 files changed, 17 insertions, 3 deletions
diff --git a/XMonad/Layout/Spacing.hs b/XMonad/Layout/Spacing.hs index 38ffbd5..c54ef50 100644 --- a/XMonad/Layout/Spacing.hs +++ b/XMonad/Layout/Spacing.hs @@ -1,4 +1,4 @@ -{-# LANGUAGE FlexibleInstances, MultiParamTypeClasses #-} +{-# LANGUAGE FlexibleInstances, MultiParamTypeClasses, DeriveDataTypeable #-} ----------------------------------------------------------------------------- -- | @@ -21,12 +21,12 @@ module XMonad.Layout.Spacing ( spacingWithEdge, SpacingWithEdge, smartSpacing, SmartSpacing, smartSpacingWithEdge, SmartSpacingWithEdge, - + SpacingMsg(..) ) where import Graphics.X11 (Rectangle(..)) import Control.Arrow (second) -import XMonad.Core (runLayout) +import XMonad.Core (runLayout,Message,fromMessage,Typeable) import XMonad.StackSet (up, down, Workspace(..)) import XMonad.Util.Font (fi) @@ -49,10 +49,19 @@ spacing p = ModifiedLayout (Spacing p) data Spacing a = Spacing Int deriving (Show, Read) +-- | Message to dynamically increase, decrease or set the size of the window spacing +data SpacingMsg = SetSpacing Int | IncSpacing Int deriving (Show,Read,Eq,Typeable) +instance Message SpacingMsg + instance LayoutModifier Spacing a where pureModifier (Spacing p) _ _ wrs = (map (second $ shrinkRect p) wrs, Nothing) + pureMess (Spacing px) m + | Just (SetSpacing px') <- fromMessage m = Just $ Spacing (max 0 px') + | Just (IncSpacing n) <- fromMessage m = Just $ Spacing (max 0 (px+n)) + | otherwise = Nothing + modifierDescription (Spacing p) = "Spacing " ++ show p -- | Surround all windows by a certain number of pixels of blank space, and @@ -66,6 +75,11 @@ instance LayoutModifier SpacingWithEdge a where pureModifier (SpacingWithEdge p) _ _ wrs = (map (second $ shrinkRect p) wrs, Nothing) + pureMess (SpacingWithEdge px) m + | Just (SetSpacing px') <- fromMessage m = Just $ SpacingWithEdge (max 0 px') + | Just (IncSpacing n) <- fromMessage m = Just $ SpacingWithEdge (max 0 (px+n)) + | otherwise = Nothing + modifyLayout (SpacingWithEdge p) w r = runLayout w (shrinkRect p r) modifierDescription (SpacingWithEdge p) = "SpacingWithEdge " ++ show p |