{-# LANGUAGE CPP #-}
{-# LANGUAGE TypeOperators #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE FlexibleContexts #-}
module Graphics.Vty.Config
( InputMap
, VtyUserConfig(..)
, userConfig
, overrideEnvConfig
, currentTerminalName
, runParseConfig
, parseConfigFile
, defaultConfig
, vtyConfigPath
, widthTableFilename
, vtyDataDirectory
, terminalWidthTablePath
, vtyConfigFileEnvName
, ConfigUpdateResult(..)
, addConfigWidthMap
)
where
import Prelude
import Control.Applicative hiding (many)
import Control.Exception (catch, IOException)
import Control.Monad (liftM, guard, void)
import qualified Data.ByteString as BS
#if !(MIN_VERSION_base(4,8,0))
import Data.Monoid (Monoid(..))
#endif
#if !(MIN_VERSION_base(4,11,0))
import Data.Semigroup (Semigroup(..))
#endif
import Text.Read (readMaybe)
import Graphics.Vty.Attributes.Color (ColorMode(..))
import Graphics.Vty.Input.Events
import GHC.Generics
import System.Directory ( getAppUserDataDirectory, doesFileExist
, createDirectoryIfMissing
)
import System.Environment (lookupEnv)
import System.FilePath ((</>), takeDirectory)
import Text.Parsec hiding ((<|>))
import Text.Parsec.Token ( GenLanguageDef(..) )
import qualified Text.Parsec.Token as P
type InputMap = [(Maybe String, String, Event)]
data VtyUserConfig =
VtyUserConfig { VtyUserConfig -> Maybe String
configDebugLog :: Maybe FilePath
, VtyUserConfig -> InputMap
configInputMap :: InputMap
, VtyUserConfig -> [(String, String)]
configTermWidthMaps :: [(String, FilePath)]
, VtyUserConfig -> Maybe Bool
configAllowCustomUnicodeWidthTables :: Maybe Bool
, VtyUserConfig -> Maybe ColorMode
configPreferredColorMode :: Maybe ColorMode
}
deriving (Int -> VtyUserConfig -> ShowS
[VtyUserConfig] -> ShowS
VtyUserConfig -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [VtyUserConfig] -> ShowS
$cshowList :: [VtyUserConfig] -> ShowS
show :: VtyUserConfig -> String
$cshow :: VtyUserConfig -> String
showsPrec :: Int -> VtyUserConfig -> ShowS
$cshowsPrec :: Int -> VtyUserConfig -> ShowS
Show, VtyUserConfig -> VtyUserConfig -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: VtyUserConfig -> VtyUserConfig -> Bool
$c/= :: VtyUserConfig -> VtyUserConfig -> Bool
== :: VtyUserConfig -> VtyUserConfig -> Bool
$c== :: VtyUserConfig -> VtyUserConfig -> Bool
Eq)
defaultConfig :: VtyUserConfig
defaultConfig :: VtyUserConfig
defaultConfig = forall a. Monoid a => a
mempty
instance Semigroup VtyUserConfig where
VtyUserConfig
c0 <> :: VtyUserConfig -> VtyUserConfig -> VtyUserConfig
<> VtyUserConfig
c1 =
VtyUserConfig { configDebugLog :: Maybe String
configDebugLog =
VtyUserConfig -> Maybe String
configDebugLog VtyUserConfig
c1 forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> VtyUserConfig -> Maybe String
configDebugLog VtyUserConfig
c0
, configInputMap :: InputMap
configInputMap =
VtyUserConfig -> InputMap
configInputMap VtyUserConfig
c0 forall a. Semigroup a => a -> a -> a
<> VtyUserConfig -> InputMap
configInputMap VtyUserConfig
c1
, configTermWidthMaps :: [(String, String)]
configTermWidthMaps =
VtyUserConfig -> [(String, String)]
configTermWidthMaps VtyUserConfig
c1 forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> VtyUserConfig -> [(String, String)]
configTermWidthMaps VtyUserConfig
c0
, configAllowCustomUnicodeWidthTables :: Maybe Bool
configAllowCustomUnicodeWidthTables =
VtyUserConfig -> Maybe Bool
configAllowCustomUnicodeWidthTables VtyUserConfig
c1 forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> VtyUserConfig -> Maybe Bool
configAllowCustomUnicodeWidthTables VtyUserConfig
c0
, configPreferredColorMode :: Maybe ColorMode
configPreferredColorMode =
VtyUserConfig -> Maybe ColorMode
configPreferredColorMode VtyUserConfig
c1 forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> VtyUserConfig -> Maybe ColorMode
configPreferredColorMode VtyUserConfig
c0
}
instance Monoid VtyUserConfig where
mempty :: VtyUserConfig
mempty =
VtyUserConfig { configDebugLog :: Maybe String
configDebugLog = forall a. Monoid a => a
mempty
, configInputMap :: InputMap
configInputMap = forall a. Monoid a => a
mempty
, configTermWidthMaps :: [(String, String)]
configTermWidthMaps = []
, configAllowCustomUnicodeWidthTables :: Maybe Bool
configAllowCustomUnicodeWidthTables = forall a. Maybe a
Nothing
, configPreferredColorMode :: Maybe ColorMode
configPreferredColorMode = forall a. Maybe a
Nothing
}
#if !(MIN_VERSION_base(4,11,0))
mappend = (<>)
#endif
vtyDataDirectory :: IO FilePath
vtyDataDirectory :: IO String
vtyDataDirectory = String -> IO String
getAppUserDataDirectory String
"vty"
vtyConfigPath :: IO FilePath
vtyConfigPath :: IO String
vtyConfigPath = do
String
dir <- IO String
vtyDataDirectory
forall (m :: * -> *) a. Monad m => a -> m a
return forall a b. (a -> b) -> a -> b
$ String
dir String -> ShowS
</> String
"config"
vtyConfigFileEnvName :: String
vtyConfigFileEnvName :: String
vtyConfigFileEnvName = String
"VTY_CONFIG_FILE"
userConfig :: IO VtyUserConfig
userConfig :: IO VtyUserConfig
userConfig = do
VtyUserConfig
configFile <- IO String
vtyConfigPath forall (m :: * -> *) a b. Monad m => m a -> (a -> m b) -> m b
>>= String -> IO VtyUserConfig
parseConfigFile
VtyUserConfig
overrideConfig <- forall b a. b -> (a -> b) -> Maybe a -> b
maybe (forall (m :: * -> *) a. Monad m => a -> m a
return VtyUserConfig
defaultConfig) String -> IO VtyUserConfig
parseConfigFile forall (m :: * -> *) a b. Monad m => (a -> m b) -> m a -> m b
=<<
String -> IO (Maybe String)
lookupEnv String
vtyConfigFileEnvName
let base :: VtyUserConfig
base = VtyUserConfig
configFile forall a. Semigroup a => a -> a -> a
<> VtyUserConfig
overrideConfig
forall a. Monoid a => a -> a -> a
mappend VtyUserConfig
base forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> IO VtyUserConfig
overrideEnvConfig
widthTableFilename :: String -> String
widthTableFilename :: ShowS
widthTableFilename String
term = String
"width_table_" forall a. Semigroup a => a -> a -> a
<> String
term forall a. Semigroup a => a -> a -> a
<> String
".dat"
termVariable :: String
termVariable :: String
termVariable = String
"TERM"
currentTerminalName :: IO (Maybe String)
currentTerminalName :: IO (Maybe String)
currentTerminalName = String -> IO (Maybe String)
lookupEnv String
termVariable
terminalWidthTablePath :: IO (Maybe FilePath)
terminalWidthTablePath :: IO (Maybe String)
terminalWidthTablePath = do
String
dataDir <- IO String
vtyDataDirectory
Maybe String
result <- String -> IO (Maybe String)
lookupEnv String
termVariable
case Maybe String
result of
Maybe String
Nothing -> forall (m :: * -> *) a. Monad m => a -> m a
return forall a. Maybe a
Nothing
Just String
term -> do
forall (m :: * -> *) a. Monad m => a -> m a
return forall a b. (a -> b) -> a -> b
$ forall a. a -> Maybe a
Just forall a b. (a -> b) -> a -> b
$ String
dataDir String -> ShowS
</> ShowS
widthTableFilename String
term
overrideEnvConfig :: IO VtyUserConfig
overrideEnvConfig :: IO VtyUserConfig
overrideEnvConfig = do
Maybe String
d <- String -> IO (Maybe String)
lookupEnv String
"VTY_DEBUG_LOG"
forall (m :: * -> *) a. Monad m => a -> m a
return forall a b. (a -> b) -> a -> b
$ VtyUserConfig
defaultConfig { configDebugLog :: Maybe String
configDebugLog = Maybe String
d }
parseConfigFile :: FilePath -> IO VtyUserConfig
parseConfigFile :: String -> IO VtyUserConfig
parseConfigFile String
path = do
forall e a. Exception e => IO a -> (e -> IO a) -> IO a
catch (String -> ByteString -> VtyUserConfig
runParseConfig String
path forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> String -> IO ByteString
BS.readFile String
path)
(\(IOException
_ :: IOException) -> forall (m :: * -> *) a. Monad m => a -> m a
return VtyUserConfig
defaultConfig)
runParseConfig :: String -> BS.ByteString -> VtyUserConfig
runParseConfig :: String -> ByteString -> VtyUserConfig
runParseConfig String
name ByteString
cfgTxt =
case forall s t u a.
Stream s Identity t =>
Parsec s u a -> u -> String -> s -> Either ParseError a
runParser Parser VtyUserConfig
parseConfig () String
name ByteString
cfgTxt of
Right VtyUserConfig
cfg -> VtyUserConfig
cfg
Left{} -> VtyUserConfig
defaultConfig
type Parser = Parsec BS.ByteString ()
configLanguage :: Monad m => P.GenLanguageDef BS.ByteString () m
configLanguage :: forall (m :: * -> *). Monad m => GenLanguageDef ByteString () m
configLanguage = LanguageDef
{ commentStart :: String
commentStart = String
"{-"
, commentEnd :: String
commentEnd = String
"-}"
, commentLine :: String
commentLine = String
"--"
, nestedComments :: Bool
nestedComments = Bool
True
, identStart :: ParsecT ByteString () m Char
identStart = forall s (m :: * -> *) u. Stream s m Char => ParsecT s u m Char
letter forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> forall s (m :: * -> *) u.
Stream s m Char =>
Char -> ParsecT s u m Char
char Char
'_'
, identLetter :: ParsecT ByteString () m Char
identLetter = forall s (m :: * -> *) u. Stream s m Char => ParsecT s u m Char
alphaNum forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> forall s (m :: * -> *) u.
Stream s m Char =>
String -> ParsecT s u m Char
oneOf String
"_'"
, opStart :: ParsecT ByteString () m Char
opStart = forall s u (m :: * -> *).
GenLanguageDef s u m -> ParsecT s u m Char
opLetter forall (m :: * -> *). Monad m => GenLanguageDef ByteString () m
configLanguage
, opLetter :: ParsecT ByteString () m Char
opLetter = forall s (m :: * -> *) u.
Stream s m Char =>
String -> ParsecT s u m Char
oneOf String
":!#$%&*+./<=>?@\\^|-~"
, reservedOpNames :: [String]
reservedOpNames = []
, reservedNames :: [String]
reservedNames = []
, caseSensitive :: Bool
caseSensitive = Bool
True
}
configLexer :: Monad m => P.GenTokenParser BS.ByteString () m
configLexer :: forall (m :: * -> *). Monad m => GenTokenParser ByteString () m
configLexer = forall s (m :: * -> *) u.
Stream s m Char =>
GenLanguageDef s u m -> GenTokenParser s u m
P.makeTokenParser forall (m :: * -> *). Monad m => GenLanguageDef ByteString () m
configLanguage
mapDecl :: Parser VtyUserConfig
mapDecl :: Parser VtyUserConfig
mapDecl = do
String
"map" <- forall s u (m :: * -> *).
GenTokenParser s u m -> ParsecT s u m String
P.identifier forall (m :: * -> *). Monad m => GenTokenParser ByteString () m
configLexer
Maybe String
termIdent <- (forall s (m :: * -> *) u.
Stream s m Char =>
Char -> ParsecT s u m Char
char Char
'_' forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> forall s u (m :: * -> *). GenTokenParser s u m -> ParsecT s u m ()
P.whiteSpace forall (m :: * -> *). Monad m => GenTokenParser ByteString () m
configLexer forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> forall (m :: * -> *) a. Monad m => a -> m a
return forall a. Maybe a
Nothing)
forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (forall a. a -> Maybe a
Just forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall s u (m :: * -> *).
GenTokenParser s u m -> ParsecT s u m String
P.stringLiteral forall (m :: * -> *). Monad m => GenTokenParser ByteString () m
configLexer)
String
bytes <- forall s u (m :: * -> *).
GenTokenParser s u m -> ParsecT s u m String
P.stringLiteral forall (m :: * -> *). Monad m => GenTokenParser ByteString () m
configLexer
Key
key <- forall a. Parse a => Parser a
parseValue
[Modifier]
modifiers <- forall a. Parse a => Parser a
parseValue
forall (m :: * -> *) a. Monad m => a -> m a
return VtyUserConfig
defaultConfig { configInputMap :: InputMap
configInputMap = [(Maybe String
termIdent, String
bytes, Key -> [Modifier] -> Event
EvKey Key
key [Modifier]
modifiers)] }
debugLogDecl :: Parser VtyUserConfig
debugLogDecl :: Parser VtyUserConfig
debugLogDecl = do
String
"debugLog" <- forall s u (m :: * -> *).
GenTokenParser s u m -> ParsecT s u m String
P.identifier forall (m :: * -> *). Monad m => GenTokenParser ByteString () m
configLexer
String
path <- forall s u (m :: * -> *).
GenTokenParser s u m -> ParsecT s u m String
P.stringLiteral forall (m :: * -> *). Monad m => GenTokenParser ByteString () m
configLexer
forall (m :: * -> *) a. Monad m => a -> m a
return VtyUserConfig
defaultConfig { configDebugLog :: Maybe String
configDebugLog = forall a. a -> Maybe a
Just String
path }
colorModeDecl :: Parser VtyUserConfig
colorModeDecl :: Parser VtyUserConfig
colorModeDecl = do
String
"colorMode" <- forall s u (m :: * -> *).
GenTokenParser s u m -> ParsecT s u m String
P.identifier forall (m :: * -> *). Monad m => GenTokenParser ByteString () m
configLexer
String
mode <- forall s u (m :: * -> *).
GenTokenParser s u m -> ParsecT s u m String
P.stringLiteral forall (m :: * -> *). Monad m => GenTokenParser ByteString () m
configLexer
forall (m :: * -> *) a. Monad m => a -> m a
return VtyUserConfig
defaultConfig { configPreferredColorMode :: Maybe ColorMode
configPreferredColorMode = forall a. Read a => String -> Maybe a
readMaybe String
mode }
widthMapDecl :: Parser VtyUserConfig
widthMapDecl :: Parser VtyUserConfig
widthMapDecl = do
String
"widthMap" <- forall s u (m :: * -> *).
GenTokenParser s u m -> ParsecT s u m String
P.identifier forall (m :: * -> *). Monad m => GenTokenParser ByteString () m
configLexer
String
tName <- forall s u (m :: * -> *).
GenTokenParser s u m -> ParsecT s u m String
P.stringLiteral forall (m :: * -> *). Monad m => GenTokenParser ByteString () m
configLexer
String
path <- forall s u (m :: * -> *).
GenTokenParser s u m -> ParsecT s u m String
P.stringLiteral forall (m :: * -> *). Monad m => GenTokenParser ByteString () m
configLexer
forall (m :: * -> *) a. Monad m => a -> m a
return VtyUserConfig
defaultConfig { configTermWidthMaps :: [(String, String)]
configTermWidthMaps = [(String
tName, String
path)] }
ignoreLine :: Parser ()
ignoreLine :: ParsecT ByteString () Identity ()
ignoreLine = forall (f :: * -> *) a. Functor f => f a -> f ()
void forall a b. (a -> b) -> a -> b
$ forall s (m :: * -> *) t u a end.
Stream s m t =>
ParsecT s u m a -> ParsecT s u m end -> ParsecT s u m [a]
manyTill forall s (m :: * -> *) u. Stream s m Char => ParsecT s u m Char
anyChar forall s (m :: * -> *) u. Stream s m Char => ParsecT s u m Char
newline
parseConfig :: Parser VtyUserConfig
parseConfig :: Parser VtyUserConfig
parseConfig = forall (m :: * -> *) a1 r. Monad m => (a1 -> r) -> m a1 -> m r
liftM forall a. Monoid a => [a] -> a
mconcat forall a b. (a -> b) -> a -> b
$ forall s u (m :: * -> *) a. ParsecT s u m a -> ParsecT s u m [a]
many forall a b. (a -> b) -> a -> b
$ do
forall s u (m :: * -> *). GenTokenParser s u m -> ParsecT s u m ()
P.whiteSpace forall (m :: * -> *). Monad m => GenTokenParser ByteString () m
configLexer
let directives :: [Parser VtyUserConfig]
directives = [forall s u (m :: * -> *) a. ParsecT s u m a -> ParsecT s u m a
try Parser VtyUserConfig
mapDecl, forall s u (m :: * -> *) a. ParsecT s u m a -> ParsecT s u m a
try Parser VtyUserConfig
debugLogDecl, forall s u (m :: * -> *) a. ParsecT s u m a -> ParsecT s u m a
try Parser VtyUserConfig
widthMapDecl, forall s u (m :: * -> *) a. ParsecT s u m a -> ParsecT s u m a
try Parser VtyUserConfig
colorModeDecl]
forall s (m :: * -> *) t u a.
Stream s m t =>
[ParsecT s u m a] -> ParsecT s u m a
choice [Parser VtyUserConfig]
directives forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> (ParsecT ByteString () Identity ()
ignoreLine forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> forall (m :: * -> *) a. Monad m => a -> m a
return VtyUserConfig
defaultConfig)
class Parse a where parseValue :: Parser a
instance Parse Char where parseValue :: Parser Char
parseValue = forall s u (m :: * -> *).
GenTokenParser s u m -> ParsecT s u m Char
P.charLiteral forall (m :: * -> *). Monad m => GenTokenParser ByteString () m
configLexer
instance Parse Int where parseValue :: Parser Int
parseValue = forall a. Num a => Integer -> a
fromInteger forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall s u (m :: * -> *).
GenTokenParser s u m -> ParsecT s u m Integer
P.natural forall (m :: * -> *). Monad m => GenTokenParser ByteString () m
configLexer
instance Parse Key where parseValue :: Parser Key
parseValue = forall a. (Generic a, GParse (Rep a)) => Parser a
genericParse
instance Parse Modifier where parseValue :: Parser Modifier
parseValue = forall a. (Generic a, GParse (Rep a)) => Parser a
genericParse
instance Parse a => Parse [a] where
parseValue :: Parser [a]
parseValue = forall s u (m :: * -> *).
GenTokenParser s u m
-> forall a. ParsecT s u m a -> ParsecT s u m a
P.brackets forall (m :: * -> *). Monad m => GenTokenParser ByteString () m
configLexer
(forall a. Parse a => Parser a
parseValue forall s (m :: * -> *) t u a end.
Stream s m t =>
ParsecT s u m a -> ParsecT s u m end -> ParsecT s u m [a]
`sepBy` forall s u (m :: * -> *).
GenTokenParser s u m -> String -> ParsecT s u m String
P.symbol forall (m :: * -> *). Monad m => GenTokenParser ByteString () m
configLexer String
",")
genericParse :: (Generic a, GParse (Rep a)) => Parser a
genericParse :: forall a. (Generic a, GParse (Rep a)) => Parser a
genericParse = forall a x. Generic a => Rep a x -> a
to forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall (f :: * -> *) a. GParse f => Parser (f a)
gparse
class GParse f where gparse :: Parser (f a)
instance GParse f => GParse (M1 S i f) where gparse :: forall a. Parser (M1 S i f a)
gparse = forall k i (c :: Meta) (f :: k -> *) (p :: k). f p -> M1 i c f p
M1 forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall (f :: * -> *) a. GParse f => Parser (f a)
gparse
instance GParse U1 where gparse :: forall a. Parser (U1 a)
gparse = forall (m :: * -> *) a. Monad m => a -> m a
return forall k (p :: k). U1 p
U1
instance Parse a => GParse (K1 i a) where gparse :: forall a. Parser (K1 i a a)
gparse = forall k i c (p :: k). c -> K1 i c p
K1 forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall a. Parse a => Parser a
parseValue
instance (GParse f, GParse g) => GParse (f :*: g) where
gparse :: forall a. Parser ((:*:) f g a)
gparse = forall k (f :: k -> *) (g :: k -> *) (p :: k).
f p -> g p -> (:*:) f g p
(:*:) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall (f :: * -> *) a. GParse f => Parser (f a)
gparse forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
<*> forall (f :: * -> *) a. GParse f => Parser (f a)
gparse
instance GParseAlts f => GParse (M1 D i f) where
gparse :: forall a. Parser (M1 D i f a)
gparse =
do String
con <- forall s u (m :: * -> *).
GenTokenParser s u m -> ParsecT s u m String
P.identifier forall (m :: * -> *). Monad m => GenTokenParser ByteString () m
configLexer
forall k i (c :: Meta) (f :: k -> *) (p :: k). f p -> M1 i c f p
M1 forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall (f :: * -> *) a. GParseAlts f => String -> Parser (f a)
gparseAlts String
con
class GParseAlts f where
gparseAlts :: String -> Parser (f a)
instance (Constructor i, GParse f) => GParseAlts (M1 C i f) where
gparseAlts :: forall a. String -> Parser (M1 C i f a)
gparseAlts String
con =
do forall (f :: * -> *). Alternative f => Bool -> f ()
guard (String
con forall a. Eq a => a -> a -> Bool
== forall {k} (c :: k) k1 (t :: k -> (k1 -> *) -> k1 -> *)
(f :: k1 -> *) (a :: k1).
Constructor c =>
t c f a -> String
conName (forall k i (c :: Meta) (f :: k -> *) (p :: k). f p -> M1 i c f p
M1 forall a. Maybe a
Nothing :: C1 i Maybe a))
forall k i (c :: Meta) (f :: k -> *) (p :: k). f p -> M1 i c f p
M1 forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall (f :: * -> *) a. GParse f => Parser (f a)
gparse
instance (GParseAlts f, GParseAlts g) => GParseAlts (f :+: g) where
gparseAlts :: forall a. String -> Parser ((:+:) f g a)
gparseAlts String
con = forall k (f :: k -> *) (g :: k -> *) (p :: k). f p -> (:+:) f g p
L1 forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall (f :: * -> *) a. GParseAlts f => String -> Parser (f a)
gparseAlts String
con forall (f :: * -> *) a. Alternative f => f a -> f a -> f a
<|> forall k (f :: k -> *) (g :: k -> *) (p :: k). g p -> (:+:) f g p
R1 forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> forall (f :: * -> *) a. GParseAlts f => String -> Parser (f a)
gparseAlts String
con
instance GParseAlts V1 where gparseAlts :: forall a. String -> Parser (V1 a)
gparseAlts String
_ = forall (m :: * -> *) a. MonadFail m => String -> m a
fail String
"GParse: V1"
data ConfigUpdateResult =
ConfigurationCreated
| ConfigurationModified
| ConfigurationConflict String
| ConfigurationRedundant
deriving (ConfigUpdateResult -> ConfigUpdateResult -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ConfigUpdateResult -> ConfigUpdateResult -> Bool
$c/= :: ConfigUpdateResult -> ConfigUpdateResult -> Bool
== :: ConfigUpdateResult -> ConfigUpdateResult -> Bool
$c== :: ConfigUpdateResult -> ConfigUpdateResult -> Bool
Eq, Int -> ConfigUpdateResult -> ShowS
[ConfigUpdateResult] -> ShowS
ConfigUpdateResult -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ConfigUpdateResult] -> ShowS
$cshowList :: [ConfigUpdateResult] -> ShowS
show :: ConfigUpdateResult -> String
$cshow :: ConfigUpdateResult -> String
showsPrec :: Int -> ConfigUpdateResult -> ShowS
$cshowsPrec :: Int -> ConfigUpdateResult -> ShowS
Show)
addConfigWidthMap :: FilePath
-> String
-> FilePath
-> IO ConfigUpdateResult
addConfigWidthMap :: String -> String -> String -> IO ConfigUpdateResult
addConfigWidthMap String
configPath String
term String
tablePath = do
Bool
configEx <- String -> IO Bool
doesFileExist String
configPath
if Bool
configEx
then IO ConfigUpdateResult
updateConfig
else IO ()
createConfig forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> forall (m :: * -> *) a. Monad m => a -> m a
return ConfigUpdateResult
ConfigurationCreated
where
directive :: String
directive = String
"widthMap " forall a. Semigroup a => a -> a -> a
<> forall a. Show a => a -> String
show String
term forall a. Semigroup a => a -> a -> a
<> String
" " forall a. Semigroup a => a -> a -> a
<> forall a. Show a => a -> String
show String
tablePath forall a. Semigroup a => a -> a -> a
<> String
"\n"
createConfig :: IO ()
createConfig = do
let dir :: String
dir = ShowS
takeDirectory String
configPath
Bool -> String -> IO ()
createDirectoryIfMissing Bool
True String
dir
String -> String -> IO ()
writeFile String
configPath String
directive
updateConfig :: IO ConfigUpdateResult
updateConfig = do
VtyUserConfig
config <- String -> IO VtyUserConfig
parseConfigFile String
configPath
if (String
term, String
tablePath) forall (t :: * -> *) a. (Foldable t, Eq a) => a -> t a -> Bool
`elem` VtyUserConfig -> [(String, String)]
configTermWidthMaps VtyUserConfig
config
then forall (m :: * -> *) a. Monad m => a -> m a
return ConfigUpdateResult
ConfigurationRedundant
else case forall a b. Eq a => a -> [(a, b)] -> Maybe b
lookup String
term (VtyUserConfig -> [(String, String)]
configTermWidthMaps VtyUserConfig
config) of
Just String
other -> forall (m :: * -> *) a. Monad m => a -> m a
return forall a b. (a -> b) -> a -> b
$ String -> ConfigUpdateResult
ConfigurationConflict String
other
Maybe String
Nothing -> do
String -> String -> IO ()
appendFile String
configPath String
directive
forall (m :: * -> *) a. Monad m => a -> m a
return ConfigUpdateResult
ConfigurationModified