Difference between revisions of "Xmonad/Config archive/TeXitoi's xmonad.hs"

From HaskellWiki
Jump to navigation Jump to search
(6 intermediate revisions by the same user not shown)
Line 1: Line 1:
 
[[Category:XMonad configuration]]
 
[[Category:XMonad configuration]]
 
<haskell>
 
<haskell>
import XMonad
+
import XMonad hiding (Tall)
 
import XMonad.Actions.PhysicalScreens
 
import XMonad.Config.Desktop
 
import XMonad.Config.Desktop
  +
import XMonad.Config.Xfce
 
import XMonad.Hooks.FadeInactive
 
import XMonad.Hooks.FadeInactive
import XMonad.Layout.NoBorders
 
 
import XMonad.Hooks.SetWMName
 
import XMonad.Hooks.SetWMName
import qualified XMonad.Layout.HintedTile as HT
+
import XMonad.Layout.NoBorders
  +
import XMonad.Layout.HintedTile
 
 
import qualified Data.Map as M
 
import qualified Data.Map as M
 
import qualified XMonad.StackSet as W
 
import qualified XMonad.StackSet as W
import Data.Bits ((.|.))
 
   
main = xmonad defaults
+
main = xmonad xfceConfig {
 
defaults = desktopConfig {
 
 
modMask = mod4Mask,
 
modMask = mod4Mask,
terminal = "urxvtc",
+
terminal = "xfce4-terminal",
keys = \c -> mykeys c `M.union` keys desktopConfig c,
+
keys = \c -> myKeys c `M.union` keys xfceConfig c,
logHook = logHook desktopConfig >> fadeInactiveLogHook 0xcccccccc >> setWMName "LG3D",
+
startupHook = startupHook xfceConfig >> setWMName "LG3D",
  +
logHook = logHook xfceConfig >> fadeInactiveLogHook 0xcccccccc,
 
layoutHook = desktopLayoutModifiers . smartBorders $ tiled ||| Full,
 
layoutHook = desktopLayoutModifiers . smartBorders $ tiled ||| Full,
  +
manageHook = myManageHook <+> manageHook xfceConfig,
 
workspaces = map show [1..8],
 
workspaces = map show [1..8],
 
focusedBorderColor = "#729fcf",
 
focusedBorderColor = "#729fcf",
Line 25: Line 25:
 
}
 
}
   
tiled = HT.HintedTile nmaster delta ratio HT.TopLeft HT.Tall where
+
tiled = HintedTile 1 0.03 0.5 TopLeft Tall
nmaster = 1
 
ratio = 1/2
 
delta = 3/100
 
   
mykeys conf@(XConfig {XMonad.modMask = modMask}) = M.fromList $
+
myKeys conf@(XConfig {modMask = modm}) = M.fromList $
[((mod1Mask, xK_Tab), windows W.focusDown),
+
[((modm, xK_semicolon), sendMessage (IncMasterN (-1))),
  +
((mod1Mask, xK_Tab), windows W.focusDown),
 
((mod1Mask .|. shiftMask, xK_Tab), windows W.focusUp),
 
((mod1Mask .|. shiftMask, xK_Tab), windows W.focusUp),
 
((mod4Mask, xK_i), sendMessage NextLayout)]
 
((mod4Mask, xK_i), sendMessage NextLayout)]
 
++
 
++
[((m .|. modMask, k), windows $ f i) |
+
[((modm .|. mask, key), f sc)
(i, k) <- zip (workspaces conf) numbepo,
+
| (key, sc) <- zip [xK_w, xK_e, xK_r] [0..]
(f, m) <- [(W.greedyView, 0), (W.shift, shiftMask)]]
+
, (f, mask) <- [(viewScreen, 0), (sendToScreen, shiftMask)]]
  +
++
  +
[((modm .|. mask, key), f sc)
  +
| (key, sc) <- zip [xK_a, xK_u, xK_i] [0..]
  +
, (f, mask) <- [(viewScreen, 0), (sendToScreen, shiftMask)]]
  +
++
  +
[((m .|. modm, k), windows $ f i)
  +
| (i, k) <- zip (workspaces conf) num
  +
, (f, m) <- [(W.greedyView, 0), (W.shift, shiftMask)]]
  +
  +
num = numBepo
  +
--num = numAzerty
 
numBepo = [0x22,0xab,0xbb,0x28,0x29,0x40,0x2b,0x2d,0x2f,0x2a]
 
numAzerty = [0x26,0xe9,0x22,0x27,0x28,0x2d,0xe8,0x5f,0xe7,0xe0]
   
  +
myManageHook = composeAll $
numbepo = [0x22,0xab,0xbb,0x28,0x29,0x40,0x2b,0x2d,0x2f,0x2a]
 
  +
[className =? "Xfce4-notifyd" --> doIgnore,
numazerty = [0x26,0xe9,0x22,0x27,0x28,0x2d,0xe8,0x5f,0xe7,0xe0]
 
  +
className =? "Xfrun4" --> doFloat,
  +
className =? "Xfce4-appfinder" --> doFloat,
  +
className =? "mplayer2" --> doFloat]
  +
++
  +
[className =? c --> doShift w | (w, cs) <- wcs, c <- cs]
  +
where wcs = [("2", ["Midori", "Firefox", "Iceweasel", "Claws-mail"]),
  +
("4", ["Gajim"]),
  +
("5", ["Gmpc"])]
 
</haskell>
 
</haskell>

Revision as of 10:28, 13 November 2014

import XMonad hiding (Tall)
import XMonad.Actions.PhysicalScreens
import XMonad.Config.Desktop
import XMonad.Config.Xfce
import XMonad.Hooks.FadeInactive
import XMonad.Hooks.SetWMName
import XMonad.Layout.NoBorders
import XMonad.Layout.HintedTile
import qualified Data.Map as M
import qualified XMonad.StackSet as W

main = xmonad xfceConfig {
    modMask = mod4Mask,
    terminal = "xfce4-terminal",
    keys = \c -> myKeys c `M.union` keys xfceConfig c,
    startupHook = startupHook xfceConfig >> setWMName "LG3D",
    logHook = logHook xfceConfig >> fadeInactiveLogHook 0xcccccccc,
    layoutHook = desktopLayoutModifiers . smartBorders $ tiled ||| Full,
    manageHook = myManageHook <+> manageHook xfceConfig,
    workspaces = map show [1..8],
    focusedBorderColor = "#729fcf",
    normalBorderColor = "#aaaaaa"
}

tiled = HintedTile 1 0.03 0.5 TopLeft Tall

myKeys conf@(XConfig {modMask = modm}) = M.fromList $
    [((modm, xK_semicolon), sendMessage (IncMasterN (-1))),
     ((mod1Mask, xK_Tab), windows W.focusDown),
     ((mod1Mask .|. shiftMask, xK_Tab), windows W.focusUp),
     ((mod4Mask, xK_i), sendMessage NextLayout)]
    ++
    [((modm .|. mask, key), f sc)
     | (key, sc) <- zip [xK_w, xK_e, xK_r] [0..]
     , (f, mask) <- [(viewScreen, 0), (sendToScreen, shiftMask)]]
    ++
    [((modm .|. mask, key), f sc)
     | (key, sc) <- zip [xK_a, xK_u, xK_i] [0..]
     , (f, mask) <- [(viewScreen, 0), (sendToScreen, shiftMask)]]
    ++
    [((m .|. modm, k), windows $ f i)
     | (i, k) <- zip (workspaces conf) num
     , (f, m) <- [(W.greedyView, 0), (W.shift, shiftMask)]]

num = numBepo
--num = numAzerty
numBepo = [0x22,0xab,0xbb,0x28,0x29,0x40,0x2b,0x2d,0x2f,0x2a]
numAzerty = [0x26,0xe9,0x22,0x27,0x28,0x2d,0xe8,0x5f,0xe7,0xe0]

myManageHook = composeAll $
  [className =? "Xfce4-notifyd" --> doIgnore,
   className =? "Xfrun4" --> doFloat,
   className =? "Xfce4-appfinder" --> doFloat,
   className =? "mplayer2" --> doFloat]
  ++
  [className =? c --> doShift w | (w, cs) <- wcs, c <- cs]
    where wcs = [("2", ["Midori", "Firefox", "Iceweasel", "Claws-mail"]),
                 ("4", ["Gajim"]),
                 ("5", ["Gmpc"])]