Skip to content

Commit

Permalink
minor fix wallet spec
Browse files Browse the repository at this point in the history
  • Loading branch information
ffakenz committed Aug 7, 2024
1 parent 57f1894 commit b3051d2
Showing 1 changed file with 8 additions and 6 deletions.
14 changes: 8 additions & 6 deletions hydra-node/test/Hydra/Chain/Direct/WalletSpec.hs
Original file line number Diff line number Diff line change
Expand Up @@ -5,7 +5,7 @@ module Hydra.Chain.Direct.WalletSpec where
import Hydra.Prelude
import Test.Hydra.Prelude

import Cardano.Ledger.Api (EraTx (getMinFeeTx), EraTxBody (feeTxBodyL, inputsTxBodyL), PParams, bodyTxL, coinTxOutL, outputsTxBodyL)
import Cardano.Ledger.Api (AlonzoEraTxWits (rdmrsTxWitsL), EraTx (getMinFeeTx, witsTxL), EraTxBody (feeTxBodyL, inputsTxBodyL), PParams, bodyTxL, coinTxOutL, outputsTxBodyL)
import Cardano.Ledger.Babbage.Tx (AlonzoTx (..))
import Cardano.Ledger.Babbage.TxBody (BabbageTxBody (..), BabbageTxOut (..))
import Cardano.Ledger.BaseTypes qualified as Ledger
Expand All @@ -15,7 +15,7 @@ import Cardano.Ledger.SafeHash qualified as SafeHash
import Cardano.Ledger.Shelley.API qualified as Ledger
import Cardano.Ledger.Val (Val (..), invert)
import Control.Concurrent (newEmptyMVar, putMVar, takeMVar)
import Control.Lens (set, view, (.~), (<>~), (^.))
import Control.Lens (view, (.~), (<>~), (^.))
import Control.Tracer (nullTracer)
import Data.Map.Strict qualified as Map
import Data.Sequence.Strict qualified as StrictSeq
Expand Down Expand Up @@ -47,6 +47,7 @@ import Hydra.Chain.Direct.Fixture qualified as Fixture
import Hydra.Chain.Direct.Wallet (
Address,
ChainQuery,
SomePParams (BabbagePParams),
TinyWallet (..),
TxIn,
TxOut,
Expand Down Expand Up @@ -120,7 +121,7 @@ setupQuery vk = do
pure $
WalletInfoOnChain
{ walletUTxO
, pparams = Fixture.pparams
, pparams = BabbagePParams Fixture.pparams
, systemStart = Fixture.systemStart
, epochInfo = Fixture.epochInfo
, tip
Expand All @@ -138,7 +139,7 @@ mockChainQuery vk _point addr = do
pure $
WalletInfoOnChain
{ walletUTxO
, pparams = Fixture.pparams
, pparams = BabbagePParams Fixture.pparams
, systemStart = Fixture.systemStart
, epochInfo = Fixture.epochInfo
, tip
Expand Down Expand Up @@ -241,6 +242,8 @@ prop_balanceTransaction =
& counterexample ("Partial tx: \n" <> renderTx (fromLedgerTx tx))
& counterexample ("Lookup UTXO: \n" <> decodeUtf8 (encodePretty lookupUTxO))
& counterexample ("Wallet UTXO: \n" <> decodeUtf8 (encodePretty walletUTxO))
-- FIXME: we do not generate transactions interesting enough.
& cover 5 (tx ^. witsTxL . rdmrsTxWitsL /= mempty) "spending script"

hasLowFees :: PParams LedgerEra -> Tx LedgerEra -> Property
hasLowFees pparams tx =
Expand Down Expand Up @@ -370,8 +373,7 @@ genOutputsForInputs AlonzoTx{body} = do
genLedgerTx :: Gen (Tx LedgerEra)
genLedgerTx = do
tx <- arbitrary
body <- (\x -> x & set feeTxBodyL (Coin 0)) <$> arbitrary
pure $ tx{body, wits = mempty}
pure $ tx & bodyTxL . feeTxBodyL .~ Coin 0

--
-- Helpers
Expand Down

0 comments on commit b3051d2

Please sign in to comment.