module Ribosome.Host.Test.Data.TestConfig where import Ribosome.Host.Data.HostConfig (HostConfig (HostConfig), dataLogConc) data TestConfig = TestConfig { TestConfig -> Bool freezeTime :: Bool, TestConfig -> HostConfig host :: HostConfig } 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 -> HostConfig -> TestConfig TestConfig Bool False (LogConfig -> HostConfig HostConfig LogConfig forall a. Default a => a def { $sel:dataLogConc:LogConfig :: Bool dataLogConc = Bool False })