{-# LANGUAGE DataKinds #-}

module Cardano.CLI.Commands.Debug.TransactionView where

import           Cardano.CLI.Types.Common

data TransactionViewCmdArgs = TransactionViewCmdArgs
  { TransactionViewCmdArgs -> ViewOutputFormat
outputFormat :: !ViewOutputFormat
  , TransactionViewCmdArgs -> Maybe (File () 'Out)
mOutFile :: !(Maybe (File () Out))
  , TransactionViewCmdArgs -> InputTxBodyOrTxFile
inputTxBodyOrTxFile :: !InputTxBodyOrTxFile
  }
  deriving Int -> TransactionViewCmdArgs -> ShowS
[TransactionViewCmdArgs] -> ShowS
TransactionViewCmdArgs -> String
(Int -> TransactionViewCmdArgs -> ShowS)
-> (TransactionViewCmdArgs -> String)
-> ([TransactionViewCmdArgs] -> ShowS)
-> Show TransactionViewCmdArgs
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> TransactionViewCmdArgs -> ShowS
showsPrec :: Int -> TransactionViewCmdArgs -> ShowS
$cshow :: TransactionViewCmdArgs -> String
show :: TransactionViewCmdArgs -> String
$cshowList :: [TransactionViewCmdArgs] -> ShowS
showList :: [TransactionViewCmdArgs] -> ShowS
Show