aboutsummaryrefslogtreecommitdiff
path: root/.config/XMonad/lib/Scratchpads.hs
blob: 8769437b6ca6ebbdf944472ea910058c5fb9ce31 (plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
module Scratchpads where

import XMonad
import qualified XMonad.StackSet as W
import XMonad.Util.NamedScratchpad

import Defaults

-- open a scratchpad
myScratchpad :: String -> X ()
myScratchpad x = namedScratchpadAction myScratchpads x

-- if I try to concatinate strings directly 
-- it won't compile for some reason
term0Cmd  = myTerminal' ++ " -t 'Term U'"
term1Cmd  = myTerminal' ++ " -t 'Term I'"
term2Cmd  = myTerminal' ++ " -t 'Term O'"
term3Cmd  = myTerminal' ++ " -t 'Term P'"
lfCmd     = myTerminal' ++ " -t 'lf' -e 'lf'"
nmtuiCmd  = myTerminal' ++ " -t 'nmtui' -e 'nmtui'"
bpytopCmd = myTerminal' ++ " -t 'BPYTOP' -e 'bpytop'"

myScratchpads =
  [ NS "Term 0" term0Cmd  (title =? "Term U") (customFloating $ W.RationalRect (1/16)   (1/16) (7/8)  (7/8))
  , NS "Term 1" term1Cmd  (title =? "Term I") (customFloating $ W.RationalRect (1/16)   (1/16) (7/8)  (7/8))
  , NS "Term 2" term2Cmd  (title =? "Term O") (customFloating $ W.RationalRect (1/16)   (1/16) (7/8)  (7/8))
  , NS "Term 3" term3Cmd  (title =? "Term P") (customFloating $ W.RationalRect (1/16)   (1/16) (7/8)  (7/8))
  , NS "lf"     lfCmd     (title =? "lf")     (customFloating $ W.RationalRect (1/16)   (1/16) (7/8)  (7/8))
  , NS "nmtui"  nmtuiCmd  (title =? "nmtui")  (customFloating $ W.RationalRect (1/16)   (1/16) (7/8)  (7/8))
  , NS "BPYTOP" bpytopCmd (title =? "BPYTOP") (customFloating $ W.RationalRect (1/16)   (1/16) (7/8)  (7/8))
  , NS "arandr"      "arandr"                    (className =? "Arandr")          (customFloating $ W.RationalRect (1/4)    (1/4)  (1/2)  (1/2))
  , NS "calc"        "galculator"                (className =? "Galculator")      (customFloating $ W.RationalRect (5/13)   (4/13) (3/13) (6/13))
  , NS "blueman"     "blueman-manager"           (className =? "Blueman-manager") (customFloating $ W.RationalRect (5.5/16) (4/13) (5/16) (6/13))
  , NS "pavucontrol" "pavucontrol"               (className =? "Pavucontrol")     (customFloating $ W.RationalRect (3/12)   (1/12) (3/6)  (5/6))
  , NS "wallpaper"   "nitrogen"                  (className =? "Nitrogen")        (customFloating $ W.RationalRect (3/12)   (1/12) (3/6)  (5/6))
  ]