xmonad-masser/src/XMonad/Config/MasseR/ExtraConfig.hs

33 lines
929 B
Haskell
Raw Normal View History

2019-03-19 10:10:18 +02:00
{-# LANGUAGE DeriveGeneric #-}
module XMonad.Config.MasseR.ExtraConfig where
import GHC.Generics (Generic)
import Data.Text (Text)
2019-03-21 23:29:39 +02:00
data Applications =
Applications { browser :: FilePath
, launcher :: FilePath
, prompt :: FilePath
, screenshot :: FilePath
, urxvt :: FilePath
} deriving (Show, Generic)
2019-03-19 10:10:18 +02:00
2019-03-21 23:29:39 +02:00
data TopicRule =
TopicRule { topicName :: Text
, topicHome :: Maybe Text
, topicAction :: Maybe Text
}
deriving (Show, Generic)
2019-03-19 10:10:18 +02:00
2019-03-21 23:36:00 +02:00
data Search = Search { name :: String
, key :: String
, url :: String
}
deriving (Show, Generic)
2019-03-21 23:29:39 +02:00
data ExtraConfig =
ExtraConfig { applications :: Applications
2019-03-21 23:36:00 +02:00
, topics :: [ TopicRule ]
, searchEndpoints :: [Search] }
2019-03-21 23:29:39 +02:00
deriving (Show, Generic)