module Buffet.Test.TestSetup
  ( TestSetup(..)
  ) where

import qualified Buffet.Ir.Ir as Ir
import qualified Data.Text as T
import Prelude (Eq, Show)
import qualified System.IO as IO

data TestSetup =
  TestSetup
    { TestSetup -> Handle
log :: IO.Handle
    , TestSetup -> Text
image :: T.Text
    , TestSetup -> Option
option :: Ir.Option
    , TestSetup -> Text
optionValue :: T.Text
    , TestSetup -> Dish
dish :: Ir.Dish
    }
  deriving (TestSetup -> TestSetup -> Bool
(TestSetup -> TestSetup -> Bool)
-> (TestSetup -> TestSetup -> Bool) -> Eq TestSetup
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: TestSetup -> TestSetup -> Bool
$c/= :: TestSetup -> TestSetup -> Bool
== :: TestSetup -> TestSetup -> Bool
$c== :: TestSetup -> TestSetup -> Bool
Eq, Int -> TestSetup -> ShowS
[TestSetup] -> ShowS
TestSetup -> String
(Int -> TestSetup -> ShowS)
-> (TestSetup -> String)
-> ([TestSetup] -> ShowS)
-> Show TestSetup
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [TestSetup] -> ShowS
$cshowList :: [TestSetup] -> ShowS
show :: TestSetup -> String
$cshow :: TestSetup -> String
showsPrec :: Int -> TestSetup -> ShowS
$cshowsPrec :: Int -> TestSetup -> ShowS
Show)