Skip to content

Commit 9cb8081

Browse files
authored
Transaction generation now live in MonadBlockChainBalancing (#466)
* min ada in each output * adding logging * update CHANGELOG and CHEATSHEET * some more comments * AdjustableValue -> FixedValue * begin to have generate tx live in our mockchain * generateTx/xxx compiles * all tests pass * a few helpers adjustments * preparing v5 release
1 parent 39ef770 commit 9cb8081

23 files changed

+323
-565
lines changed

CHANGELOG.md

+12-1
Original file line numberDiff line numberDiff line change
@@ -4,6 +4,16 @@
44

55
### Added
66

7+
### Removed
8+
9+
### Changed
10+
11+
### Fixed
12+
13+
## [[5.0.0]](https://github.com/tweag/cooked-validators/releases/tag/v5.0.0) - 2024-06-28
14+
15+
### Added
16+
717
- `quickCurrencyPolicyV3` and `permanentCurrencyPolicyV3` which should be the
818
most commonly used.
919
- All kinds of scripts can now be used as reference scripts.
@@ -61,7 +71,6 @@
6171
- `txSkelInputData` changed to `txSkelInputDataAsHashes`
6272
- Pretty printing of hashed datum now includes the hash (and not only the
6373
resolved datum).
64-
- Dependency to cardano-api bumped to 8.46.
6574
- Logging has been reworked:
6675
* it is no longer limited to `StagedMockChain` runs
6776
* it is now a component of `MonadBlockChainBalancing`
@@ -76,6 +85,8 @@
7685
`Output.hs`.
7786
- File `Skeleton.hs` has been split into sub-files in the `Skeleton` folder.
7887
- Default language extensions and compilation options have been updated.
88+
- Transaction generation now directly lives in `MonadMockChainBalancing`.
89+
- Initial distributions are now handled as a first action in the `MockChain`.
7990

8091
### Fixed
8192

cooked-validators.cabal

+1-1
Original file line numberDiff line numberDiff line change
@@ -5,7 +5,7 @@ cabal-version: 3.4
55
-- see: https://github.com/sol/hpack
66

77
name: cooked-validators
8-
version: 4.0.0
8+
version: 5.0.0
99
license: MIT
1010
license-file: LICENSE
1111
build-type: Simple

package.yaml

+1-1
Original file line numberDiff line numberDiff line change
@@ -2,7 +2,7 @@ verbatim:
22
cabal-version: 3.4
33

44
name: cooked-validators
5-
version: 4.0.0
5+
version: 5.0.0
66

77
dependencies:
88
- QuickCheck

src/Cooked/MockChain/Balancing.hs

+8-18
Original file line numberDiff line numberDiff line change
@@ -16,7 +16,7 @@ import Control.Monad
1616
import Control.Monad.Except
1717
import Cooked.Conversion
1818
import Cooked.MockChain.BlockChain
19-
import Cooked.MockChain.GenerateTx
19+
import Cooked.MockChain.GenerateTx.Body
2020
import Cooked.MockChain.MinAda
2121
import Cooked.MockChain.UtxoSearch
2222
import Cooked.Output
@@ -286,11 +286,11 @@ reachValue (h@(_, Api.txOutValue -> hVal) : t) target maxEls =
286286
-- `reachValue`. This throws an error when there are no suitable candidates.
287287
getOptimalCandidate :: (MonadBlockChainBalancing m) => [(BalancingOutputs, Api.Value)] -> Wallet -> MockChainError -> m ([Api.TxOutRef], Api.Value)
288288
getOptimalCandidate candidates paymentTarget mceError = do
289-
params <- getParams
290289
-- We decorate the candidates with their current ada and min ada requirements
291-
let candidatesDecorated = second (\val -> (val, Script.fromValue val, getTxSkelOutMinAda params $ paymentTarget `receives` Value val)) <$> candidates
292-
-- We filter the candidates that have enough ada to sustain themselves
293-
candidatesFiltered = [(minLv, (fst <$> l, val)) | (l, (val, Script.Lovelace lv, Right minLv)) <- candidatesDecorated, minLv <= lv]
290+
candidatesDecorated <- forM candidates $ \(output, val) ->
291+
(output,val,Script.fromValue val,) <$> getTxSkelOutMinAda (paymentTarget `receives` Value val)
292+
-- We filter the candidates that have enough ada to sustain themselves
293+
let candidatesFiltered = [(minLv, (fst <$> l, val)) | (l, val, Script.Lovelace lv, minLv) <- candidatesDecorated, minLv <= lv]
294294
case sortBy (compare `on` fst) candidatesFiltered of
295295
-- If the list of candidates is empty, we throw an error
296296
[] -> throwError mceError
@@ -302,20 +302,13 @@ estimateTxSkelFee :: (MonadBlockChainBalancing m) => TxSkel -> Fee -> Maybe (Col
302302
estimateTxSkelFee skel fee mCollaterals = do
303303
-- We retrieve the necessary data to generate the transaction body
304304
params <- getParams
305-
managedData <- txSkelHashedData skel
306305
let collateralIns = case mCollaterals of
307306
Nothing -> []
308307
Just (s, _) -> Set.toList s
309-
managedTxOuts <- lookupUtxos $ txSkelKnownTxOutRefs skel <> collateralIns
310-
managedValidators <- txSkelInputValidators skel
311308
-- We generate the transaction body content, handling errors in the meantime
312-
txBodyContent <- case generateBodyContent fee params managedData managedTxOuts managedValidators mCollaterals skel of
313-
Left err -> throwError $ MCEGenerationError err
314-
Right txBodyContent -> return txBodyContent
309+
txBodyContent <- txSkelToTxBodyContent skel fee mCollaterals
315310
-- We create the actual body and send if for validation
316-
txBody <- case Cardano.createAndValidateTransactionBody Cardano.ShelleyBasedEraConway txBodyContent of
317-
Left err -> throwError $ MCEGenerationError $ TxBodyError "Error creating body when estimating fees" err
318-
Right txBody -> return txBody
311+
txBody <- txBodyContentToTxBody txBodyContent skel
319312
-- We retrieve the estimate number of required witness in the transaction
320313
let nkeys = Cardano.estimateTransactionKeyWitnessCount txBodyContent
321314
-- We need to reconstruct an index to pass to the fee estimate function
@@ -338,7 +331,6 @@ estimateTxSkelFee skel fee mCollaterals = do
338331
-- value + withdrawn value = output value + burned value + fee + deposits
339332
computeBalancedTxSkel :: (MonadBlockChainBalancing m) => Wallet -> BalancingOutputs -> TxSkel -> Fee -> m TxSkel
340333
computeBalancedTxSkel balancingWallet balancingUtxos txSkel@TxSkel {..} (Script.lovelace -> feeValue) = do
341-
params <- getParams
342334
-- We compute the necessary values from the skeleton that are part of the
343335
-- equation, except for the `feeValue` which we already have.
344336
let (burnedValue, mintedValue) = Api.split $ txSkelMintsValue txSkelMints
@@ -349,9 +341,7 @@ computeBalancedTxSkel balancingWallet balancingUtxos txSkel@TxSkel {..} (Script.
349341
-- We compute the values missing in the left and right side of the equation
350342
let (missingRight, missingLeft) = Api.split $ outValue <> burnedValue <> feeValue <> depositedValue <> PlutusTx.negate (inValue <> mintedValue <> withdrawnValue)
351343
-- We compute the minimal ada requirement of the missing payment
352-
rightMinAda <- case getTxSkelOutMinAda params $ balancingWallet `receives` Value missingRight of
353-
Left err -> throwError $ MCEGenerationError err
354-
Right a -> return a
344+
rightMinAda <- getTxSkelOutMinAda $ balancingWallet `receives` Value missingRight
355345
-- We compute the current ada of the missing payment. If the missing payment
356346
-- is not empty and the minimal ada is not present, some value is missing.
357347
let Script.Lovelace rightAda = missingRight ^. Script.adaL

src/Cooked/MockChain/BlockChain.hs

+24-35
Original file line numberDiff line numberDiff line change
@@ -14,7 +14,8 @@
1414
-- In addition, you will find here many helpers functions which can be derived
1515
-- from the core definition of our blockchain.
1616
module Cooked.MockChain.BlockChain
17-
( MockChainError (..),
17+
( GenerateTxError (..),
18+
MockChainError (..),
1819
MockChainLogEntry (..),
1920
MonadBlockChainBalancing (..),
2021
MonadBlockChainWithoutValidation (..),
@@ -43,7 +44,6 @@ module Cooked.MockChain.BlockChain
4344
txSkelReferenceInputUtxos,
4445
txSkelInputValidators,
4546
txSkelInputValue,
46-
txSkelHashedData,
4747
txSkelInputDataAsHashes,
4848
lookupUtxos,
4949
validateTxSkel',
@@ -55,6 +55,7 @@ module Cooked.MockChain.BlockChain
5555
)
5656
where
5757

58+
import Cardano.Api qualified as Cardano
5859
import Cardano.Api.Ledger qualified as Cardano
5960
import Cardano.Ledger.Conway.PParams qualified as Conway
6061
import Cardano.Node.Emulator qualified as Emulator
@@ -69,7 +70,6 @@ import Control.Monad.Writer
6970
import Cooked.Conversion.ToCredential
7071
import Cooked.Conversion.ToOutputDatum
7172
import Cooked.Conversion.ToScriptHash
72-
import Cooked.MockChain.GenerateTx
7373
import Cooked.MockChain.UtxoState
7474
import Cooked.Output
7575
import Cooked.Skeleton
@@ -91,7 +91,17 @@ import PlutusLedgerApi.V3 qualified as Api
9191

9292
-- * MockChain errors
9393

94-
-- | The errors that can be produced by the 'MockChainT' monad
94+
-- | Errors that can arise during transaction generation
95+
data GenerateTxError
96+
= -- | Error when translating a skeleton element to its Cardano counterpart
97+
ToCardanoError String Ledger.ToCardanoError
98+
| -- | Error when generating a Cardano transaction body
99+
TxBodyError String Cardano.TxBodyError
100+
| -- | Other generation error
101+
GenerateTxErrorGeneral String
102+
deriving (Show, Eq)
103+
104+
-- | Errors that can be produced by the 'MockChainT' monad
95105
data MockChainError
96106
= -- | Validation errors, either in Phase 1 or Phase 2
97107
MCEValidationError Ledger.ValidationPhase Ledger.ValidationError
@@ -288,10 +298,10 @@ resolveReferenceScript out | Just (Api.ScriptHash hash) <- outputReferenceScript
288298
return $ (fromAbstractOutput out) {concreteOutputReferenceScript = Just val}
289299
resolveReferenceScript _ = return Nothing
290300

291-
outputDatumFromTxOutRef :: (MonadBlockChainWithoutValidation m) => Api.TxOutRef -> m (Maybe Api.OutputDatum)
301+
outputDatumFromTxOutRef :: (MonadBlockChainBalancing m) => Api.TxOutRef -> m (Maybe Api.OutputDatum)
292302
outputDatumFromTxOutRef = ((outputOutputDatum <$>) <$>) . txOutByRef
293303

294-
datumFromTxOutRef :: (MonadBlockChainWithoutValidation m) => Api.TxOutRef -> m (Maybe Api.Datum)
304+
datumFromTxOutRef :: (MonadBlockChainBalancing m) => Api.TxOutRef -> m (Maybe Api.Datum)
295305
datumFromTxOutRef oref = do
296306
mOutputDatum <- outputDatumFromTxOutRef oref
297307
case mOutputDatum of
@@ -300,10 +310,10 @@ datumFromTxOutRef oref = do
300310
Just (Api.OutputDatum datum) -> return $ Just datum
301311
Just (Api.OutputDatumHash datumHash) -> datumFromHash datumHash
302312

303-
typedDatumFromTxOutRef :: (Api.FromData a, MonadBlockChainWithoutValidation m) => Api.TxOutRef -> m (Maybe a)
313+
typedDatumFromTxOutRef :: (Api.FromData a, MonadBlockChainBalancing m) => Api.TxOutRef -> m (Maybe a)
304314
typedDatumFromTxOutRef = ((>>= (\(Api.Datum datum) -> Api.fromBuiltinData datum)) <$>) . datumFromTxOutRef
305315

306-
valueFromTxOutRef :: (MonadBlockChainWithoutValidation m) => Api.TxOutRef -> m (Maybe Api.Value)
316+
valueFromTxOutRef :: (MonadBlockChainBalancing m) => Api.TxOutRef -> m (Maybe Api.Value)
307317
valueFromTxOutRef = ((outputValue <$>) <$>) . txOutByRef
308318

309319
txSkelInputUtxos :: (MonadBlockChainBalancing m) => TxSkel -> m (Map Api.TxOutRef Api.TxOut)
@@ -356,37 +366,16 @@ lookupUtxos =
356366
txSkelInputValue :: (MonadBlockChainBalancing m) => TxSkel -> m Api.Value
357367
txSkelInputValue = (foldMap Api.txOutValue <$>) . txSkelInputUtxos
358368

359-
-- | Looks up and resolves the hashed datums on UTxOs the transaction consumes
360-
-- or references, which will be needed by the transaction body.
361-
txSkelHashedData :: (MonadBlockChainBalancing m) => TxSkel -> m (Map Api.DatumHash Api.Datum)
362-
txSkelHashedData skel = do
363-
(Map.elems -> inputTxOuts) <- txSkelInputUtxos skel
364-
(Map.elems -> refInputTxOuts) <- txSkelReferenceInputUtxos skel
365-
foldM
366-
( \dat dHash ->
367-
maybeErrM
368-
(MCEUnknownDatum "txSkelHashedData: Transaction input with unknown datum hash" dHash)
369-
(\rDat -> Map.insert dHash rDat dat)
370-
(datumFromHash dHash)
371-
)
372-
Map.empty
373-
(mapMaybe (fmap (^. outputDatumL) . isOutputWithDatumHash) $ inputTxOuts <> refInputTxOuts)
374-
375369
-- | Looks up the data on UTxOs the transaction consumes and returns their
376-
-- hashes. This corresponds to the keys of what should be removed from the
377-
-- stored datums in our mockchain. There can be duplicates, which is expected.
370+
-- hashes.
378371
txSkelInputDataAsHashes :: (MonadBlockChainBalancing m) => TxSkel -> m [Api.DatumHash]
379372
txSkelInputDataAsHashes skel = do
380-
let outputToDatumHashM output = case output ^. outputDatumL of
381-
Api.OutputDatumHash dHash ->
382-
maybeErrM
383-
(MCEUnknownDatum "txSkelInputDataAsHashes: Transaction input with unknown datum hash" dHash)
384-
(Just . const dHash)
385-
(datumFromHash dHash)
386-
Api.OutputDatum datum -> return $ Just $ Script.datumHash datum
387-
Api.NoOutputDatum -> return Nothing
373+
let outputToDatumHash output = case output ^. outputDatumL of
374+
Api.OutputDatumHash dHash -> Just dHash
375+
Api.OutputDatum datum -> Just $ Script.datumHash datum
376+
Api.NoOutputDatum -> Nothing
388377
(Map.elems -> inputTxOuts) <- txSkelInputUtxos skel
389-
catMaybes <$> mapM outputToDatumHashM inputTxOuts
378+
return $ mapMaybe outputToDatumHash inputTxOuts
390379

391380
-- | This creates a payment from an existing UTXO
392381
txOutRefToTxSkelOut ::

src/Cooked/MockChain/Direct.hs

+12-31
Original file line numberDiff line numberDiff line change
@@ -25,7 +25,6 @@ import Cooked.Output
2525
import Cooked.Skeleton
2626
import Data.Default
2727
import Data.Map.Strict qualified as Map
28-
import Data.Set qualified as Set
2928
import Ledger.Index qualified as Ledger
3029
import Ledger.Orphans ()
3130
import Ledger.Tx qualified as Ledger
@@ -82,13 +81,10 @@ mapMockChainT ::
8281
MockChainT n b
8382
mapMockChainT f = MockChainT . mapStateT (mapExceptT (mapWriterT f)) . unMockChain
8483

85-
-- | Executes a 'MockChainT' from some initial state; does /not/ convert the
86-
-- 'MockChainSt' into a 'UtxoState'.
8784
runMockChainTRaw ::
88-
MockChainSt ->
8985
MockChainT m a ->
9086
m (MockChainReturn a MockChainSt)
91-
runMockChainTRaw i0 = runWriterT . runExceptT . flip runStateT i0 . unMockChain
87+
runMockChainTRaw = runWriterT . runExceptT . flip runStateT def . unMockChain
9288

9389
-- | Executes a 'MockChainT' from an initial state set up with the given initial
9490
-- value distribution. Similar to 'runMockChainT', uses the default
@@ -99,18 +95,15 @@ runMockChainTFrom ::
9995
InitialDistribution ->
10096
MockChainT m a ->
10197
m (MockChainReturn a UtxoState)
102-
runMockChainTFrom i0 s = first (right (second mcstToUtxoState)) <$> runMockChainTRaw (mockChainSt0From i0) s
98+
runMockChainTFrom i0 s =
99+
first (right (second mcstToUtxoState))
100+
<$> runMockChainTRaw (mockChainSt0From i0 >>= put >> s)
103101

104102
-- | Executes a 'MockChainT' from the canonical initial state and environment.
105-
-- The canonical environment uses the default 'SlotConfig' and
106-
-- @Cooked.Wallet.wallet 1@ as the sole wallet signing transactions.
103+
-- The canonical environment uses the default 'SlotConfig'
107104
runMockChainT :: (Monad m) => MockChainT m a -> m (MockChainReturn a UtxoState)
108105
runMockChainT = runMockChainTFrom def
109106

110-
-- | See 'runMockChainTRaw'
111-
runMockChainRaw :: MockChain a -> MockChainReturn a MockChainSt
112-
runMockChainRaw = runIdentity . runMockChainTRaw def
113-
114107
-- | See 'runMockChainTFrom'
115108
runMockChainFrom :: InitialDistribution -> MockChain a -> MockChainReturn a UtxoState
116109
runMockChainFrom i0 = runIdentity . runMockChainTFrom i0
@@ -156,22 +149,9 @@ instance (Monad m) => MonadBlockChain (MockChainT m) where
156149
(skel, fee, mCollaterals) <- balanceTxSkel minAdaRefScriptsSkelUnbal
157150
-- We log the adjusted skeleton
158151
gets mcstToSkelContext >>= \ctx -> logEvent $ MCLogAdjustedTxSkel ctx skel fee mCollaterals
159-
-- We retrieve data that will be used in the transaction generation process:
160-
-- datums, validators and various kinds of inputs. This idea is to provide a
161-
-- rich-enough context for the transaction generation to succeed.
162-
hashedData <- txSkelHashedData skel
163-
insData <- txSkelInputDataAsHashes skel
164-
insValidators <- txSkelInputValidators skel
165-
insMap <- txSkelInputUtxos skel
166-
refInsMap <- txSkelReferenceInputUtxos skel
167-
collateralInsMap <- maybe (return Map.empty) (lookupUtxos . Set.toList . fst) mCollaterals
168-
-- We attempt to generate the transaction associated with the balanced
169-
-- skeleton and the retrieved data. This is an internal generation, there is
170-
-- no validation involved yet.
171-
cardanoTx <- case generateTx fee newParams hashedData (insMap <> refInsMap <> collateralInsMap) insValidators mCollaterals skel of
172-
Left err -> throwError . MCEGenerationError $ err
173-
-- We apply post-generation modification when applicable
174-
Right tx -> return $ Ledger.CardanoEmulatorEraTx $ applyRawModOnBalancedTx txOptUnsafeModTx tx
152+
-- We generate the transaction associated with the skeleton, and apply on it
153+
-- the modifications from the skeleton options
154+
cardanoTx <- Ledger.CardanoEmulatorEraTx . applyRawModOnBalancedTx txOptUnsafeModTx <$> txSkelToCardanoTx skel fee mCollaterals
175155
-- To run transaction validation we need a minimal ledger state
176156
eLedgerState <- gets mcstToEmulatedLedgerState
177157
-- We finally run the emulated validation, and we only care about the
@@ -191,19 +171,20 @@ instance (Monad m) => MonadBlockChain (MockChainT m) where
191171
-- In case of success, we update the index with all inputs and outputs
192172
-- contained in the transaction
193173
Ledger.Success {} -> (Ledger.insert cardanoTx utxoIndex, Nothing)
194-
-- Now that we have compute a new index, we can update it
195-
modify' (\st -> st {mcstIndex = newUtxoIndex})
196174
case valError of
197175
-- When validation failed for any reason, we throw an error. TODO: This
198176
-- behavior could be subject to change in the future.
199177
Just err -> throwError (uncurry MCEValidationError err)
200178
-- Otherwise, we update known validators and datums.
201-
Nothing ->
179+
Nothing -> do
180+
insData <- txSkelInputDataAsHashes skel
202181
modify'
203182
( removeDatums insData
204183
. addDatums (txSkelDataInOutputs skel)
205184
. addValidators (txSkelValidatorsInOutputs skel <> txSkelReferenceScripts skel)
206185
)
186+
-- Now that we have computed a new index, we can update it
187+
modify' (\st -> st {mcstIndex = newUtxoIndex})
207188
-- We apply a change of slot when requested in the options
208189
when txOptAutoSlotIncrease $ modify' (\st -> st {mcstCurrentSlot = mcstCurrentSlot st + 1})
209190
-- We return the parameters to their original state

0 commit comments

Comments
 (0)