Skip to content

Commit 9ff1ed9

Browse files
authoredAug 10, 2022
Merge pull request #139 from mlabs-haskell/vasil-adjust-tx-ench
Intermediate PR to Babbagize adjustUnbalancedTx
2 parents 2d44ed8 + fd36631 commit 9ff1ed9

File tree

4 files changed

+175
-31
lines changed

4 files changed

+175
-31
lines changed
 

‎bot-plutus-interface.cabal

+2
Original file line numberDiff line numberDiff line change
@@ -106,6 +106,7 @@ library
106106
, cardano-crypto
107107
, cardano-ledger-alonzo
108108
, cardano-ledger-core
109+
, cardano-ledger-shelley
109110
, cardano-prelude
110111
, cardano-slotting
111112
, config-schema
@@ -173,6 +174,7 @@ test-suite bot-plutus-interface-test
173174
main-is: Spec.hs
174175
ghc-options: -fplugin-opt PlutusTx.Plugin:defer-errors
175176
other-modules:
177+
Spec.BotPlutusInterface.AdjustUnbalanced
176178
Spec.BotPlutusInterface.Balance
177179
Spec.BotPlutusInterface.Config
178180
Spec.BotPlutusInterface.Contract

‎src/BotPlutusInterface/Contract.hs

+73-31
Original file line numberDiff line numberDiff line change
@@ -34,8 +34,19 @@ import BotPlutusInterface.Types (
3434
Tip (block, slot),
3535
TxFile (Signed),
3636
)
37-
import Cardano.Api (AsType (..), EraInMode (..), Tx (Tx))
38-
import Control.Lens (preview, (^.))
37+
import Cardano.Api (
38+
AsType (..),
39+
EraInMode (..),
40+
ShelleyBasedEra (ShelleyBasedEraBabbage),
41+
Tx (Tx),
42+
toLedgerPParams,
43+
)
44+
import Cardano.Api.Shelley (toShelleyTxOut)
45+
import Cardano.Ledger.Shelley.API.Wallet (
46+
CLI (evaluateMinLovelaceOutput),
47+
)
48+
import Cardano.Prelude (maybeToEither)
49+
import Control.Lens (preview, (.~), (^.))
3950
import Control.Monad (join, void, when)
4051
import Control.Monad.Freer (Eff, Member, interpret, reinterpret, runM, subsume, type (~>))
4152
import Control.Monad.Freer.Error (runError)
@@ -46,7 +57,7 @@ import Control.Monad.Trans.Either (EitherT, eitherT, firstEitherT, newEitherT)
4657
import Data.Aeson (ToJSON, Value (Array, Bool, Null, Number, Object, String))
4758
import Data.Aeson.Extras (encodeByteString)
4859
import Data.Aeson.KeyMap qualified as KeyMap
49-
import Data.Function (fix)
60+
import Data.Function (fix, (&))
5061
import Data.Kind (Type)
5162
import Data.List.NonEmpty (NonEmpty ((:|)))
5263
import Data.Map qualified as Map
@@ -56,15 +67,16 @@ import Data.Text qualified as Text
5667
import Data.Vector qualified as V
5768
import Ledger (POSIXTime)
5869
import Ledger qualified
70+
import Ledger.Ada qualified as Ada
5971
import Ledger.Address (PaymentPubKeyHash (PaymentPubKeyHash))
60-
import Ledger.Constraints.OffChain (UnbalancedTx (..), adjustUnbalancedTx)
61-
import Ledger.Params (Params (Params))
72+
import Ledger.Constraints.OffChain (UnbalancedTx (..), tx)
6273
import Ledger.Slot (Slot (Slot))
63-
import Ledger.TimeSlot (SlotConfig (..))
64-
import Ledger.Tx (CardanoTx (CardanoApiTx, EmulatorTx))
74+
import Ledger.Tx (CardanoTx (CardanoApiTx, EmulatorTx), outputs)
6575
import Ledger.Tx qualified as Tx
76+
import Ledger.Validation (Coin (Coin))
6677
import Plutus.ChainIndex.TxIdState (fromTx, transactionStatus)
6778
import Plutus.ChainIndex.Types (RollbackState (..), TxIdState, TxStatus)
79+
import Plutus.Contract.CardanoAPI (toCardanoTxOutBabbage, toCardanoTxOutDatumHashBabbage)
6880
import Plutus.Contract.Checkpoint (Checkpoint (..))
6981
import Plutus.Contract.Effects (
7082
BalanceTxResponse (..),
@@ -76,6 +88,7 @@ import Plutus.Contract.Effects (
7688
)
7789
import Plutus.Contract.Resumable (Resumable (..))
7890
import Plutus.Contract.Types (Contract (..), ContractEffs)
91+
import Plutus.V1.Ledger.Tx (TxOut (txOutValue))
7992
import PlutusTx.Builtins (fromBuiltin)
8093
import Prettyprinter (Pretty (pretty), (<+>))
8194
import Prettyprinter qualified as PP
@@ -187,8 +200,8 @@ handlePABReq contractEnv req = do
187200
ChainIndexQueryResp <$> queryChainIndex @w query
188201
BalanceTxReq unbalancedTx ->
189202
BalanceTxResp <$> balanceTx @w contractEnv unbalancedTx
190-
WriteBalancedTxReq tx ->
191-
WriteBalancedTxResp <$> writeBalancedTx @w contractEnv tx
203+
WriteBalancedTxReq tx' ->
204+
WriteBalancedTxResp <$> writeBalancedTx @w contractEnv tx'
192205
AwaitSlotReq s -> AwaitSlotResp <$> awaitSlot @w contractEnv s
193206
AwaitTimeReq t -> AwaitTimeResp <$> awaitTime @w contractEnv t
194207
CurrentSlotReq -> CurrentSlotResp <$> currentSlot @w contractEnv
@@ -210,18 +223,47 @@ handlePABReq contractEnv req = do
210223
printBpiLog @w Debug $ pretty resp
211224
pure resp
212225

226+
-- do-not-remove yet, need fo comparison with "own" implementation below
227+
-- minAda calculated fo 1 Lovelace output for this version is 999978
228+
-- adjustUnbalancedTx' ::
229+
-- forall (w :: Type) (effs :: [Type -> Type]).
230+
-- ContractEnvironment w ->
231+
-- UnbalancedTx ->
232+
-- Eff effs (Either Tx.ToCardanoError UnbalancedTx)
233+
-- adjustUnbalancedTx' contractEnv unbalancedTx = do
234+
-- let slotConfig = SlotConfig 20000 1654524000
235+
-- networkId = contractEnv.cePABConfig.pcNetwork
236+
-- maybeParams = contractEnv.cePABConfig.pcProtocolParams >>= \pparams -> pure $ Params slotConfig pparams networkId
237+
-- case maybeParams of
238+
-- Just params -> pure $ snd <$> adjustUnbalancedTx params unbalancedTx
239+
-- _ -> pure . Left $ Tx.TxBodyError "no protocol params"
240+
241+
-- minAda calculated fo 1 Lovelace output for this version is 840450
242+
-- if switch all babbage related things to alonzo, it will calculate 999978 as ^ above
213243
adjustUnbalancedTx' ::
214244
forall (w :: Type) (effs :: [Type -> Type]).
215245
ContractEnvironment w ->
216246
UnbalancedTx ->
217247
Eff effs (Either Tx.ToCardanoError UnbalancedTx)
218-
adjustUnbalancedTx' contractEnv unbalancedTx = do
219-
let slotConfig = SlotConfig 20000 1654524000
220-
networkId = contractEnv.cePABConfig.pcNetwork
221-
maybeParams = contractEnv.cePABConfig.pcProtocolParams >>= \pparams -> pure $ Params slotConfig pparams networkId
222-
case maybeParams of
223-
Just params -> pure $ snd <$> adjustUnbalancedTx params unbalancedTx
224-
_ -> pure . Left $ Tx.TxBodyError "no protocol params"
248+
adjustUnbalancedTx' contractEnv unbalancedTx = pure $ do
249+
pparams <- getPParams
250+
let networkId = contractEnv.cePABConfig.pcNetwork
251+
252+
updatedOuts <- traverse (adjustTxOut networkId pparams) (unbalancedTx ^. tx . outputs)
253+
return $ unbalancedTx & (tx . outputs .~ updatedOuts)
254+
where
255+
getPParams =
256+
maybeToEither (Tx.TxBodyError "No protocol params found in PAB config") $
257+
asBabbageBased toLedgerPParams
258+
<$> contractEnv.cePABConfig.pcProtocolParams
259+
260+
adjustTxOut networkId pparams txOut = do
261+
txOut' <- toCardanoTxOutBabbage networkId toCardanoTxOutDatumHashBabbage txOut
262+
let (Coin minTxOut) = evaluateMinLovelaceOutput pparams (asBabbageBased toShelleyTxOut txOut')
263+
missingLovelace = max 0 (Ada.lovelaceOf minTxOut - Ada.fromValue (txOutValue txOut))
264+
pure $ txOut {txOutValue = txOutValue txOut <> Ada.toValue missingLovelace}
265+
266+
asBabbageBased f = f ShelleyBasedEraBabbage
225267

226268
{- | Await till transaction status change to something from `Unknown`.
227269
Uses `chain-index` to query transaction by id.
@@ -283,9 +325,9 @@ awaitTxStatusChange contractEnv txId = do
283325
queryChainIndexForTxState = do
284326
mTx <- join . preview _TxIdResponse <$> (queryChainIndex @w $ TxFromTxId txId)
285327
case mTx of
286-
Just tx -> do
328+
Just tx' -> do
287329
blk <- fromInteger <$> currentBlock contractEnv
288-
pure . Just $ fromTx blk tx
330+
pure . Just $ fromTx blk tx'
289331
Nothing -> pure Nothing
290332

291333
logDebug = printBpiLog @w Debug . pretty
@@ -310,8 +352,8 @@ balanceTx contractEnv unbalancedTx = do
310352

311353
fromCardanoTx :: CardanoTx -> Tx.Tx
312354
fromCardanoTx (CardanoApiTx _) = error "Cannot handle cardano api tx"
313-
fromCardanoTx (EmulatorTx tx) = tx
314-
fromCardanoTx (Tx.Both tx _) = tx
355+
fromCardanoTx (EmulatorTx tx') = tx'
356+
fromCardanoTx (Tx.Both tx' _) = tx'
315357

316358
-- | This step would build tx files, write them to disk and submit them to the chain
317359
writeBalancedTx ::
@@ -322,48 +364,48 @@ writeBalancedTx ::
322364
Eff effs WriteBalancedTxResponse
323365
writeBalancedTx contractEnv cardanoTx = do
324366
let pabConf = contractEnv.cePABConfig
325-
tx = fromCardanoTx cardanoTx
367+
tx' = fromCardanoTx cardanoTx
326368
uploadDir @w pabConf.pcSigningKeyFileDir
327369
createDirectoryIfMissing @w False (Text.unpack pabConf.pcScriptFileDir)
328370

329371
eitherT (pure . WriteBalancedTxFailed . OtherError) (pure . WriteBalancedTxSuccess . CardanoApiTx) $ do
330-
void $ firstEitherT (Text.pack . show) $ newEitherT $ Files.writeAll @w pabConf tx
372+
void $ firstEitherT (Text.pack . show) $ newEitherT $ Files.writeAll @w pabConf tx'
331373
lift $ uploadDir @w pabConf.pcScriptFileDir
332374

333375
privKeys <- newEitherT $ Files.readPrivateKeys @w pabConf
334376

335-
let requiredSigners = Map.keys $ tx ^. Tx.signatures
377+
let requiredSigners = Map.keys $ tx' ^. Tx.signatures
336378
skeys = Map.filter (\case FromSKey _ -> True; FromVKey _ -> False) privKeys
337379
signable = all ((`Map.member` skeys) . Ledger.pubKeyHash) requiredSigners
338380

339-
void $ newEitherT $ BodyBuilder.buildAndEstimateBudget @w pabConf privKeys tx
381+
void $ newEitherT $ BodyBuilder.buildAndEstimateBudget @w pabConf privKeys tx'
340382

341383
-- TODO: This whole part is hacky and we should remove it.
342-
let path = Text.unpack $ Files.txFilePath pabConf "raw" (Tx.txId tx)
384+
let path = Text.unpack $ Files.txFilePath pabConf "raw" (Tx.txId tx')
343385
-- We read back the tx from file as tx currently has the wrong id (but the one we create with cardano-cli is correct)
344386
alonzoBody <- firstEitherT (Text.pack . show) $ newEitherT $ readFileTextEnvelope @w (AsTxBody AsBabbageEra) path
345387
let cardanoApiTx = Tx.SomeTx (Tx alonzoBody []) BabbageEraInCardanoMode
346388

347389
if signable
348-
then newEitherT $ CardanoCLI.signTx @w pabConf tx requiredSigners
390+
then newEitherT $ CardanoCLI.signTx @w pabConf tx' requiredSigners
349391
else
350392
lift . printBpiLog @w Warn . PP.vsep $
351393
[ "Not all required signatures have signing key files. Please sign and submit the tx manually:"
352-
, "Tx file:" <+> pretty (Files.txFilePath pabConf "raw" (Tx.txId tx))
394+
, "Tx file:" <+> pretty (Files.txFilePath pabConf "raw" (Tx.txId tx'))
353395
, "Signatories (pkh):" <+> pretty (Text.unwords (map pkhToText requiredSigners))
354396
]
355397

356398
when (pabConf.pcCollectStats && signable) $
357-
collectBudgetStats (Tx.txId tx) pabConf
399+
collectBudgetStats (Tx.txId tx') pabConf
358400

359401
when (not pabConf.pcDryRun && signable) $ do
360-
newEitherT $ CardanoCLI.submitTx @w pabConf tx
402+
newEitherT $ CardanoCLI.submitTx @w pabConf tx'
361403

362404
-- We need to replace the outfile we created at the previous step, as it currently still has the old (incorrect) id
363405
let cardanoTxId = Ledger.getCardanoTxId $ Tx.CardanoApiTx cardanoApiTx
364-
signedSrcPath = Files.txFilePath pabConf "signed" (Tx.txId tx)
406+
signedSrcPath = Files.txFilePath pabConf "signed" (Tx.txId tx')
365407
signedDstPath = Files.txFilePath pabConf "signed" cardanoTxId
366-
mvFiles (Files.txFilePath pabConf "raw" (Tx.txId tx)) (Files.txFilePath pabConf "raw" cardanoTxId)
408+
mvFiles (Files.txFilePath pabConf "raw" (Tx.txId tx')) (Files.txFilePath pabConf "raw" cardanoTxId)
367409
when signable $ mvFiles signedSrcPath signedDstPath
368410

369411
pure cardanoApiTx

‎test/Spec.hs

+2
Original file line numberDiff line numberDiff line change
@@ -1,5 +1,6 @@
11
module Main (main) where
22

3+
import Spec.BotPlutusInterface.AdjustUnbalanced qualified
34
import Spec.BotPlutusInterface.Balance qualified
45
import Spec.BotPlutusInterface.Contract qualified
56
import Spec.BotPlutusInterface.ContractStats qualified
@@ -27,4 +28,5 @@ tests =
2728
, Spec.BotPlutusInterface.Server.tests
2829
, Spec.BotPlutusInterface.ContractStats.tests
2930
, Spec.BotPlutusInterface.TxStatusChange.tests
31+
, Spec.BotPlutusInterface.AdjustUnbalanced.tests
3032
]
Original file line numberDiff line numberDiff line change
@@ -0,0 +1,98 @@
1+
module Spec.BotPlutusInterface.AdjustUnbalanced (tests) where
2+
3+
import BotPlutusInterface.Types (
4+
ContractEnvironment (cePABConfig),
5+
PABConfig (pcOwnPubKeyHash, pcProtocolParams),
6+
)
7+
import Control.Lens ((&), (.~), (^.))
8+
import Data.Default (def)
9+
import Data.Text (Text)
10+
import Ledger (
11+
ChainIndexTxOut (PublicKeyChainIndexTxOut),
12+
PaymentPubKeyHash (unPaymentPubKeyHash),
13+
TxOut (..),
14+
Value,
15+
outputs,
16+
pubKeyHashAddress,
17+
)
18+
import Ledger.Ada qualified as Ada
19+
import Ledger.Constraints qualified as Constraints
20+
import Ledger.Tx (TxOutRef (TxOutRef))
21+
import Plutus.ChainIndex (OutputDatum (NoOutputDatum))
22+
import Plutus.Contract (
23+
Contract (..),
24+
Endpoint,
25+
adjustUnbalancedTx,
26+
)
27+
import Spec.MockContract (
28+
contractEnv,
29+
paymentPkh1,
30+
paymentPkh2,
31+
paymentPkh3,
32+
pkhAddr1,
33+
runContractPure,
34+
utxos,
35+
)
36+
import Test.Tasty (TestTree)
37+
import Test.Tasty.HUnit (Assertion, assertBool, assertFailure, testCase)
38+
import Prelude
39+
40+
import Data.Foldable (find)
41+
import Data.Void (Void)
42+
import Ledger.Ada (fromValue)
43+
import Ledger.Constraints.OffChain (tx)
44+
45+
tests :: TestTree
46+
tests = testCase "Adjusting unbalanced transaction" testOutsGetAdjusted
47+
48+
testOutsGetAdjusted :: Assertion
49+
testOutsGetAdjusted = do
50+
let txOutRef = TxOutRef "e406b0cf676fc2b1a9edb0617f259ad025c20ea6f0333820aa7cef1bfe7302e5" 0
51+
txOut = PublicKeyChainIndexTxOut pkhAddr1 (Ada.lovelaceValueOf 1350) NoOutputDatum Nothing
52+
initState =
53+
def & utxos .~ [(txOutRef, txOut)]
54+
& contractEnv .~ contractEnv'
55+
pabConf = def {pcOwnPubKeyHash = unPaymentPubKeyHash paymentPkh1, pcProtocolParams = Just def}
56+
contractEnv' = def {cePABConfig = pabConf}
57+
58+
smallValue = Ada.lovelaceValueOf 1
59+
bigEnoughValue = Ada.adaValueOf 777
60+
61+
shouldBeAdjusted = (paymentPkh2, smallValue)
62+
shouldNotBeAdjusted = (paymentPkh3, bigEnoughValue)
63+
64+
contract :: Contract () (Endpoint "SendAda" ()) Text [TxOut]
65+
contract = do
66+
let constraints = foldMap toPayConstraint [shouldBeAdjusted, shouldNotBeAdjusted]
67+
utx = either (error . show) id (Constraints.mkTx @Void mempty constraints)
68+
adjustedUtx <- adjustUnbalancedTx utx
69+
return (adjustedUtx ^. tx . outputs)
70+
71+
case runContractPure contract initState of
72+
(Right outs, _) -> do
73+
-- check of value that should be adjusted
74+
assertBool
75+
"Small values should be adjusted and become bigger"
76+
(fromValue (outValueForPkh outs paymentPkh2) > fromValue smallValue)
77+
78+
-- check of value that should NOT be adjusted
79+
let resultAdaAmount = fromValue (outValueForPkh outs paymentPkh3)
80+
initialAdaAmount = fromValue bigEnoughValue
81+
errMessage =
82+
"Big enough value should not be adjusted, but it changed: "
83+
<> show initialAdaAmount
84+
<> " -> "
85+
<> show resultAdaAmount
86+
assertBool errMessage (resultAdaAmount == initialAdaAmount)
87+
e -> assertFailure $ "RES:\n" ++ show e
88+
89+
toPayConstraint :: (PaymentPubKeyHash, Value) -> Constraints.TxConstraints i o
90+
toPayConstraint (pkh, value) = Constraints.mustPayToPubKey pkh value
91+
92+
outValueForPkh :: [TxOut] -> PaymentPubKeyHash -> Value
93+
outValueForPkh outs pkh =
94+
let address = pubKeyHashAddress pkh Nothing
95+
in maybe
96+
(error "Should not happen: value for PKH used in test not found")
97+
txOutValue
98+
$ flip find outs $ \txOut -> address == txOutAddress txOut

0 commit comments

Comments
 (0)
Please sign in to comment.