{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE TypeFamilies #-}

{-# OPTIONS_GHC -Wno-orphans #-}

module Test.ThreadNet.TxGen.Mary () where

import           Ouroboros.Consensus.Protocol.TPraos (TPraos)
import           Ouroboros.Consensus.Shelley.Eras
import           Ouroboros.Consensus.Shelley.Ledger
import           Test.ThreadNet.TxGen (TxGen (..))

-- | Dummy generator until CAD-2119 is done, i.e., the transaction generator in
-- the ledger has been generalised over the eras.
instance TxGen (ShelleyBlock (TPraos c) (MaryEra c)) where

  type TxGenExtra _ = ()

  testGenTxs :: CoreNodeId
-> NumCoreNodes
-> SlotNo
-> TopLevelConfig (ShelleyBlock (TPraos c) (MaryEra c))
-> TxGenExtra (ShelleyBlock (TPraos c) (MaryEra c))
-> LedgerState (ShelleyBlock (TPraos c) (MaryEra c))
-> Gen [GenTx (ShelleyBlock (TPraos c) (MaryEra c))]
testGenTxs CoreNodeId
_ NumCoreNodes
_ SlotNo
_ TopLevelConfig (ShelleyBlock (TPraos c) (MaryEra c))
_ TxGenExtra (ShelleyBlock (TPraos c) (MaryEra c))
_ LedgerState (ShelleyBlock (TPraos c) (MaryEra c))
_ = [GenTx (ShelleyBlock (TPraos c) (MaryEra c))]
-> Gen [GenTx (ShelleyBlock (TPraos c) (MaryEra c))]
forall a. a -> Gen a
forall (f :: * -> *) a. Applicative f => a -> f a
pure []