mirror of
https://github.com/xmonad/xmonad.git
synced 2025-08-11 18:21:51 -07:00
polish serialisation code (-7 lines)
This commit is contained in:
60
XMonad.hs
60
XMonad.hs
@@ -187,37 +187,43 @@ trace msg = io $! do hPutStrLn stderr msg; hFlush stderr
|
||||
-- ---------------------------------------------------------------------
|
||||
-- Serialise a StackSet in a simple format
|
||||
--
|
||||
-- 4|1:16777220:16777220,2:18874372:18874372,3::,4::,5::,6::,7::,8::,9::
|
||||
-- 432|1:16777220:16777220,2:18874372:18874372,3::,4::,5::,6::,7::,8::,9::
|
||||
--
|
||||
-- format, roughly,:
|
||||
--
|
||||
-- fmt := current visible '|' workspaces
|
||||
--
|
||||
-- current := int
|
||||
-- visible := int* | epsilon
|
||||
--
|
||||
-- workspaces := workspace ',' workspaces0
|
||||
-- workspaces0 := workspace ',' workspaces0 | epsilon
|
||||
--
|
||||
-- workspace := tag ':' focus* ':' clients
|
||||
-- clients := epsilon | client ';' clients
|
||||
--
|
||||
-- tag := int
|
||||
-- focus := client
|
||||
--
|
||||
-- client = int+
|
||||
-- int := 0 .. 9
|
||||
--
|
||||
|
||||
infixl 6 <:>, <|>
|
||||
(<:>), (<|>) :: Doc -> Doc -> Doc
|
||||
p <:> q = p <> char ':' <> q
|
||||
p <|> q = p <> char '|' <> q
|
||||
|
||||
serial :: WindowSet -> String
|
||||
serial = render . ppr
|
||||
where
|
||||
ppr s = pprtag (current s) <> hcat (map pprtag (visible s))
|
||||
<|> (hcat . intersperse (char ',') . map pprWorkspace $
|
||||
(sortBy (\a b -> tag a `compare` tag b)
|
||||
(map workspace (current s : visible s) ++ hidden s)))
|
||||
where infixl 6 <|>
|
||||
p <|> q = p <> char '|' <> q
|
||||
|
||||
newtype Windows = Windows [Window]
|
||||
pprtag = int . (+1) . fromIntegral . tag . workspace
|
||||
|
||||
class Pretty a where ppr :: a -> Doc
|
||||
|
||||
instance Pretty Window where ppr = text . show
|
||||
|
||||
instance Pretty a => Pretty [a] where
|
||||
ppr = hcat . intersperse (char ',') . map ppr
|
||||
|
||||
instance Pretty Windows where
|
||||
ppr (Windows s) = hcat . intersperse (char ';') . map ppr $ s
|
||||
|
||||
instance Pretty WindowSet where
|
||||
ppr s = int (1 + fromIntegral (tag . workspace . current $ s)) <|>
|
||||
ppr (sortBy (\a b -> tag a `compare` tag b)
|
||||
(map workspace (current s : visible s) ++ hidden s))
|
||||
|
||||
instance Pretty (Workspace WorkspaceId Window) where
|
||||
ppr (Workspace i s) =
|
||||
int (1 + fromIntegral i)
|
||||
<:> (case s of Empty -> empty ; _ -> ppr (focus s))
|
||||
<:> ppr (Windows (integrate s))
|
||||
pprWorkspace (Workspace i s) = int (1 + fromIntegral i)
|
||||
<:> (if s == Empty then empty else text (show (focus s)))
|
||||
<:> pprWindows (integrate s)
|
||||
where p <:> q = p <> char ':' <> q
|
||||
|
||||
pprWindows = hcat . intersperse (char ';') . map (text.show)
|
||||
|
Reference in New Issue
Block a user