2016-11-21 15:53:00 -08:00
|
|
|
|
{-# LANGUAGE DeriveDataTypeable, TypeSynonymInstances,
|
|
|
|
|
MultiParamTypeClasses, ExistentialQuantification,
|
|
|
|
|
FlexibleInstances, FlexibleContexts #-}
|
2016-10-29 10:16:41 -07:00
|
|
|
|
module Main where
|
|
|
|
|
|
2016-11-29 22:47:44 -06:00
|
|
|
|
import qualified Control.Arrow as A
|
2016-11-24 18:33:49 -08:00
|
|
|
|
import Control.Monad
|
|
|
|
|
import Control.Monad.Trans.Maybe
|
|
|
|
|
import Data.Aeson
|
2016-10-21 22:01:51 -07:00
|
|
|
|
import qualified Data.ByteString.Lazy as B
|
2016-11-24 18:33:49 -08:00
|
|
|
|
import Data.List
|
2017-03-31 22:36:15 -07:00
|
|
|
|
import Data.List.Split
|
2016-10-21 22:01:51 -07:00
|
|
|
|
import qualified Data.Map as M
|
2016-11-24 18:33:49 -08:00
|
|
|
|
import Data.Maybe
|
2016-11-30 13:09:15 -06:00
|
|
|
|
import qualified Data.MultiMap as MM
|
2016-11-24 18:33:49 -08:00
|
|
|
|
import Graphics.X11.ExtraTypes.XF86
|
2016-11-30 13:09:15 -06:00
|
|
|
|
import Network.HostName
|
2016-11-24 18:33:49 -08:00
|
|
|
|
import System.Directory
|
|
|
|
|
import System.FilePath.Posix
|
2017-05-07 23:35:01 -07:00
|
|
|
|
import System.Process
|
2016-11-24 18:33:49 -08:00
|
|
|
|
import System.Taffybar.Hooks.PagerHints
|
|
|
|
|
import Text.Printf
|
2016-09-16 14:38:11 -07:00
|
|
|
|
|
2016-11-24 18:33:49 -08:00
|
|
|
|
import XMonad hiding ( (|||) )
|
2016-11-29 11:28:17 -08:00
|
|
|
|
import XMonad.Actions.CycleWS hiding (nextScreen)
|
2017-04-14 19:21:54 -07:00
|
|
|
|
import XMonad.Actions.CycleWorkspaceByScreen
|
2016-10-23 01:57:08 -07:00
|
|
|
|
import qualified XMonad.Actions.DynamicWorkspaceOrder as DWO
|
2016-12-23 19:07:12 -08:00
|
|
|
|
import XMonad.Actions.DynamicWorkspaces hiding (withWorkspace)
|
2016-11-24 18:33:49 -08:00
|
|
|
|
import XMonad.Actions.Minimize
|
2017-05-19 00:52:37 -07:00
|
|
|
|
import XMonad.Actions.Navigation2D
|
2016-12-23 21:06:27 -08:00
|
|
|
|
import XMonad.Actions.UpdatePointer
|
2016-11-24 18:33:49 -08:00
|
|
|
|
import XMonad.Actions.WindowBringer
|
|
|
|
|
import XMonad.Actions.WindowGo
|
2017-02-01 16:34:12 -08:00
|
|
|
|
import XMonad.Actions.WorkspaceNames
|
2016-11-24 18:33:49 -08:00
|
|
|
|
import XMonad.Config ()
|
|
|
|
|
import XMonad.Hooks.EwmhDesktops
|
|
|
|
|
import XMonad.Hooks.FadeInactive
|
|
|
|
|
import XMonad.Hooks.ManageDocks
|
2017-03-10 15:09:28 -08:00
|
|
|
|
import XMonad.Hooks.ManageHelpers
|
2016-11-26 22:10:11 -08:00
|
|
|
|
import XMonad.Hooks.Minimize
|
2017-04-14 19:21:54 -07:00
|
|
|
|
import XMonad.Hooks.WorkspaceHistory
|
2016-11-24 18:33:49 -08:00
|
|
|
|
import XMonad.Layout.Accordion
|
|
|
|
|
import XMonad.Layout.BoringWindows
|
2016-12-28 21:38:27 -08:00
|
|
|
|
import XMonad.Layout.Cross
|
2016-11-24 18:33:49 -08:00
|
|
|
|
import XMonad.Layout.LayoutCombinators
|
|
|
|
|
import XMonad.Layout.LayoutModifier
|
|
|
|
|
import XMonad.Layout.LimitWindows
|
|
|
|
|
import XMonad.Layout.MagicFocus
|
|
|
|
|
import XMonad.Layout.Minimize
|
|
|
|
|
import XMonad.Layout.MultiColumns
|
|
|
|
|
import XMonad.Layout.MultiToggle
|
|
|
|
|
import XMonad.Layout.MultiToggle.Instances
|
|
|
|
|
import XMonad.Layout.NoBorders
|
2016-11-20 21:05:40 -08:00
|
|
|
|
import qualified XMonad.Layout.Renamed as RN
|
2016-11-24 18:33:49 -08:00
|
|
|
|
import XMonad.Layout.Spacing
|
2017-01-04 16:35:51 -08:00
|
|
|
|
import XMonad.Layout.Tabbed
|
2016-09-16 12:50:53 -07:00
|
|
|
|
import qualified XMonad.StackSet as W
|
2016-11-24 18:33:49 -08:00
|
|
|
|
import XMonad.Util.CustomKeys
|
2016-11-11 16:13:16 -08:00
|
|
|
|
import qualified XMonad.Util.Dmenu as DM
|
2016-10-22 17:17:25 -07:00
|
|
|
|
import qualified XMonad.Util.ExtensibleState as XS
|
2016-11-24 18:33:49 -08:00
|
|
|
|
import XMonad.Util.Minimize
|
|
|
|
|
import XMonad.Util.NamedScratchpad
|
2016-11-24 15:26:43 -08:00
|
|
|
|
(NamedScratchpad(NS), nonFloating, namedScratchpadAction)
|
2016-11-24 18:33:49 -08:00
|
|
|
|
import XMonad.Util.NamedWindows (getName)
|
2017-03-31 22:36:15 -07:00
|
|
|
|
import XMonad.Util.Run
|
2016-09-14 16:56:37 -07:00
|
|
|
|
|
2016-11-25 18:48:14 -08:00
|
|
|
|
main =
|
2017-01-31 04:14:07 -08:00
|
|
|
|
xmonad . docks . pagerHints . ewmh $
|
|
|
|
|
def
|
2016-11-25 18:48:14 -08:00
|
|
|
|
{ modMask = mod4Mask
|
2017-05-22 18:29:23 -07:00
|
|
|
|
, terminal = "termite"
|
2016-12-01 16:23:30 -08:00
|
|
|
|
, manageHook = myManageHook <+> manageHook def
|
2016-11-25 18:48:14 -08:00
|
|
|
|
, layoutHook = myLayoutHook
|
2016-12-26 01:05:04 -08:00
|
|
|
|
, borderWidth = 0
|
2016-12-24 23:58:23 -08:00
|
|
|
|
, normalBorderColor = "#000000"
|
|
|
|
|
, focusedBorderColor = "#455a64"
|
2016-11-26 22:10:11 -08:00
|
|
|
|
, logHook =
|
2017-01-31 04:14:07 -08:00
|
|
|
|
updatePointer (0.5, 0.5) (0, 0) +++
|
2017-04-14 19:21:54 -07:00
|
|
|
|
toggleFadeInactiveLogHook 0.9 +++ workspaceHistoryHook
|
2017-01-31 04:14:07 -08:00
|
|
|
|
, handleEventHook =
|
|
|
|
|
fullscreenEventHook +++ followIfNoMagicFocus +++ minimizeEventHook
|
|
|
|
|
, startupHook = myStartup
|
2016-11-25 18:48:14 -08:00
|
|
|
|
, keys = customKeys (const []) addKeys
|
|
|
|
|
}
|
|
|
|
|
where
|
2016-10-26 13:23:44 -07:00
|
|
|
|
x +++ y = mappend y x
|
2016-11-25 14:06:32 -08:00
|
|
|
|
|
|
|
|
|
-- Utility functions
|
|
|
|
|
|
2017-04-14 19:21:54 -07:00
|
|
|
|
-- Log to a file from anywhere
|
|
|
|
|
writeToHomeDirLog stuff = io $ getLogFile >>= flip appendFile (stuff ++ "\n")
|
|
|
|
|
where getLogFile = (</> "temp" </> "xmonad.log") <$> getHomeDirectory
|
|
|
|
|
|
2017-05-07 23:35:01 -07:00
|
|
|
|
xRunCommand cmd = void $ io $ readCreateProcess (shell cmd) ""
|
|
|
|
|
|
2017-03-31 22:34:47 -07:00
|
|
|
|
(<..>) :: Functor f => (a -> b) -> f (f a) -> f (f b)
|
|
|
|
|
(<..>) = fmap . fmap
|
2016-11-29 15:46:51 -08:00
|
|
|
|
|
2016-11-25 18:39:27 -08:00
|
|
|
|
forkM :: Monad m => (i -> m a) -> (i -> m b) -> i -> m (a, b)
|
|
|
|
|
forkM a b input = do
|
2016-11-25 14:06:32 -08:00
|
|
|
|
resA <- a input
|
|
|
|
|
resB <- b input
|
|
|
|
|
return (resA, resB)
|
|
|
|
|
|
|
|
|
|
tee :: Monad m => (i -> m a) -> (i -> m b) -> i -> m a
|
2016-11-25 18:39:27 -08:00
|
|
|
|
tee = (fmap . fmap . fmap) (fmap fst) forkM
|
2016-11-25 14:06:32 -08:00
|
|
|
|
|
|
|
|
|
(>>=/) :: Monad m => m a -> (a -> m b) -> m a
|
|
|
|
|
(>>=/) a = (a >>=) . tee return
|
|
|
|
|
|
|
|
|
|
findM :: (Monad m) => (a -> m (Maybe b)) -> [a] -> m (Maybe b)
|
|
|
|
|
findM f = runMaybeT . msum . map (MaybeT . f)
|
2016-11-25 18:38:32 -08:00
|
|
|
|
|
|
|
|
|
if' :: Bool -> a -> a -> a
|
|
|
|
|
if' True x _ = x
|
|
|
|
|
if' False _ y = y
|
|
|
|
|
|
2016-11-29 18:25:28 -08:00
|
|
|
|
ifL :: a -> a -> Bool -> a
|
|
|
|
|
ifL a b c = if' c a b
|
|
|
|
|
|
2017-04-12 18:00:01 -07:00
|
|
|
|
infixl 4 <$$>
|
|
|
|
|
(<$$>) :: Functor f => f (a -> b) -> a -> f b
|
|
|
|
|
functor <$$> value = ($ value) <$> functor
|
|
|
|
|
|
2016-11-26 12:47:44 -08:00
|
|
|
|
toggleInMap' :: Ord k => Bool -> k -> M.Map k Bool -> M.Map k Bool
|
2016-11-25 18:41:16 -08:00
|
|
|
|
toggleInMap' d k m =
|
|
|
|
|
let existingValue = M.findWithDefault d k m
|
2016-11-25 18:56:07 -08:00
|
|
|
|
in M.insert k (not existingValue) m
|
2016-11-25 18:41:16 -08:00
|
|
|
|
|
2016-11-26 12:47:44 -08:00
|
|
|
|
toggleInMap :: Ord k => k -> M.Map k Bool -> M.Map k Bool
|
2016-11-25 18:41:16 -08:00
|
|
|
|
toggleInMap = toggleInMap' True
|
|
|
|
|
|
|
|
|
|
maybeRemap k = M.findWithDefault k k
|
2016-11-26 18:04:48 -08:00
|
|
|
|
|
|
|
|
|
(<$.>) :: Functor f => (b -> c) -> (a -> f b) -> a -> f c
|
|
|
|
|
(<$.>) l r = fmap l . r
|
2016-11-29 15:46:08 -08:00
|
|
|
|
|
2016-11-29 18:25:28 -08:00
|
|
|
|
withFocusedR f = withWindowSet (f . W.peek)
|
|
|
|
|
|
2016-11-29 22:47:44 -06:00
|
|
|
|
withFocusedD d f = maybe (return d) f <$> withWindowSet (return . W.peek)
|
2016-11-29 20:19:48 -08:00
|
|
|
|
|
2017-02-01 16:34:43 -08:00
|
|
|
|
withWorkspaceR f = withWindowSet $ f . W.workspace . W.current
|
|
|
|
|
|
2016-11-29 22:47:44 -06:00
|
|
|
|
mapP = mapP' id
|
2016-11-29 20:19:48 -08:00
|
|
|
|
|
2016-11-29 22:47:44 -06:00
|
|
|
|
mapP' f f' = map (f A.&&& f')
|
2017-02-01 16:34:43 -08:00
|
|
|
|
|
|
|
|
|
minimizedWindows = withMinimized return
|
|
|
|
|
|
2017-03-31 22:34:47 -07:00
|
|
|
|
visibleWindows =
|
|
|
|
|
(\\) <$> withWorkspaceR (return . W.integrate' . W.stack)
|
|
|
|
|
<*> minimizedWindows
|
2017-05-19 00:52:37 -07:00
|
|
|
|
|
|
|
|
|
followingWindow action = do
|
|
|
|
|
orig <- withWindowSet (return . W.peek)
|
2017-05-30 14:48:52 -07:00
|
|
|
|
_ <- action
|
|
|
|
|
whenJust orig $ windows . W.focusWindow
|
2016-11-09 17:29:45 -08:00
|
|
|
|
|
|
|
|
|
-- Selectors
|
|
|
|
|
|
2016-10-26 15:19:49 -07:00
|
|
|
|
isHangoutsTitle = isPrefixOf "Google Hangouts"
|
2017-02-20 17:10:27 -08:00
|
|
|
|
isChromeClass = isInfixOf "chrome"
|
|
|
|
|
chromeSelectorBase = isChromeClass <$> className
|
2016-11-21 15:52:23 -08:00
|
|
|
|
|
2017-02-20 17:10:27 -08:00
|
|
|
|
chromeSelector = chromeSelectorBase <&&> (not . isHangoutsTitle) <$> title
|
2016-10-26 15:19:49 -07:00
|
|
|
|
spotifySelector = className =? "Spotify"
|
|
|
|
|
emacsSelector = className =? "Emacs"
|
2016-10-31 17:40:33 -07:00
|
|
|
|
transmissionSelector = fmap (isPrefixOf "Transmission") title
|
2016-11-21 15:52:23 -08:00
|
|
|
|
hangoutsSelector = chromeSelectorBase <&&> fmap isHangoutsTitle title
|
2016-12-20 17:37:23 -08:00
|
|
|
|
volumeSelector = className =? "Pavucontrol"
|
2017-01-16 21:29:24 -08:00
|
|
|
|
keepassSelector = className =? "keepassxc"
|
2016-10-26 15:19:49 -07:00
|
|
|
|
|
2016-11-29 15:47:24 -08:00
|
|
|
|
virtualClasses =
|
|
|
|
|
[ (hangoutsSelector, "Hangouts")
|
|
|
|
|
, (chromeSelector, "Chrome")
|
|
|
|
|
, (transmissionSelector, "Transmission")
|
|
|
|
|
]
|
2016-11-09 17:29:45 -08:00
|
|
|
|
|
2016-11-21 23:45:30 -06:00
|
|
|
|
-- Commands
|
|
|
|
|
|
|
|
|
|
hangoutsCommand = "start_hangouts.sh"
|
|
|
|
|
spotifyCommand = "spotify"
|
2017-02-20 17:10:27 -08:00
|
|
|
|
chromeCommand = "google-chrome-unstable"
|
2016-11-21 23:45:30 -06:00
|
|
|
|
emacsCommand = "emacsclient -c"
|
2017-01-16 21:14:49 -08:00
|
|
|
|
htopCommand = "urxvt -e htop"
|
2016-11-21 23:45:30 -06:00
|
|
|
|
transmissionCommand = "transmission-gtk"
|
2016-12-20 17:37:23 -08:00
|
|
|
|
volumeCommand = "pavucontrol"
|
2017-01-16 21:29:24 -08:00
|
|
|
|
keepassCommand = "systemctl --user restart keepassx.service"
|
2017-01-31 04:14:07 -08:00
|
|
|
|
taffybarCommand = "restart_taffybar.sh"
|
2016-11-21 23:45:30 -06:00
|
|
|
|
|
2016-11-10 18:05:50 -08:00
|
|
|
|
-- Startup hook
|
|
|
|
|
|
2016-11-30 13:09:15 -06:00
|
|
|
|
tvScreenId :: ScreenId
|
2016-11-30 15:55:33 -08:00
|
|
|
|
tvScreenId = 1
|
2016-11-30 13:09:15 -06:00
|
|
|
|
|
|
|
|
|
disableTVFading = setFading (Just tvScreenId) False
|
|
|
|
|
|
|
|
|
|
hostNameToAction =
|
2017-05-11 18:17:45 -07:00
|
|
|
|
M.fromList [ ("imalison-arch", disableTVFading)
|
2016-11-30 13:09:15 -06:00
|
|
|
|
, ("imalison-uber-loaner", return ())
|
|
|
|
|
]
|
|
|
|
|
|
|
|
|
|
myStartup = do
|
|
|
|
|
spawn "systemctl --user start wm.target"
|
|
|
|
|
hostName <- io getHostName
|
|
|
|
|
M.findWithDefault (return ()) hostName hostNameToAction
|
2016-11-09 17:29:45 -08:00
|
|
|
|
|
|
|
|
|
-- Manage hook
|
2016-10-26 15:19:49 -07:00
|
|
|
|
|
2016-11-25 18:48:14 -08:00
|
|
|
|
myManageHook =
|
2017-03-10 15:09:28 -08:00
|
|
|
|
composeOne
|
|
|
|
|
[ isFullscreen -?> doFullFloat
|
|
|
|
|
-- [transmissionSelector --> doShift "5"]
|
2016-11-25 18:48:14 -08:00
|
|
|
|
-- Hangouts being on a separate workspace freezes chrome
|
|
|
|
|
-- , [ hangoutsSelector --> doShift "2"]
|
|
|
|
|
]
|
2016-11-09 17:29:45 -08:00
|
|
|
|
|
2016-11-11 15:48:17 -08:00
|
|
|
|
-- Toggles
|
2016-11-24 17:15:57 -06:00
|
|
|
|
|
2016-11-11 15:48:17 -08:00
|
|
|
|
unmodifyLayout (ModifiedLayout _ x') = x'
|
|
|
|
|
|
2016-11-25 18:48:14 -08:00
|
|
|
|
selectLimit =
|
|
|
|
|
DM.menuArgs "rofi" ["-dmenu", "-i"] ["2", "3", "4"] >>= (setLimit . read)
|
2016-11-11 16:13:16 -08:00
|
|
|
|
|
2016-11-29 15:47:24 -08:00
|
|
|
|
data MyToggles
|
|
|
|
|
= LIMIT
|
|
|
|
|
| GAPS
|
|
|
|
|
| MAGICFOCUS
|
|
|
|
|
deriving (Read, Show, Eq, Typeable)
|
2016-11-11 15:48:17 -08:00
|
|
|
|
|
|
|
|
|
instance Transformer MyToggles Window where
|
2016-11-25 18:48:14 -08:00
|
|
|
|
transform LIMIT x k = k (limitSlice 2 x) unmodifyLayout
|
2017-05-11 18:17:45 -07:00
|
|
|
|
transform GAPS x k = k (smartSpacing 5 x) unmodifyLayout
|
2016-11-25 18:48:14 -08:00
|
|
|
|
transform MAGICFOCUS x k = k (magicFocus x) unmodifyLayout
|
2016-11-11 15:48:17 -08:00
|
|
|
|
|
2017-05-11 18:17:45 -07:00
|
|
|
|
myToggles = [LIMIT, GAPS, MAGICFOCUS]
|
2016-11-21 10:50:08 -08:00
|
|
|
|
otherToggles = [NBFULL, MIRROR]
|
2016-11-11 15:48:17 -08:00
|
|
|
|
|
2017-05-19 00:50:51 -07:00
|
|
|
|
currentWorkspace = W.workspace . W.current <$> gets windowset
|
|
|
|
|
isToggleActiveInCurrent t = currentWorkspace >>= isToggleActive t
|
|
|
|
|
|
2016-11-25 18:48:14 -08:00
|
|
|
|
followIfNoMagicFocus =
|
2017-05-19 00:50:51 -07:00
|
|
|
|
followOnlyIf $ maybe False not <$> isToggleActiveInCurrent MAGICFOCUS
|
2016-11-25 18:48:14 -08:00
|
|
|
|
|
2017-05-11 18:17:45 -07:00
|
|
|
|
togglesMap =
|
2016-11-25 18:48:14 -08:00
|
|
|
|
fmap M.fromList $ sequence $
|
2016-11-29 15:47:24 -08:00
|
|
|
|
map toggleTuple myToggles ++ map toggleTuple otherToggles
|
2016-11-25 18:48:14 -08:00
|
|
|
|
where
|
|
|
|
|
toggleTuple toggle =
|
|
|
|
|
fmap (\str -> (str, Toggle toggle)) (toggleToStringWithState toggle)
|
2016-11-24 16:39:09 -08:00
|
|
|
|
|
2016-11-25 18:48:14 -08:00
|
|
|
|
toggleStateToString s =
|
|
|
|
|
case s of
|
|
|
|
|
Just True -> "ON"
|
|
|
|
|
Just False -> "OFF"
|
|
|
|
|
Nothing -> "N/A"
|
2016-11-21 15:53:00 -08:00
|
|
|
|
|
|
|
|
|
toggleToStringWithState :: (Transformer t Window, Show t) => t -> X String
|
2016-11-21 17:42:55 -08:00
|
|
|
|
toggleToStringWithState toggle =
|
2016-11-30 17:19:19 -06:00
|
|
|
|
printf "%s (%s)" (show toggle) . toggleStateToString <$>
|
2017-05-19 00:50:51 -07:00
|
|
|
|
isToggleActiveInCurrent toggle
|
2016-11-11 15:48:17 -08:00
|
|
|
|
|
2016-11-25 18:48:14 -08:00
|
|
|
|
selectToggle =
|
|
|
|
|
togglesMap >>= DM.menuMapArgs "rofi" ["-dmenu", "-i"] >>=
|
2017-05-11 18:17:45 -07:00
|
|
|
|
flip whenJust sendMessage
|
2016-11-21 15:53:00 -08:00
|
|
|
|
|
|
|
|
|
toggleInState :: (Transformer t Window) => t -> Maybe Bool -> X Bool
|
2017-05-19 00:50:51 -07:00
|
|
|
|
toggleInState t s = fmap (/= s) (isToggleActiveInCurrent t)
|
2016-11-21 15:53:00 -08:00
|
|
|
|
|
2016-11-21 17:42:55 -08:00
|
|
|
|
setToggleActive' toggle active =
|
2016-11-25 14:06:32 -08:00
|
|
|
|
toggleInState toggle (Just active) >>=/
|
|
|
|
|
flip when (sendMessage $ Toggle toggle)
|
2016-11-21 15:53:00 -08:00
|
|
|
|
|
|
|
|
|
-- Ambiguous type reference without signature
|
|
|
|
|
setToggleActive :: (Transformer t Window) => t -> Bool -> X ()
|
|
|
|
|
setToggleActive = (void .) . setToggleActive'
|
|
|
|
|
|
2016-11-21 17:25:56 -08:00
|
|
|
|
deactivateFull = setToggleActive NBFULL False
|
|
|
|
|
|
2016-11-25 18:48:14 -08:00
|
|
|
|
toggleOr toggle toState action =
|
|
|
|
|
setToggleActive' toggle toState >>= ((`when` action) . not)
|
2016-11-21 15:53:00 -08:00
|
|
|
|
|
|
|
|
|
deactivateFullOr = toggleOr NBFULL False
|
2016-11-21 17:25:56 -08:00
|
|
|
|
deactivateFullAnd action = sequence_ [deactivateFull, action]
|
2016-11-21 20:06:34 -08:00
|
|
|
|
|
|
|
|
|
andDeactivateFull action = sequence_ [action, deactivateFull]
|
2016-11-22 00:41:55 -06:00
|
|
|
|
|
|
|
|
|
goFullscreen = sendMessage $ Toggle NBFULL
|
2016-11-11 15:48:17 -08:00
|
|
|
|
|
2016-11-09 17:29:45 -08:00
|
|
|
|
-- Layout setup
|
2016-10-26 15:19:49 -07:00
|
|
|
|
|
2017-01-04 16:35:51 -08:00
|
|
|
|
myTabConfig =
|
|
|
|
|
def { activeBorderColor = "#66cccc" }
|
|
|
|
|
|
2016-11-20 21:05:40 -08:00
|
|
|
|
rename newName = RN.renamed [RN.Replace newName]
|
|
|
|
|
|
|
|
|
|
layoutsStart layout = (layout, [Layout layout])
|
|
|
|
|
(|||!) (joined, layouts) newLayout =
|
|
|
|
|
(joined ||| newLayout, layouts ++ [Layout newLayout])
|
|
|
|
|
|
2016-11-25 18:48:14 -08:00
|
|
|
|
layoutInfo =
|
|
|
|
|
layoutsStart (rename "Columns" $ multiCol [1, 1] 2 0.01 (-0.5)) |||!
|
|
|
|
|
rename "Large Main" (Tall 1 (3 / 100) (3 / 4)) |||!
|
|
|
|
|
rename "2 Columns" (Tall 1 (3 / 100) (1 / 2)) |||!
|
2017-01-04 16:35:51 -08:00
|
|
|
|
Accordion |||! simpleCross |||! myTabbed
|
|
|
|
|
where
|
|
|
|
|
myTabbed = tabbed shrinkText myTabConfig
|
2016-11-20 21:05:40 -08:00
|
|
|
|
|
|
|
|
|
layoutList = snd layoutInfo
|
|
|
|
|
|
|
|
|
|
layoutNames = [description layout | layout <- layoutList]
|
|
|
|
|
|
2016-11-25 18:48:14 -08:00
|
|
|
|
selectLayout =
|
|
|
|
|
DM.menuArgs "rofi" ["-dmenu", "-i"] layoutNames >>=
|
|
|
|
|
(sendMessage . JumpToLayout)
|
|
|
|
|
|
|
|
|
|
myLayoutHook =
|
2017-04-09 13:23:04 -07:00
|
|
|
|
avoidStruts .
|
|
|
|
|
minimize .
|
|
|
|
|
boringAuto .
|
|
|
|
|
mkToggle1 MIRROR .
|
|
|
|
|
mkToggle1 LIMIT .
|
2017-05-11 18:17:45 -07:00
|
|
|
|
mkToggle1 GAPS .
|
2017-04-09 13:23:04 -07:00
|
|
|
|
mkToggle1 MAGICFOCUS .
|
|
|
|
|
mkToggle1 NBFULL .
|
|
|
|
|
workspaceNamesHook .
|
2017-03-10 16:35:15 -08:00
|
|
|
|
lessBorders Screen $ fst layoutInfo
|
2016-11-09 17:29:45 -08:00
|
|
|
|
|
2016-10-26 15:19:49 -07:00
|
|
|
|
-- WindowBringer
|
|
|
|
|
|
2016-11-11 10:47:20 -08:00
|
|
|
|
myWindowBringerConfig =
|
2017-02-01 16:34:43 -08:00
|
|
|
|
def { menuCommand = "rofi"
|
|
|
|
|
, menuArgs = ["-dmenu", "-i"]
|
|
|
|
|
, windowTitler = myDecorateName
|
|
|
|
|
}
|
2016-10-26 15:19:49 -07:00
|
|
|
|
|
2016-11-25 15:09:07 -08:00
|
|
|
|
classIfMatches window entry =
|
2016-11-26 09:53:47 -08:00
|
|
|
|
if' <$> runQuery (fst entry) window <*>
|
|
|
|
|
pure (Just $ snd entry) <*>
|
|
|
|
|
pure Nothing
|
2016-11-25 15:09:07 -08:00
|
|
|
|
|
|
|
|
|
getClassRaw w = fmap resClass $ withDisplay $ io . flip getClassHint w
|
|
|
|
|
|
|
|
|
|
getVirtualClass = flip findM virtualClasses . classIfMatches
|
|
|
|
|
|
|
|
|
|
getClass w = fromMaybe <$> getClassRaw w <*> getVirtualClass w
|
2016-10-21 21:58:14 -07:00
|
|
|
|
|
2016-10-20 17:58:25 -07:00
|
|
|
|
myDecorateName ws w = do
|
|
|
|
|
name <- show <$> getName w
|
2016-10-21 21:58:14 -07:00
|
|
|
|
classTitle <- getClass w
|
2016-10-22 17:16:52 -07:00
|
|
|
|
workspaceToName <- getWorkspaceNames
|
2016-10-27 04:07:45 -07:00
|
|
|
|
return $ printf "%-20s%-40s %+30s" classTitle (take 40 name)
|
2016-11-30 17:18:59 -06:00
|
|
|
|
"in " ++ workspaceToName (W.tag ws)
|
2016-11-21 17:25:13 -08:00
|
|
|
|
|
2017-03-31 22:36:15 -07:00
|
|
|
|
data ChromeInfo = ChromeInfo { tabId :: Int
|
|
|
|
|
, tabUri :: String
|
|
|
|
|
, tabTitle :: String
|
|
|
|
|
} deriving (Eq, Show)
|
|
|
|
|
|
|
|
|
|
getChromeTabInfo = do
|
|
|
|
|
output <- runProcessWithInput "chromix-too" ["ls"] ""
|
|
|
|
|
return $ M.fromList $ map parseChromixLine $ lines output
|
|
|
|
|
where parseChromixLine line =
|
|
|
|
|
case splitOn " " line of
|
2017-05-30 14:48:52 -07:00
|
|
|
|
[] -> undefined
|
2017-03-31 22:36:15 -07:00
|
|
|
|
tid:uri:rest -> let ttl = concat rest in
|
|
|
|
|
(printf "%s - %s" tid ttl :: String,
|
|
|
|
|
ChromeInfo { tabId = read tid
|
|
|
|
|
, tabUri = uri
|
|
|
|
|
, tabTitle = ttl
|
|
|
|
|
})
|
2017-05-30 14:48:52 -07:00
|
|
|
|
[_] -> undefined
|
2017-03-31 22:36:15 -07:00
|
|
|
|
|
|
|
|
|
selectChromeTab WindowBringerConfig { menuCommand = cmd
|
|
|
|
|
, menuArgs = args
|
|
|
|
|
} =
|
|
|
|
|
liftIO getChromeTabInfo >>= void . DM.menuMapArgs cmd args
|
|
|
|
|
|
|
|
|
|
chromeTabAction doSplit action selected =
|
|
|
|
|
case selected of
|
|
|
|
|
Left wid -> action wid
|
|
|
|
|
Right ChromeInfo { tabId = tid } ->
|
|
|
|
|
liftIO $ do
|
|
|
|
|
let command = if doSplit then
|
2017-05-19 00:51:35 -07:00
|
|
|
|
"split_tab_by_id.sh %s"
|
2017-03-31 22:36:15 -07:00
|
|
|
|
else
|
2017-05-19 00:51:35 -07:00
|
|
|
|
"focus_tab_by_id.sh %s"
|
|
|
|
|
spawn $ printf command $ show tid
|
2017-03-31 22:36:15 -07:00
|
|
|
|
return ()
|
2017-03-28 17:57:25 -07:00
|
|
|
|
|
|
|
|
|
-- This needs access to X in order to unminimize, which means that it can't be
|
2016-11-21 23:26:52 -08:00
|
|
|
|
-- done with the existing window bringer interface
|
2017-03-31 22:36:15 -07:00
|
|
|
|
myWindowAct c@WindowBringerConfig { menuCommand = cmd
|
|
|
|
|
, menuArgs = args
|
|
|
|
|
} action =
|
2017-02-01 16:34:43 -08:00
|
|
|
|
do
|
|
|
|
|
visible <- visibleWindows
|
2017-03-31 22:36:15 -07:00
|
|
|
|
ws <- windowMap' c { windowFilter = not . flip elem visible }
|
2017-05-07 23:35:01 -07:00
|
|
|
|
chromeTabs <- liftIO getChromeTabInfo
|
2017-03-31 22:36:15 -07:00
|
|
|
|
let options = M.union (M.map Left ws) (M.map Right chromeTabs)
|
|
|
|
|
selection <- DM.menuMapArgs cmd args options
|
|
|
|
|
whenJust selection action
|
2017-02-01 16:34:43 -08:00
|
|
|
|
|
2017-03-31 22:36:15 -07:00
|
|
|
|
doBringWindow window =
|
|
|
|
|
maximizeWindow window >> windows (W.focusWindow window . bringWindow window)
|
2017-02-01 16:34:43 -08:00
|
|
|
|
|
2017-03-31 22:36:15 -07:00
|
|
|
|
myWindowAction = andDeactivateFull . maybeUnminimizeAfter .
|
|
|
|
|
myWindowAct myWindowBringerConfig
|
|
|
|
|
|
|
|
|
|
myGoToWindow =
|
|
|
|
|
myWindowAction $ chromeTabAction False $ windows . greedyFocusWindow
|
|
|
|
|
|
|
|
|
|
myBringWindow = myWindowAction $ chromeTabAction True doBringWindow
|
|
|
|
|
|
|
|
|
|
myReplaceWindow =
|
2017-04-09 13:23:04 -07:00
|
|
|
|
swapMinimizeStateAfter $
|
|
|
|
|
myWindowAct myWindowBringerConfig $
|
|
|
|
|
chromeTabAction True (windows . swapFocusedWith)
|
2016-11-09 17:29:45 -08:00
|
|
|
|
|
2017-02-01 16:34:12 -08:00
|
|
|
|
-- Dynamic Workspace Renaming
|
|
|
|
|
|
|
|
|
|
windowClassFontAwesomeFile =
|
|
|
|
|
fmap (</> ".lib/resources/window_class_to_fontawesome.json") getHomeDirectory
|
|
|
|
|
|
|
|
|
|
getClassRemap =
|
|
|
|
|
fmap (fromMaybe M.empty . decode) $
|
|
|
|
|
windowClassFontAwesomeFile >>= B.readFile
|
|
|
|
|
|
|
|
|
|
getClassRemapF = flip maybeRemap <$> getClassRemap
|
|
|
|
|
getWSClassNames' w = mapM getClass $ W.integrate' $ W.stack w
|
|
|
|
|
getWSClassNames w = io (fmap map getClassRemapF) <*> getWSClassNames' w
|
2017-04-14 19:21:54 -07:00
|
|
|
|
currentWSName ws = fromMaybe "" <$> (getWorkspaceNames' <$$> W.tag ws)
|
2017-02-01 16:34:12 -08:00
|
|
|
|
desiredWSName = (intercalate "|" <$>) . getWSClassNames
|
|
|
|
|
|
|
|
|
|
setWorkspaceNameToFocusedWindow workspace = do
|
|
|
|
|
currentName <- currentWSName workspace
|
|
|
|
|
newName <- desiredWSName workspace
|
|
|
|
|
when (currentName /= newName) $ setWorkspaceName (W.tag workspace) newName
|
|
|
|
|
|
|
|
|
|
setWorkspaceNames =
|
|
|
|
|
gets windowset >>= mapM_ setWorkspaceNameToFocusedWindow . W.workspaces
|
|
|
|
|
|
|
|
|
|
data WorkspaceNamesHook a = WorkspaceNamesHook deriving (Show, Read)
|
|
|
|
|
|
|
|
|
|
instance LayoutModifier WorkspaceNamesHook Window where
|
|
|
|
|
hook _ = setWorkspaceNames
|
|
|
|
|
|
|
|
|
|
workspaceNamesHook = ModifiedLayout WorkspaceNamesHook
|
|
|
|
|
|
2016-10-27 00:17:42 -07:00
|
|
|
|
-- Toggleable fade
|
|
|
|
|
|
2016-11-26 12:47:44 -08:00
|
|
|
|
newtype ToggleFade a =
|
|
|
|
|
ToggleFade { fadesMap :: M.Map a Bool }
|
2016-11-25 17:58:48 -08:00
|
|
|
|
deriving (Typeable, Read, Show)
|
2016-10-27 00:17:42 -07:00
|
|
|
|
|
2017-04-09 13:23:04 -07:00
|
|
|
|
instance (Typeable a, Read a, Show a, Ord a) =>
|
|
|
|
|
ExtensionClass (ToggleFade a) where
|
2016-11-25 17:58:48 -08:00
|
|
|
|
initialValue = ToggleFade M.empty
|
|
|
|
|
extensionType = PersistentExtension
|
|
|
|
|
|
2016-11-26 12:47:44 -08:00
|
|
|
|
fadeEnabledFor query =
|
|
|
|
|
M.findWithDefault True <$> query <*> liftX (fadesMap <$> XS.get)
|
|
|
|
|
|
|
|
|
|
fadeEnabledForWindow = fadeEnabledFor ask
|
|
|
|
|
fadeEnabledForWorkspace = fadeEnabledFor getWindowWorkspace
|
2016-11-30 13:09:15 -06:00
|
|
|
|
fadeEnabledForScreen = fadeEnabledFor getWindowScreen
|
2016-11-26 12:47:44 -08:00
|
|
|
|
|
2016-11-29 20:19:48 -08:00
|
|
|
|
getScreens = withWindowSet $ return . W.screens
|
2016-11-26 12:47:44 -08:00
|
|
|
|
getWindowWorkspace' = W.findTag <$> ask <*> liftX (withWindowSet return)
|
|
|
|
|
getWindowWorkspace = flip fromMaybe <$> getWindowWorkspace' <*> pure "1"
|
2017-04-09 13:23:04 -07:00
|
|
|
|
getWorkspaceToScreen =
|
|
|
|
|
M.fromList . mapP' (W.tag . W.workspace) W.screen <$> getScreens
|
2016-11-29 20:19:48 -08:00
|
|
|
|
getWindowScreen = M.lookup <$> getWindowWorkspace <*> liftX getWorkspaceToScreen
|
2016-11-30 13:09:15 -06:00
|
|
|
|
getCurrentScreen = join (withFocusedD Nothing (runQuery getWindowScreen))
|
2016-11-25 17:58:48 -08:00
|
|
|
|
|
2016-11-30 17:18:31 -06:00
|
|
|
|
fadeCondition =
|
|
|
|
|
isUnfocused <&&> fadeEnabledForWindow <&&>
|
|
|
|
|
fadeEnabledForWorkspace <&&> fadeEnabledForScreen
|
|
|
|
|
|
|
|
|
|
toggleFadeInactiveLogHook = fadeOutLogHook . fadeIf fadeCondition
|
2016-11-25 17:58:48 -08:00
|
|
|
|
|
|
|
|
|
toggleFadingForActiveWindow = withWindowSet $
|
2016-11-29 20:18:53 -08:00
|
|
|
|
maybe (return ()) toggleFading . W.peek
|
2016-11-25 17:58:48 -08:00
|
|
|
|
|
2016-11-26 12:47:44 -08:00
|
|
|
|
toggleFadingForActiveWorkspace =
|
2016-11-29 20:18:53 -08:00
|
|
|
|
withWindowSet $ \ws -> toggleFading $ W.currentTag ws
|
2016-11-26 12:47:44 -08:00
|
|
|
|
|
2016-11-30 13:09:15 -06:00
|
|
|
|
toggleFadingForActiveScreen = getCurrentScreen >>= toggleFading
|
|
|
|
|
|
2016-11-29 20:18:53 -08:00
|
|
|
|
toggleFading w = setFading' $ toggleInMap w
|
|
|
|
|
|
|
|
|
|
setFading w f = setFading' $ M.insert w f
|
|
|
|
|
|
|
|
|
|
setFading' f =
|
|
|
|
|
fmap (ToggleFade . f . fadesMap) XS.get >>= XS.put
|
2016-11-09 17:29:45 -08:00
|
|
|
|
|
2016-11-08 01:40:10 -08:00
|
|
|
|
-- Minimize not in class
|
|
|
|
|
|
2016-11-24 15:21:47 -08:00
|
|
|
|
restoreFocus action =
|
|
|
|
|
withFocused $ \orig -> action >> windows (W.focusWindow orig)
|
2016-11-10 15:23:37 -08:00
|
|
|
|
|
2016-11-11 15:48:47 -08:00
|
|
|
|
getCurrentWS = W.stack . W.workspace . W.current
|
|
|
|
|
|
2016-11-24 15:21:47 -08:00
|
|
|
|
withWorkspace f = withWindowSet $ \ws -> maybe (return ()) f (getCurrentWS ws)
|
2016-11-08 01:40:10 -08:00
|
|
|
|
|
2016-11-29 18:25:28 -08:00
|
|
|
|
currentWS = withWindowSet $ return . getCurrentWS
|
|
|
|
|
|
2016-11-29 22:47:44 -06:00
|
|
|
|
workspaceWindows = maybe [] W.integrate <$> currentWS
|
2016-11-29 18:25:28 -08:00
|
|
|
|
|
|
|
|
|
getMinMaxWindows =
|
|
|
|
|
partition <$> (flip elem <$> minimizedWindows) <*> workspaceWindows
|
|
|
|
|
|
|
|
|
|
maximizedWindows = fmap snd getMinMaxWindows
|
|
|
|
|
|
|
|
|
|
maximizedOtherClass =
|
|
|
|
|
intersect <$> maximizedWindows <*>
|
|
|
|
|
(currentWS >>= maybe (return []) windowsWithUnfocusedClass)
|
|
|
|
|
|
2016-12-28 21:38:48 -08:00
|
|
|
|
minimizedSameClass =
|
|
|
|
|
intersect <$> minimizedWindows <*>
|
|
|
|
|
(currentWS >>= maybe (return []) windowsWithFocusedClass)
|
|
|
|
|
|
2016-11-29 18:25:28 -08:00
|
|
|
|
getClassMatchesWindow w = (==) <$> getClass w
|
|
|
|
|
getClassMatchesCurrent = join $ withFocusedD (`seq` False) getClassMatchesWindow
|
|
|
|
|
|
2016-11-11 12:06:03 -08:00
|
|
|
|
minimizeOtherClassesInWorkspace =
|
2016-11-29 15:47:24 -08:00
|
|
|
|
actOnWindowsInWorkspace minimizeWindow windowsWithUnfocusedClass
|
2016-11-11 12:06:03 -08:00
|
|
|
|
maximizeSameClassesInWorkspace =
|
2016-11-29 15:47:24 -08:00
|
|
|
|
actOnWindowsInWorkspace maybeUnminimize windowsWithFocusedClass
|
2016-11-11 12:06:03 -08:00
|
|
|
|
|
|
|
|
|
-- Type annotation is needed to resolve ambiguity
|
2016-11-26 09:54:12 -08:00
|
|
|
|
actOnWindowsInWorkspace :: (Window -> X ())
|
|
|
|
|
-> (W.Stack Window -> X [Window])
|
|
|
|
|
-> X ()
|
2016-11-11 12:06:03 -08:00
|
|
|
|
actOnWindowsInWorkspace windowAction getWindowsAction = restoreFocus $
|
|
|
|
|
withWorkspace (getWindowsAction >=> mapM_ windowAction)
|
|
|
|
|
|
2017-04-14 21:08:11 -07:00
|
|
|
|
-- XXX: The idea behind this was that the normal fullscreen can be annoying if a
|
|
|
|
|
-- new window opens, but this behavior is even more annoying than that, so
|
|
|
|
|
-- nevermind
|
2017-04-14 19:37:30 -07:00
|
|
|
|
goFullscreenDWIM =
|
|
|
|
|
withWorkspace $ \ws -> do
|
|
|
|
|
wins <- windowsWithFocusedClass ws
|
|
|
|
|
if length wins > 1
|
|
|
|
|
then goFullscreen
|
|
|
|
|
else minimizeOtherClassesInWorkspace
|
|
|
|
|
|
2016-11-11 12:06:03 -08:00
|
|
|
|
windowsWithUnfocusedClass ws = windowsWithOtherClasses (W.focus ws) ws
|
|
|
|
|
windowsWithFocusedClass ws = windowsWithSameClass (W.focus ws) ws
|
2016-11-29 15:47:24 -08:00
|
|
|
|
windowsWithOtherClasses = windowsMatchingClassPredicate (/=)
|
|
|
|
|
windowsWithSameClass = windowsMatchingClassPredicate (==)
|
2016-11-11 12:06:03 -08:00
|
|
|
|
|
2016-11-29 15:47:24 -08:00
|
|
|
|
windowsMatchingClassPredicate predicate window workspace =
|
|
|
|
|
windowsSatisfyingPredicate workspace $ do
|
|
|
|
|
windowClass <- getClass window
|
|
|
|
|
return $ predicate windowClass
|
2016-11-11 12:06:03 -08:00
|
|
|
|
|
|
|
|
|
windowsSatisfyingPredicate workspace getPredicate = do
|
2016-11-29 15:47:24 -08:00
|
|
|
|
predicate <- getPredicate
|
|
|
|
|
filterM (\w -> predicate <$> getClass w) (W.integrate workspace)
|
2016-11-08 01:40:10 -08:00
|
|
|
|
|
2016-11-29 18:25:28 -08:00
|
|
|
|
getMatchingUnmatching =
|
|
|
|
|
partition <$> ((. snd) <$> getClassMatchesCurrent) <*> getWindowClassPairs
|
|
|
|
|
|
2016-11-29 22:47:44 -06:00
|
|
|
|
getWindowClassPairs = join $ mapM windowToClassPair <$> workspaceWindows
|
2016-11-29 18:25:28 -08:00
|
|
|
|
|
|
|
|
|
windowToClassPair w = (,) w <$> getClass w
|
|
|
|
|
|
2016-11-10 18:05:50 -08:00
|
|
|
|
windowIsMinimized w = do
|
|
|
|
|
minimized <- XS.gets minimizedStack
|
|
|
|
|
return $ w `elem` minimized
|
|
|
|
|
|
2016-11-11 12:06:03 -08:00
|
|
|
|
maybeUnminimize w = windowIsMinimized w >>= flip when (maximizeWindow w)
|
|
|
|
|
|
|
|
|
|
maybeUnminimizeFocused = withFocused maybeUnminimize
|
2016-11-10 18:05:50 -08:00
|
|
|
|
|
2016-11-11 12:13:31 -08:00
|
|
|
|
maybeUnminimizeAfter = (>> maybeUnminimizeFocused)
|
|
|
|
|
|
|
|
|
|
maybeUnminimizeClassAfter = (>> maximizeSameClassesInWorkspace)
|
2016-11-10 21:08:45 -08:00
|
|
|
|
|
2016-11-26 18:04:48 -08:00
|
|
|
|
sameClassOnly action =
|
|
|
|
|
action >> minimizeOtherClassesInWorkspace >> maximizeSameClassesInWorkspace
|
|
|
|
|
|
2017-03-10 16:06:16 -08:00
|
|
|
|
restoreAll = mapM_ maximizeWindow
|
2016-12-28 21:38:48 -08:00
|
|
|
|
|
|
|
|
|
restoreAllMinimized = minimizedWindows >>= restoreAll
|
2016-11-10 15:23:37 -08:00
|
|
|
|
|
2016-11-29 18:25:28 -08:00
|
|
|
|
restoreOrMinimizeOtherClasses = null <$> maximizedOtherClass >>=
|
|
|
|
|
ifL restoreAllMinimized minimizeOtherClassesInWorkspace
|
2016-11-26 18:04:48 -08:00
|
|
|
|
|
2017-03-10 16:06:16 -08:00
|
|
|
|
restoreThisClassOrMinimizeOtherClasses = minimizedSameClass >>= \ws ->
|
|
|
|
|
if' (null ws) minimizeOtherClassesInWorkspace $ restoreAll ws
|
2016-12-28 21:38:48 -08:00
|
|
|
|
|
2016-11-26 18:04:48 -08:00
|
|
|
|
getClassPair w = flip (,) w <$> getClass w
|
|
|
|
|
|
|
|
|
|
windowClassPairs = withWindowSet $ mapM getClassPair . W.allWindows
|
|
|
|
|
classToWindowMap = MM.fromList <$> windowClassPairs
|
|
|
|
|
allClasses = sort . MM.keys <$> classToWindowMap
|
|
|
|
|
thisClass = withWindowSet $ sequence . (getClass <$.> W.peek)
|
|
|
|
|
|
|
|
|
|
nextClass = do
|
|
|
|
|
classes <- allClasses
|
|
|
|
|
current <- thisClass
|
2017-04-12 18:00:01 -07:00
|
|
|
|
let index = join $ elemIndex <$> current <$$> classes
|
2016-11-26 18:04:48 -08:00
|
|
|
|
return $ fmap (\i -> cycle classes !! (i + 1)) index
|
|
|
|
|
|
|
|
|
|
classWindow c = do
|
|
|
|
|
m <- classToWindowMap
|
|
|
|
|
return $ join $ listToMaybe <$> (flip MM.lookup m <$> c)
|
|
|
|
|
|
|
|
|
|
nextClassWindow = nextClass >>= classWindow
|
|
|
|
|
|
2017-04-09 13:23:04 -07:00
|
|
|
|
focusNextClass' =
|
|
|
|
|
join $ windows . maybe id greedyFocusWindow <$> nextClassWindow
|
2016-11-26 18:04:48 -08:00
|
|
|
|
focusNextClass = sameClassOnly focusNextClass'
|
|
|
|
|
|
|
|
|
|
selectClass = join $ DM.menuArgs "rofi" ["-dmenu", "-i"] <$> allClasses
|
2016-11-09 17:29:45 -08:00
|
|
|
|
|
|
|
|
|
-- Window switching
|
|
|
|
|
|
2016-10-23 17:32:27 -07:00
|
|
|
|
-- Use greedyView to switch to the correct workspace, and then focus on the
|
|
|
|
|
-- appropriate window within that workspace.
|
2016-11-25 18:48:14 -08:00
|
|
|
|
greedyFocusWindow w ws =
|
|
|
|
|
W.focusWindow w $
|
|
|
|
|
W.greedyView (fromMaybe (W.currentTag ws) $ W.findTag w ws) ws
|
2016-10-23 01:34:31 -07:00
|
|
|
|
|
2016-11-03 13:06:59 -07:00
|
|
|
|
shiftThenView i = W.greedyView i . W.shift i
|
|
|
|
|
|
2016-11-25 11:46:36 -08:00
|
|
|
|
greedyBringWindow w = greedyFocusWindow w . bringWindow w
|
|
|
|
|
|
2016-11-25 18:48:14 -08:00
|
|
|
|
shiftToEmptyAndView =
|
|
|
|
|
doTo Next EmptyWS DWO.getSortByOrder (windows . shiftThenView)
|
2016-11-11 15:48:47 -08:00
|
|
|
|
|
2016-11-29 11:28:17 -08:00
|
|
|
|
setFocusedScreen :: ScreenId -> WindowSet -> WindowSet
|
|
|
|
|
setFocusedScreen to ws =
|
2016-11-29 22:47:44 -06:00
|
|
|
|
maybe ws (`setFocusedScreen'` ws) $ find ((to ==) . W.screen) (W.visible ws)
|
2016-11-29 11:28:17 -08:00
|
|
|
|
|
|
|
|
|
setFocusedScreen' to ws @ W.StackSet
|
|
|
|
|
{ W.current = prevCurr
|
|
|
|
|
, W.visible = visible
|
|
|
|
|
} = ws { W.current = to
|
2016-11-29 22:47:44 -06:00
|
|
|
|
, W.visible = prevCurr:deleteBy screenEq to visible
|
2016-11-29 11:28:17 -08:00
|
|
|
|
}
|
|
|
|
|
|
|
|
|
|
where screenEq a b = W.screen a == W.screen b
|
|
|
|
|
|
|
|
|
|
nextScreen ws @ W.StackSet { W.visible = visible } =
|
|
|
|
|
case visible of
|
|
|
|
|
next:_ -> setFocusedScreen (W.screen next) ws
|
|
|
|
|
_ -> ws
|
|
|
|
|
|
|
|
|
|
viewOtherScreen ws = W.greedyView ws . nextScreen
|
|
|
|
|
|
2016-11-29 22:47:44 -06:00
|
|
|
|
shiftThenViewOtherScreen ws w = viewOtherScreen ws . W.shiftWin ws w
|
2016-11-29 11:28:17 -08:00
|
|
|
|
|
|
|
|
|
shiftCurrentToWSOnOtherScreen ws s =
|
|
|
|
|
fromMaybe s (flip (shiftThenViewOtherScreen ws) s <$> W.peek s)
|
|
|
|
|
|
|
|
|
|
shiftToEmptyNextScreen =
|
|
|
|
|
doTo Next EmptyWS DWO.getSortByOrder $ windows . shiftCurrentToWSOnOtherScreen
|
|
|
|
|
|
2016-11-11 15:48:47 -08:00
|
|
|
|
swapFocusedWith w ws = W.modify' (swapFocusedWith' w) (W.delete' w ws)
|
|
|
|
|
|
|
|
|
|
swapFocusedWith' w (W.Stack current ls rs) = W.Stack w ls (rs ++ [current])
|
|
|
|
|
|
2016-11-25 18:48:14 -08:00
|
|
|
|
swapMinimizeStateAfter action =
|
2016-11-29 15:47:24 -08:00
|
|
|
|
withFocused $ \originalWindow -> do
|
2016-11-25 18:48:14 -08:00
|
|
|
|
_ <- action
|
2016-11-29 15:47:24 -08:00
|
|
|
|
restoreFocus $ do
|
|
|
|
|
maybeUnminimizeFocused
|
|
|
|
|
withFocused $ \newWindow ->
|
|
|
|
|
when (newWindow /= originalWindow) $ minimizeWindow originalWindow
|
2016-11-09 17:29:45 -08:00
|
|
|
|
|
2016-11-21 23:46:16 -06:00
|
|
|
|
-- Named Scratchpads
|
2016-11-24 17:15:57 -06:00
|
|
|
|
|
2016-11-29 15:47:24 -08:00
|
|
|
|
scratchpads =
|
2017-01-16 21:14:49 -08:00
|
|
|
|
[ NS "htop" htopCommand (title =? "htop") nonFloating
|
2016-11-29 15:47:24 -08:00
|
|
|
|
, NS "spotify" spotifyCommand spotifySelector nonFloating
|
|
|
|
|
, NS "hangouts" hangoutsCommand hangoutsSelector nonFloating
|
2016-12-20 17:37:23 -08:00
|
|
|
|
, NS "volume" volumeCommand volumeSelector nonFloating
|
2016-11-29 15:47:24 -08:00
|
|
|
|
]
|
2016-11-21 23:46:16 -06:00
|
|
|
|
|
2017-01-11 12:36:55 -08:00
|
|
|
|
-- TODO: This doesnt work well with minimized windows
|
2016-12-25 15:59:55 -08:00
|
|
|
|
doScratchpad =
|
|
|
|
|
maybeUnminimizeAfter . deactivateFullAnd . namedScratchpadAction scratchpads
|
2016-11-21 23:46:16 -06:00
|
|
|
|
|
2016-11-09 17:29:45 -08:00
|
|
|
|
-- Raise or spawn
|
|
|
|
|
|
2016-11-25 20:22:08 -08:00
|
|
|
|
myRaiseNextMaybe =
|
2016-12-28 21:38:48 -08:00
|
|
|
|
((deactivateFullAnd . maybeUnminimizeAfter) .) .
|
2016-11-25 20:22:08 -08:00
|
|
|
|
raiseNextMaybeCustomFocus greedyFocusWindow
|
|
|
|
|
|
|
|
|
|
myBringNextMaybe =
|
|
|
|
|
((deactivateFullAnd . maybeUnminimizeAfter) .) .
|
|
|
|
|
raiseNextMaybeCustomFocus greedyBringWindow
|
2016-10-26 18:11:18 -07:00
|
|
|
|
|
2017-04-09 13:23:04 -07:00
|
|
|
|
bindBringAndRaise :: KeyMask
|
|
|
|
|
-> KeySym
|
|
|
|
|
-> X ()
|
|
|
|
|
-> Query Bool
|
|
|
|
|
-> [((KeyMask, KeySym), X ())]
|
2016-10-26 18:11:18 -07:00
|
|
|
|
bindBringAndRaise mask sym start query =
|
2017-02-22 17:36:05 -08:00
|
|
|
|
[ ((mask, sym), doRaiseNext)
|
2016-11-26 18:04:48 -08:00
|
|
|
|
, ((mask .|. controlMask, sym), myBringNextMaybe start query)
|
2016-12-28 21:38:48 -08:00
|
|
|
|
, ((mask .|. shiftMask, sym), doRaiseNext)
|
2016-11-26 18:04:48 -08:00
|
|
|
|
]
|
|
|
|
|
where doRaiseNext = myRaiseNextMaybe start query
|
2016-10-26 18:11:18 -07:00
|
|
|
|
|
2017-04-09 13:23:04 -07:00
|
|
|
|
bindBringAndRaiseMany :: [(KeyMask, KeySym, X (), Query Bool)]
|
|
|
|
|
-> [((KeyMask, KeySym), X ())]
|
2016-10-26 18:11:18 -07:00
|
|
|
|
bindBringAndRaiseMany = concatMap (\(a, b, c, d) -> bindBringAndRaise a b c d)
|
2016-11-09 17:29:45 -08:00
|
|
|
|
|
2016-11-22 00:41:04 -08:00
|
|
|
|
-- Screen shift
|
2016-11-24 17:15:57 -06:00
|
|
|
|
|
2016-12-25 15:32:09 -08:00
|
|
|
|
shiftToNextScreen ws =
|
2016-11-22 00:41:04 -08:00
|
|
|
|
case W.visible ws of
|
2016-12-25 15:32:09 -08:00
|
|
|
|
W.Screen i _ _:_ -> W.view (W.tag i) $ W.shift (W.tag i) ws
|
|
|
|
|
_ -> ws
|
|
|
|
|
|
|
|
|
|
shiftToNextScreenX = windows shiftToNextScreen
|
2016-12-24 04:38:03 -08:00
|
|
|
|
|
2017-04-15 23:01:26 -07:00
|
|
|
|
getNextScreen ws =
|
|
|
|
|
minimumBy compareScreen candidates
|
|
|
|
|
where currentId = W.screen $ W.current ws
|
|
|
|
|
otherScreens = W.visible ws
|
2017-05-30 14:48:52 -07:00
|
|
|
|
largerId = filter ((> currentId) . W.screen) otherScreens
|
2017-04-15 23:01:26 -07:00
|
|
|
|
compareScreen a b = compare (W.screen a) (W.screen b)
|
|
|
|
|
candidates =
|
|
|
|
|
case largerId of
|
|
|
|
|
[] -> W.current ws:otherScreens -- Ensure a value will be selected
|
|
|
|
|
_ -> largerId
|
|
|
|
|
|
2016-12-25 15:32:09 -08:00
|
|
|
|
goToNextScreen ws =
|
2017-05-30 14:48:52 -07:00
|
|
|
|
if screenEq nScreen currScreen then ws
|
|
|
|
|
else ws { W.current = nScreen
|
2017-04-15 23:01:26 -07:00
|
|
|
|
, W.visible = currScreen : trimmedVisible
|
|
|
|
|
}
|
|
|
|
|
where
|
|
|
|
|
currScreen = W.current ws
|
2017-05-30 14:48:52 -07:00
|
|
|
|
nScreen = getNextScreen ws
|
2017-04-15 23:01:26 -07:00
|
|
|
|
screenEq a b = W.screen a == W.screen b
|
|
|
|
|
trimmedVisible =
|
2017-05-30 14:48:52 -07:00
|
|
|
|
filter (not . screenEq nScreen) $ W.visible ws
|
2016-12-25 15:32:09 -08:00
|
|
|
|
|
|
|
|
|
goToNextScreenX = windows goToNextScreen
|
2016-11-22 00:41:04 -08:00
|
|
|
|
|
2016-11-09 17:29:45 -08:00
|
|
|
|
-- Key bindings
|
|
|
|
|
|
2017-03-10 15:06:20 -08:00
|
|
|
|
addKeys conf@XConfig { modMask = modm } =
|
2016-12-24 19:37:34 -08:00
|
|
|
|
|
2016-12-28 19:41:57 -08:00
|
|
|
|
-- Specific program spawning
|
2016-12-24 19:37:34 -08:00
|
|
|
|
bindBringAndRaiseMany
|
|
|
|
|
[ (modalt, xK_e, spawn emacsCommand, emacsSelector)
|
|
|
|
|
, (modalt, xK_c, spawn chromeCommand, chromeSelector)
|
|
|
|
|
, (modalt, xK_t, spawn transmissionCommand, transmissionSelector)
|
|
|
|
|
] ++
|
|
|
|
|
|
|
|
|
|
-- ScratchPads
|
|
|
|
|
[ ((modalt, xK_m), doScratchpad "htop")
|
|
|
|
|
, ((modalt, xK_v), doScratchpad "volume")
|
|
|
|
|
, ((modalt, xK_h), doScratchpad "hangouts")
|
2017-05-19 13:23:35 -07:00
|
|
|
|
, ((modalt, xK_s), doScratchpad "spotify")
|
2016-12-24 19:39:58 -08:00
|
|
|
|
, ((modalt .|. controlMask, xK_h),
|
|
|
|
|
myRaiseNextMaybe (spawn hangoutsCommand) hangoutsSelector)
|
2016-12-28 20:35:50 -08:00
|
|
|
|
, ((modalt .|. controlMask, xK_s),
|
|
|
|
|
myRaiseNextMaybe (spawn spotifyCommand) spotifySelector)
|
2016-12-24 19:37:34 -08:00
|
|
|
|
|
|
|
|
|
-- Specific program spawning
|
|
|
|
|
|
|
|
|
|
, ((modm, xK_p), spawn "rofi -show drun")
|
2016-09-19 11:07:03 -07:00
|
|
|
|
, ((modm .|. shiftMask, xK_p), spawn "rofi -show run")
|
2016-12-24 19:37:34 -08:00
|
|
|
|
|
|
|
|
|
-- Window manipulation
|
|
|
|
|
|
2017-03-31 22:36:15 -07:00
|
|
|
|
, ((modm, xK_g), myGoToWindow)
|
|
|
|
|
, ((modm, xK_b), myBringWindow)
|
|
|
|
|
, ((modm .|. shiftMask, xK_b), myReplaceWindow)
|
2017-04-14 21:08:11 -07:00
|
|
|
|
, ((modm .|. controlMask, xK_space), deactivateFullOr goFullscreen)
|
2016-10-03 14:57:58 -07:00
|
|
|
|
, ((modm, xK_m), withFocused minimizeWindow)
|
2016-12-05 19:01:37 -08:00
|
|
|
|
, ((modm .|. shiftMask, xK_m),
|
|
|
|
|
deactivateFullOr $ withLastMinimized maximizeWindowAndFocus)
|
2017-03-31 22:36:15 -07:00
|
|
|
|
, ((modm, xK_x), addHiddenWorkspace "NSP" >> windows (W.shift "NSP"))
|
2016-12-24 19:37:34 -08:00
|
|
|
|
, ((modalt, xK_space), deactivateFullOr restoreOrMinimizeOtherClasses)
|
|
|
|
|
, ((modalt, xK_Return), deactivateFullAnd restoreAllMinimized)
|
2017-05-19 00:52:37 -07:00
|
|
|
|
|
|
|
|
|
-- Directional navigation
|
|
|
|
|
, ((modm, xK_w), windowGo U True)
|
|
|
|
|
, ((modm, xK_s), windowGo D True)
|
|
|
|
|
, ((modm, xK_a), windowGo L True)
|
|
|
|
|
, ((modm, xK_d), windowGo R True)
|
|
|
|
|
|
|
|
|
|
, ((modm .|. shiftMask, xK_w), windowSwap U True)
|
|
|
|
|
, ((modm .|. shiftMask, xK_s), windowSwap D True)
|
|
|
|
|
, ((modm .|. shiftMask, xK_a), windowSwap L True)
|
|
|
|
|
, ((modm .|. shiftMask, xK_d), windowSwap R True)
|
|
|
|
|
|
2017-05-19 13:23:35 -07:00
|
|
|
|
, ((modm .|. controlMask, xK_w), followingWindow $ windowToScreen U True)
|
|
|
|
|
, ((modm .|. controlMask, xK_s), followingWindow $ windowToScreen D True)
|
|
|
|
|
, ((modm .|. controlMask, xK_a), followingWindow $ windowToScreen L True)
|
|
|
|
|
, ((modm .|. controlMask, xK_d), followingWindow $ windowToScreen R True)
|
2017-05-19 00:52:37 -07:00
|
|
|
|
|
2017-05-19 13:23:35 -07:00
|
|
|
|
, ((hyper, xK_w), screenGo U True)
|
|
|
|
|
, ((hyper, xK_s), screenGo D True)
|
|
|
|
|
, ((hyper, xK_a), screenGo L True)
|
|
|
|
|
, ((hyper, xK_d), screenGo R True)
|
2017-05-19 00:52:37 -07:00
|
|
|
|
|
|
|
|
|
, ((hyper .|. shiftMask, xK_w), followingWindow $ screenSwap U True)
|
|
|
|
|
, ((hyper .|. shiftMask, xK_s), followingWindow $ screenSwap D True)
|
|
|
|
|
, ((hyper .|. shiftMask, xK_a), followingWindow $ screenSwap L True)
|
|
|
|
|
, ((hyper .|. shiftMask, xK_d), followingWindow $ screenSwap R True)
|
2016-12-24 19:37:34 -08:00
|
|
|
|
|
|
|
|
|
-- Focus/Layout manipulation
|
|
|
|
|
|
2016-12-25 15:32:09 -08:00
|
|
|
|
, ((modm, xK_e), goToNextScreenX)
|
2016-12-24 19:37:34 -08:00
|
|
|
|
, ((modm, xK_slash), sendMessage $ Toggle MIRROR)
|
2017-04-14 19:21:54 -07:00
|
|
|
|
, ((modm, xK_backslash),
|
|
|
|
|
cycleWorkspaceOnCurrentScreen [xK_Super_L] xK_backslash xK_slash)
|
2016-11-21 15:53:00 -08:00
|
|
|
|
, ((modm, xK_space), deactivateFullOr $ sendMessage NextLayout)
|
2016-12-25 15:32:09 -08:00
|
|
|
|
, ((modm, xK_z), shiftToNextScreenX)
|
2016-11-29 11:28:17 -08:00
|
|
|
|
, ((modm .|. shiftMask, xK_z), shiftToEmptyNextScreen)
|
2016-11-25 18:48:51 -08:00
|
|
|
|
, ((modm .|. shiftMask, xK_h), shiftToEmptyAndView)
|
2017-01-31 04:14:07 -08:00
|
|
|
|
|
2016-11-10 18:05:50 -08:00
|
|
|
|
-- These need to be rebound to support boringWindows
|
2016-11-10 15:23:37 -08:00
|
|
|
|
, ((modm, xK_m), focusMaster)
|
2016-11-26 18:04:48 -08:00
|
|
|
|
, ((modm, xK_Tab), focusNextClass)
|
2017-03-10 15:06:20 -08:00
|
|
|
|
, ((hyper, xK_e), moveTo Next EmptyWS)
|
2016-12-24 19:37:34 -08:00
|
|
|
|
|
|
|
|
|
-- Miscellaneous XMonad
|
2016-11-10 13:41:26 -08:00
|
|
|
|
|
2017-03-10 15:06:20 -08:00
|
|
|
|
, ((hyper, xK_1), toggleFadingForActiveWindow)
|
|
|
|
|
, ((hyper .|. shiftMask, xK_1), toggleFadingForActiveWorkspace)
|
|
|
|
|
, ((hyper .|. controlMask, xK_1), toggleFadingForActiveScreen)
|
|
|
|
|
, ((hyper, xK_t), selectToggle)
|
2016-12-24 19:37:34 -08:00
|
|
|
|
, ((modalt, xK_4), selectLimit)
|
2017-03-10 15:06:20 -08:00
|
|
|
|
, ((hyper, xK_3), addWorkspacePrompt def)
|
2017-02-16 17:40:58 -08:00
|
|
|
|
, ((modalt, xK_3), selectWorkspace def)
|
2017-03-10 15:06:20 -08:00
|
|
|
|
, ((hyper .|. mod1Mask, xK_3), removeWorkspace)
|
2016-12-24 19:37:34 -08:00
|
|
|
|
|
|
|
|
|
-- Non-XMonad
|
|
|
|
|
|
2017-01-16 21:29:24 -08:00
|
|
|
|
, ((modm .|. controlMask, xK_t), spawn taffybarCommand)
|
2016-12-24 19:37:34 -08:00
|
|
|
|
, ((modm, xK_v), spawn "copyq paste")
|
2017-05-07 23:35:01 -07:00
|
|
|
|
, ((modm .|. controlMask, xK_s), spawn "split_current_chrome_tab.sh")
|
2017-03-10 15:06:20 -08:00
|
|
|
|
, ((hyper, xK_v), spawn "copyq_rofi.sh")
|
|
|
|
|
, ((hyper, xK_p), spawn "rofi-pass")
|
|
|
|
|
, ((hyper, xK_h), spawn "screenshot.sh")
|
|
|
|
|
, ((hyper, xK_c), spawn "shell_command.sh")
|
2017-03-10 17:29:20 -08:00
|
|
|
|
, ((hyper, xK_x), spawn "rofi_command.sh")
|
2017-03-10 15:06:20 -08:00
|
|
|
|
, ((hyper .|. shiftMask, xK_l), spawn "dm-tool lock")
|
|
|
|
|
, ((hyper, xK_l), selectLayout)
|
|
|
|
|
, ((hyper, xK_k), spawn "rofi_kill_process.sh")
|
|
|
|
|
, ((hyper .|. shiftMask, xK_k),
|
2017-03-01 19:22:39 -08:00
|
|
|
|
spawn "rofi_kill_all.sh")
|
2017-03-10 15:06:20 -08:00
|
|
|
|
, ((hyper, xK_r), spawn "rofi_systemd.sh")
|
|
|
|
|
, ((hyper, xK_0), spawn "tvpower.js")
|
2017-05-07 23:35:01 -07:00
|
|
|
|
, ((modalt, xK_z), spawn "split_chrome_tab_to_next_screen.sh")
|
2017-03-10 15:06:20 -08:00
|
|
|
|
, ((hyper, xK_9), spawn "start_synergy.sh")
|
|
|
|
|
, ((hyper, xK_8), spawn "rofi_paswitch.sh")
|
2017-03-14 13:01:05 -07:00
|
|
|
|
, ((hyper, xK_slash), spawn "toggle_taffybar.sh")
|
2017-03-28 14:55:42 -07:00
|
|
|
|
, ((hyper, xK_space), spawn "skippy-xd")
|
2017-03-30 01:22:00 -07:00
|
|
|
|
, ((hyper, xK_i), spawn "rofi_select_input.hs")
|
2017-04-04 19:46:46 -07:00
|
|
|
|
, ((hyper, xK_o), spawn "rofi_paswitch.sh")
|
2016-12-24 19:37:34 -08:00
|
|
|
|
|
|
|
|
|
-- Media keys
|
2016-11-21 23:46:16 -06:00
|
|
|
|
|
2016-10-05 02:20:35 -07:00
|
|
|
|
-- playerctl
|
2017-05-19 13:23:35 -07:00
|
|
|
|
, ((modm, xK_semicolon), spawn "playerctl play-pause")
|
2016-10-05 03:23:40 -07:00
|
|
|
|
, ((0, xF86XK_AudioPause), spawn "playerctl play-pause")
|
2016-11-22 00:55:13 -06:00
|
|
|
|
, ((0, xF86XK_AudioPlay), spawn "playerctl play-pause")
|
2017-05-19 13:23:35 -07:00
|
|
|
|
, ((modm, xK_l), spawn "playerctl next")
|
2016-10-05 03:23:40 -07:00
|
|
|
|
, ((0, xF86XK_AudioNext), spawn "playerctl next")
|
2017-05-19 13:23:35 -07:00
|
|
|
|
, ((modm, xK_j), spawn "playerctl previous")
|
2016-10-05 03:23:40 -07:00
|
|
|
|
, ((0, xF86XK_AudioPrev), spawn "playerctl previous")
|
|
|
|
|
|
2016-12-24 19:37:34 -08:00
|
|
|
|
-- Volume control
|
2016-12-28 23:58:33 -08:00
|
|
|
|
, ((0, xF86XK_AudioRaiseVolume), spawn "set_volume.sh up")
|
|
|
|
|
, ((0, xF86XK_AudioLowerVolume), spawn "set_volume.sh down")
|
|
|
|
|
, ((0, xF86XK_AudioMute), spawn "set_volume.sh mute")
|
2017-05-19 13:23:35 -07:00
|
|
|
|
, ((modm, xK_i), spawn "set_volume.sh up")
|
|
|
|
|
, ((modm, xK_k), spawn "set_volume.sh down")
|
|
|
|
|
, ((modm, xK_u), spawn "set_volume.sh mute")
|
2017-04-08 02:52:29 -07:00
|
|
|
|
, ((hyper .|. shiftMask, xK_q), spawn "toggle_mute_current_window.sh")
|
|
|
|
|
, ((hctrl, xK_q), spawn "toggle_mute_current_window.sh only")
|
2016-10-13 00:09:35 -07:00
|
|
|
|
|
2017-03-02 15:29:38 -08:00
|
|
|
|
, ((0, xF86XK_MonBrightnessUp), spawn "show_brightness.sh")
|
|
|
|
|
, ((0, xF86XK_MonBrightnessDown), spawn "show_brightness.sh")
|
|
|
|
|
|
2016-10-26 18:11:18 -07:00
|
|
|
|
] ++
|
2016-12-24 19:37:34 -08:00
|
|
|
|
|
|
|
|
|
-- Replace moving bindings
|
|
|
|
|
|
2016-09-16 12:50:53 -07:00
|
|
|
|
[((additionalMask .|. modm, key), windows $ function workspace)
|
|
|
|
|
| (workspace, key) <- zip (workspaces conf) [xK_1 .. xK_9]
|
|
|
|
|
, (function, additionalMask) <-
|
|
|
|
|
[ (W.greedyView, 0)
|
|
|
|
|
, (W.shift, shiftMask)
|
2016-12-24 19:37:34 -08:00
|
|
|
|
, (shiftThenView, controlMask)
|
|
|
|
|
]
|
|
|
|
|
]
|
2016-10-24 19:41:21 -07:00
|
|
|
|
where
|
|
|
|
|
modalt = modm .|. mod1Mask
|
2017-03-10 16:30:30 -08:00
|
|
|
|
hyper = mod3Mask
|
2017-03-10 15:06:20 -08:00
|
|
|
|
hctrl = hyper .|. controlMask
|
2016-10-14 03:52:09 -07:00
|
|
|
|
|
|
|
|
|
-- Local Variables:
|
|
|
|
|
-- flycheck-ghc-args: ("-Wno-missing-signatures")
|
2016-11-25 18:49:12 -08:00
|
|
|
|
-- haskell-indent-offset: 2
|
2016-10-14 03:52:09 -07:00
|
|
|
|
-- End:
|