{-# LANGUAGE TemplateHaskell #-} module Test.WebDriver.Capabilities.Timeouts where import Data.Aeson.TH import Test.WebDriver.Capabilities.Aeson data Timeouts = Timeouts { Timeouts -> Maybe Int timeoutsScriptMs :: Maybe Int , Timeouts -> Maybe Int timeoutsPageLoadMs :: Maybe Int , Timeouts -> Maybe Int timeoutsImplicitMs :: Maybe Int } deriving (Int -> Timeouts -> ShowS [Timeouts] -> ShowS Timeouts -> String (Int -> Timeouts -> ShowS) -> (Timeouts -> String) -> ([Timeouts] -> ShowS) -> Show Timeouts forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a $cshowsPrec :: Int -> Timeouts -> ShowS showsPrec :: Int -> Timeouts -> ShowS $cshow :: Timeouts -> String show :: Timeouts -> String $cshowList :: [Timeouts] -> ShowS showList :: [Timeouts] -> ShowS Show, Timeouts -> Timeouts -> Bool (Timeouts -> Timeouts -> Bool) -> (Timeouts -> Timeouts -> Bool) -> Eq Timeouts forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a $c== :: Timeouts -> Timeouts -> Bool == :: Timeouts -> Timeouts -> Bool $c/= :: Timeouts -> Timeouts -> Bool /= :: Timeouts -> Timeouts -> Bool Eq) deriveJSON toCamelC2 ''Timeouts