summaryrefslogtreecommitdiffhomepage
path: root/app/Configuration.hs
diff options
context:
space:
mode:
Diffstat (limited to 'app/Configuration.hs')
-rw-r--r--app/Configuration.hs158
1 files changed, 0 insertions, 158 deletions
diff --git a/app/Configuration.hs b/app/Configuration.hs
deleted file mode 100644
index db5c109..0000000
--- a/app/Configuration.hs
+++ /dev/null
@@ -1,158 +0,0 @@
-{-# LANGUAGE FlexibleContexts #-}
-
-------------------------------------------------------------------------------
--- |
--- Module: Configuration
--- Copyright: (c) 2018 Jose Antonio Ortega Ruiz
--- License: BSD3-style (see LICENSE)
---
--- Maintainer: jao@gnu.org
--- Stability: unstable
--- Portability: portable
--- Created: Wed Nov 21, 2018 23:13
---
---
--- Parsing configuration files
---
-------------------------------------------------------------------------------
-
-
-module Configuration (parseConfig) where
-
-import Text.ParserCombinators.Parsec
-import Text.ParserCombinators.Parsec.Number (int)
-import Text.ParserCombinators.Parsec.Perm ((<|?>), (<$?>), permute)
-
-import qualified Xmobar.Config as C
-
-stripComments :: String -> String
-stripComments =
- unlines . map (drop 5 . strip False . (replicate 5 ' '++)) . lines
- where strip m ('-':'-':xs) = if m then "--" ++ strip m xs else ""
- strip m ('"':xs) = '"': strip (not m) xs
- strip m (x:xs) = x : strip m xs
- strip _ [] = []
-
--- | Parse the config, logging a list of fields that were missing and replaced
--- by the default definition.
-parseConfig :: String -> Either ParseError (C.Config,[String])
-parseConfig = runParser parseConf fields "Config" . stripComments
- where
- parseConf = do
- many space
- sepEndSpc ["Config","{"]
- x <- perms
- eof
- s <- getState
- return (x,s)
-
- perms = permute $ C.Config
- <$?> pFont <|?> pFontList <|?> pWmClass <|?> pWmName
- <|?> pBgColor <|?> pFgColor
- <|?> pPosition <|?> pTextOffset <|?> pTextOffsets
- <|?> pIconOffset <|?> pBorder
- <|?> pBdColor <|?> pBdWidth <|?> pAlpha <|?> pHideOnStart
- <|?> pAllDesktops <|?> pOverrideRedirect <|?> pPickBroadest
- <|?> pLowerOnStart <|?> pPersistent <|?> pIconRoot
- <|?> pCommands <|?> pSepChar <|?> pAlignSep <|?> pTemplate
-
-
- fields = [ "font", "additionalFonts","bgColor", "fgColor"
- , "wmClass", "wmName", "sepChar"
- , "alignSep" , "border", "borderColor" ,"template"
- , "position" , "textOffset", "textOffsets", "iconOffset"
- , "allDesktops", "overrideRedirect", "pickBroadest"
- , "hideOnStart", "lowerOnStart", "persistent", "iconRoot"
- , "alpha", "commands"
- ]
-
- pFont = strField C.font "font"
- pFontList = strListField C.additionalFonts "additionalFonts"
- pWmClass = strField C.wmClass "wmClass"
- pWmName = strField C.wmName "wmName"
- pBgColor = strField C.bgColor "bgColor"
- pFgColor = strField C.fgColor "fgColor"
- pBdColor = strField C.borderColor "borderColor"
- pSepChar = strField C.sepChar "sepChar"
- pAlignSep = strField C.alignSep "alignSep"
- pTemplate = strField C.template "template"
-
- pTextOffset = readField C.textOffset "textOffset"
- pTextOffsets = readIntList C.textOffsets "textOffsets"
- pIconOffset = readField C.iconOffset "iconOffset"
- pPosition = readField C.position "position"
- pHideOnStart = readField C.hideOnStart "hideOnStart"
- pLowerOnStart = readField C.lowerOnStart "lowerOnStart"
- pPersistent = readField C.persistent "persistent"
- pBorder = readField C.border "border"
- pBdWidth = readField C.borderWidth "borderWidth"
- pAllDesktops = readField C.allDesktops "allDesktops"
- pOverrideRedirect = readField C.overrideRedirect "overrideRedirect"
- pPickBroadest = readField C.pickBroadest "pickBroadest"
- pIconRoot = readField C.iconRoot "iconRoot"
- pAlpha = readField C.alpha "alpha"
-
- pCommands = field C.commands "commands" readCommands
-
- staticPos = do string "Static"
- wrapSkip (string "{")
- p <- many (noneOf "}")
- wrapSkip (string "}")
- string ","
- return ("Static {" ++ p ++ "}")
- tillFieldEnd = staticPos <|> many (noneOf ",}\n\r")
-
- commandsEnd = wrapSkip (string "]") >> (string "}" <|> notNextRun)
- notNextRun = do {string ","
- ; notFollowedBy $ wrapSkip $ string "Run"
- ; return ","
- }
- readCommands = manyTill anyChar (try commandsEnd) >>=
- read' commandsErr . flip (++) "]"
- strField e n = field e n strMulti
-
- strMulti = scan '"'
- where
- scan lead = do
- spaces
- char lead
- s <- manyTill anyChar (rowCont <|> unescQuote)
- (char '"' >> return s) <|> fmap (s ++) (scan '\\')
- rowCont = try $ char '\\' >> string "\n"
- unescQuote = lookAhead (noneOf "\\") >> lookAhead (string "\"")
-
- strListField e n = field e n strList
- strList = do
- spaces
- char '['
- list <- sepBy (strMulti >>= \x -> spaces >> return x) (char ',')
- spaces
- char ']'
- return list
-
- wrapSkip x = many space >> x >>= \r -> many space >> return r
- sepEndSpc = mapM_ (wrapSkip . try . string)
- fieldEnd = many $ space <|> oneOf ",}"
- field e n c = (,) (e C.defaultConfig) $
- updateState (filter (/= n)) >> sepEndSpc [n,"="] >>
- wrapSkip c >>= \r -> fieldEnd >> return r
- readField a n = field a n $ tillFieldEnd >>= read' n
-
- readIntList d n = field d n intList
- intList = do
- spaces
- char '['
- list <- sepBy (spaces >> int >>= \x-> spaces >> return x) (char ',')
- spaces
- char ']'
- return list
-
- read' d s = case reads s of
- [(x, _)] -> return x
- _ -> fail $ "error reading the " ++ d ++ " field: " ++ s
-
-commandsErr :: String
-commandsErr = "commands: this usually means that a command could not" ++
- "\nbe parsed." ++
- "\nThe error could be located at the begining of the command" ++
- "\nwhich follows the offending one."