module Ribosome.Test.Data.TestConfig where import qualified Chiasma.Test.Data.TmuxTestConfig as Chiasma import Ribosome.Data.PluginConfig (PluginConfig (PluginConfig)) import Ribosome.Host.Data.HostConfig (HostConfig (HostConfig), dataLogConc) data TestConfig = TestConfig { TestConfig -> Bool freeze :: Bool, TestConfig -> PluginConfig () plugin :: PluginConfig () } deriving stock (TestConfig -> TestConfig -> Bool (TestConfig -> TestConfig -> Bool) -> (TestConfig -> TestConfig -> Bool) -> Eq TestConfig forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a /= :: TestConfig -> TestConfig -> Bool $c/= :: TestConfig -> TestConfig -> Bool == :: TestConfig -> TestConfig -> Bool $c== :: TestConfig -> TestConfig -> Bool Eq, Int -> TestConfig -> ShowS [TestConfig] -> ShowS TestConfig -> String (Int -> TestConfig -> ShowS) -> (TestConfig -> String) -> ([TestConfig] -> ShowS) -> Show TestConfig forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [TestConfig] -> ShowS $cshowList :: [TestConfig] -> ShowS show :: TestConfig -> String $cshow :: TestConfig -> String showsPrec :: Int -> TestConfig -> ShowS $cshowsPrec :: Int -> TestConfig -> ShowS Show, (forall x. TestConfig -> Rep TestConfig x) -> (forall x. Rep TestConfig x -> TestConfig) -> Generic TestConfig forall x. Rep TestConfig x -> TestConfig forall x. TestConfig -> Rep TestConfig x forall a. (forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a $cto :: forall x. Rep TestConfig x -> TestConfig $cfrom :: forall x. TestConfig -> Rep TestConfig x Generic) instance Default TestConfig where def :: TestConfig def = Bool -> PluginConfig () -> TestConfig TestConfig Bool False (PluginName -> HostConfig -> Parser () -> PluginConfig () forall c. PluginName -> HostConfig -> Parser c -> PluginConfig c PluginConfig PluginName "test" (LogConfig -> HostConfig HostConfig LogConfig forall a. Default a => a def { $sel:dataLogConc:LogConfig :: Bool dataLogConc = Bool False }) Parser () forall (f :: * -> *). Applicative f => f () unit) data TmuxTestConfig = TmuxTestConfig { TmuxTestConfig -> TestConfig core :: TestConfig, TmuxTestConfig -> TmuxTestConfig tmux :: Chiasma.TmuxTestConfig } deriving stock (TmuxTestConfig -> TmuxTestConfig -> Bool (TmuxTestConfig -> TmuxTestConfig -> Bool) -> (TmuxTestConfig -> TmuxTestConfig -> Bool) -> Eq TmuxTestConfig forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a /= :: TmuxTestConfig -> TmuxTestConfig -> Bool $c/= :: TmuxTestConfig -> TmuxTestConfig -> Bool == :: TmuxTestConfig -> TmuxTestConfig -> Bool $c== :: TmuxTestConfig -> TmuxTestConfig -> Bool Eq, Int -> TmuxTestConfig -> ShowS [TmuxTestConfig] -> ShowS TmuxTestConfig -> String (Int -> TmuxTestConfig -> ShowS) -> (TmuxTestConfig -> String) -> ([TmuxTestConfig] -> ShowS) -> Show TmuxTestConfig forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [TmuxTestConfig] -> ShowS $cshowList :: [TmuxTestConfig] -> ShowS show :: TmuxTestConfig -> String $cshow :: TmuxTestConfig -> String showsPrec :: Int -> TmuxTestConfig -> ShowS $cshowsPrec :: Int -> TmuxTestConfig -> ShowS Show, (forall x. TmuxTestConfig -> Rep TmuxTestConfig x) -> (forall x. Rep TmuxTestConfig x -> TmuxTestConfig) -> Generic TmuxTestConfig forall x. Rep TmuxTestConfig x -> TmuxTestConfig forall x. TmuxTestConfig -> Rep TmuxTestConfig x forall a. (forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a $cto :: forall x. Rep TmuxTestConfig x -> TmuxTestConfig $cfrom :: forall x. TmuxTestConfig -> Rep TmuxTestConfig x Generic) instance Default TmuxTestConfig where def :: TmuxTestConfig def = TestConfig -> TmuxTestConfig -> TmuxTestConfig TmuxTestConfig TestConfig forall a. Default a => a def TmuxTestConfig forall a. Default a => a def { $sel:gui:TmuxTestConfig :: Bool Chiasma.gui = Bool False }