{-# LANGUAGE TypeApplications #-}

module Main where

import Cardano.Ledger.Conway (Conway)
import Data.Proxy (Proxy (..))
import qualified Test.Cardano.Ledger.Babbage.TxInfo as Babbage (txInfoTests)
import qualified Test.Cardano.Ledger.Conway.TxInfo as Conway (txInfoTests)
import Test.Tasty (TestTree, defaultMain, testGroup)

main :: IO ()
IO ()
main = TestTree -> IO ()
defaultMain TestTree
defaultTests

defaultTests :: TestTree
defaultTests :: TestTree
defaultTests =
  TestName -> [TestTree] -> TestTree
testGroup
    TestName
"Conway tests"
    [ forall era.
(EraTx era, BabbageEraTxBody era,
 Value era ~ MaryValue (EraCrypto era),
 Inject (BabbageContextError era) (ContextError era),
 EraPlutusTxInfo 'PlutusV1 era, EraPlutusTxInfo 'PlutusV2 era) =>
Proxy era -> TestTree
Babbage.txInfoTests (forall {k} (t :: k). Proxy t
Proxy @Conway)
    , forall era. Proxy era -> TestTree
Conway.txInfoTests (forall {k} (t :: k). Proxy t
Proxy @Conway)
    ]