From dea9a66fccca94ed27387246e384f3dcb20501f6 Mon Sep 17 00:00:00 2001 From: Adrian Kummerlaender Date: Sat, 5 May 2018 13:02:04 +0200 Subject: Basic attempt at a better structure --- conf/xmonad/xmonad.hs | 184 -------------------------------------------------- 1 file changed, 184 deletions(-) delete mode 100644 conf/xmonad/xmonad.hs (limited to 'conf/xmonad/xmonad.hs') diff --git a/conf/xmonad/xmonad.hs b/conf/xmonad/xmonad.hs deleted file mode 100644 index f42ec34..0000000 --- a/conf/xmonad/xmonad.hs +++ /dev/null @@ -1,184 +0,0 @@ -import XMonad -import XMonad.Util.EZConfig -import XMonad.StackSet - -import XMonad.Hooks.EwmhDesktops - -import XMonad.Layout.NoBorders -import XMonad.Layout.Tabbed -import XMonad.Layout.Reflect - -import XMonad.Util.Themes -import XMonad.Util.NamedScratchpad - -import XMonad.Actions.SpawnOn -import XMonad.Actions.CycleWS -import XMonad.Actions.WindowBringer -import XMonad.Actions.GroupNavigation -import XMonad.Actions.FloatKeys - -import System.Exit -import Data.Maybe -import Control.Monad (when) -import qualified Data.Map as M - -workspaces :: [WorkspaceId] -workspaces = map show [1 .. 9 :: Int] - -customTabTheme = (theme xmonadTheme) - { fontName = "xft:Iosevka Medium-12" - , decoHeight = 20 - , activeTextColor = "#222222" - , activeColor = "#909737" - , inactiveTextColor = "#999999" - , inactiveColor = "#161616" - , activeBorderColor = "#909737" - , inactiveBorderColor = "#161616" } - -availableLayouts = smartBorders $ tabs ||| tilesLM ||| tilesRM ||| tilesTM ||| tilesBM - where - tabs = tabbed shrinkText customTabTheme - tilesLM = Tall 1 delta ratio - tilesRM = reflectHoriz tilesLM - tilesTM = Mirror tilesLM - tilesBM = reflectVert tilesTM - ratio = 1/2 - delta = 3/100 - -windowBringerDmenuConfig = def { menuCommand = "rofi" - , menuArgs = [ "-p", "win", "-dmenu", "-i" ] } - -floatRectTop h = hideScreenBorder $ RationalRect (1/20) 0 (18/20) h -floatRectBottom h = hideScreenBorder $ RationalRect (1/20) (1-h) (18/20) h -floatRectLeft w = hideScreenBorder $ RationalRect 0 (1/20) w (18/20) -floatRectRight w = hideScreenBorder $ RationalRect (1-w) (1/20) w (18/20) - -dropUp = floatRectBottom $ 2/3 -dropUpLarge = floatRectBottom $ 18/20 -dropDown = floatRectTop $ 2/3 -dropDownLarge = floatRectTop $ 18/20 -sideBarLeft = floatRectLeft $ 1/2 -sideBarRight = floatRectRight $ 1/2 - -scratchpads = [ NS "terminal" "kitty --class=scratchterm" (className =? "scratchterm") - (customFloating dropDown) - , NS "browser" "firefox" (className =? "Firefox") - (customFloating dropDown) - , NS "documentation" "zeal" (className =? "Zeal") - (customFloating dropDown) - , NS "messaging" "telegram-desktop" (className =? "TelegramDesktop") - (customFloating sideBarRight) ] - -keybindings = --- xmonad session control - [ ("C-M1-" , io (exitWith ExitSuccess)) - , ("C-M1-" , spawn "xmonad --restart") --- application launchers - , ("M-" , spawn "rofi -show combi") - , ("M-" , spawn "kitty") - , ("M-S-" , spawn "vim -g") --- window management - , ("M-q" , windows $ shift "NSP") - , ("M-S-q" , kill) - , ("M-j" , windows focusDown) - , ("M-k" , windows focusUp) - , ("M-S-j" , windows swapDown) - , ("M-S-k" , windows swapUp) - , ("M-h" , sendMessage Shrink) - , ("M-l" , sendMessage Expand) - , ("M-" , nextMatch History (return True)) --- window bringer - , ("M-a" , gotoMenuConfig windowBringerDmenuConfig) - , ("M-S-a" , bringMenuConfig windowBringerDmenuConfig) --- scratchpads - , ("M-b" , namedScratchpadAction scratchpads "browser") - , ("M-d" , namedScratchpadAction scratchpads "documentation") - , ("M-m" , namedScratchpadAction scratchpads "messaging") ] ++ --- workspace selection - [ (p ++ [k] , windows $ f i) | (i, k) <- zip Main.workspaces ['1' .. '9'] - , (p, f) <- [ ("M-" , greedyView) - , ("M-S-" , shift) ] ] ++ --- workspace management - [ ("M-s l" , sendMessage NextLayout) - , ("M-s p" , toggleWS' ["NSP"]) - , ("M-s j" , moveTo Next nonEmptyWS) - , ("M-s k" , moveTo Prev nonEmptyWS) - , ("M-S-s j" , shiftTo Next nonEmptyWS >> moveTo Next nonEmptyWS) - , ("M-S-s k" , shiftTo Prev nonEmptyWS >> moveTo Prev nonEmptyWS) --- floating placement - , ("M-w t" , withFocused $ windows . sink) - , ("M-w f" , withFocused $ placeFloating $ RationalRect 0 0 1 1) - , ("M-w j" , withFocused $ placeFloating dropUp) - , ("M-w S-j" , withFocused $ placeFloating dropUpLarge) - , ("M-w k" , withFocused $ placeFloating dropDown) - , ("M-w S-k" , withFocused $ placeFloating dropDownLarge) - , ("M-w h" , withFocused $ placeFloating sideBarLeft) - , ("M-w l" , withFocused $ placeFloating sideBarRight) --- system control - , ("M-c " , spawn "amixer sset Master 10%+") - , ("M-c " , spawn "amixer sset Master 10%-") - , ("M-c m" , spawn "amixer sset Master toggle") ] - -customEventHook = do - handleEventHook defaultConfig - fullscreenEventHook - -customLogHook = do - historyHook - customizeBorderWhen (isFloat <&&> isNotFullscreen) "#aadb0f" 6 - -main = xmonad $ ewmh - $ defaultConfig - { modMask = mod4Mask -- super key as modifier - , borderWidth = 3 - , normalBorderColor = "#161616" - , focusedBorderColor = "#909737" - , keys = \c -> mkKeymap c keybindings - , startupHook = return () >> checkKeymap defaultConfig keybindings - , handleEventHook = customEventHook - , layoutHook = availableLayouts - , manageHook = namedScratchpadManageHook scratchpads - , logHook = customLogHook } - `additionalKeys` - [ ((noModMask, xK_Menu) , namedScratchpadAction scratchpads "terminal") ] - -nonEmptyWS = WSIs $ return (\w -> nonNSP w && nonEmpty w) - where nonNSP (Workspace tag _ _) = tag /= "NSP" - nonEmpty = isJust . stack - -placeFloating :: RationalRect -> Window -> X () -placeFloating rect = windows . (flip XMonad.StackSet.float $ rect) - -windowSize w = do - r <- withDisplay $ (\d -> io $ getWindowAttributes d w) - return (fromIntegral $ wa_width r, fromIntegral $ wa_height r) - -withCurrentScreen f = withWindowSet $ \ws -> f (current ws) -withCurrentScreenRect f = withCurrentScreen $ \s -> f (screenRect (screenDetail s)) - -screenResolution = withCurrentScreenRect $ \r -> return (rect_width r, rect_height r) - -isNotFullscreen :: Query Bool -isNotFullscreen = ask >>= (\w -> liftX $ do (ww, wh) <- windowSize w - (sw, sh) <- screenResolution - return $ not (ww == sw && wh == sh)) - -isFloat :: Query Bool -isFloat = ask >>= (\w -> liftX $ withWindowSet $ \ws -> return $ (M.member w (floating ws))) - -customizeBorderWhen :: Query Bool -> String -> Dimension -> X () -customizeBorderWhen q color width = withFocused $ \w -> runQuery q w >>= flip when (setWindowBorder' color width w) - -setWindowBorder' :: String -> Dimension -> Window -> X () -setWindowBorder' color width window = do - XConf { display = d } <- ask - ~(Just pixel) <- io $ initColor d color - io $ setWindowBorder d window pixel - io $ setWindowBorderWidth d window width - --- ugly hack to hide window border at screen boundary -hideScreenBorder :: RationalRect -> RationalRect -hideScreenBorder (RationalRect x0 y0 w h) = RationalRect (x0-(bw/sw)) (y0-(bw/sh)) (w+((2*bw)/sw)) (h+((2*bw+1)/sh)) - where bw = 6 - sw = 1280 - sh = 1024 -- cgit v1.2.3