Skip to content

Commit f113fcd

Browse files
ch1bov0d1ch
authored andcommitted
Re-used publish scripts tx building and awaiting
Signed-off-by: Sasha Bogicevic <[email protected]>
1 parent 2adaffa commit f113fcd

File tree

9 files changed

+87
-79
lines changed

9 files changed

+87
-79
lines changed

docs/docs/configuration.md

+2-2
Original file line numberDiff line numberDiff line change
@@ -130,8 +130,8 @@ You can also use blockfrost for script publishing. On top of providing cardano s
130130

131131
```shell
132132
hydra-node publish-scripts \
133-
--blockfrost-project-path /path/to/node.socket \
134-
--blockfrost-cardano-signing-key cardano.sk
133+
--blockfrost /path/to/node.socket \
134+
--cardano-signing-key cardano.sk
135135
```
136136

137137
### Ledger parameters

hydra-cluster/src/Hydra/Cluster/Faucet.hs

+4-4
Original file line numberDiff line numberDiff line change
@@ -22,7 +22,7 @@ import Control.Monad.Class.MonadThrow (Handler (Handler), catches)
2222
import Control.Tracer (Tracer, traceWith)
2323
import GHC.IO.Exception (IOErrorType (ResourceExhausted), IOException (ioe_type))
2424
import Hydra.Chain.ScriptRegistry (
25-
publishHydraScripts,
25+
publishHydraScripts',
2626
)
2727
import Hydra.Cluster.Fixture (Actor (Faucet))
2828
import Hydra.Cluster.Util (keysFor)
@@ -200,6 +200,6 @@ retryOnExceptions tracer action =
200200
publishHydraScriptsAs :: RunningNode -> Actor -> IO [TxId]
201201
publishHydraScriptsAs RunningNode{networkId, nodeSocket} actor = do
202202
(_, sk) <- keysFor actor
203-
publishHydraScripts networkId nodeSocket sk
204-
-- FIXME: need to figure out how to await for txs here
205-
-- >>= mapM (awaitTransaction networkId nodeSocket)
203+
txs <- publishHydraScripts' networkId nodeSocket sk
204+
mapM_ (awaitTransaction networkId nodeSocket) txs
205+
pure $ getTxId . getTxBody <$> txs

hydra-cluster/src/Hydra/Cluster/Scenarios.hs

+1-1
Original file line numberDiff line numberDiff line change
@@ -96,7 +96,7 @@ import Hydra.Cluster.Util (chainConfigFor, keysFor, modifyConfig, setNetworkId)
9696
import Hydra.Ledger.Cardano (mkSimpleTx, mkTransferTx, unsafeBuildTransaction)
9797
import Hydra.Ledger.Cardano.Evaluate (maxTxExecutionUnits)
9898
import Hydra.Logging (Tracer, traceWith)
99-
import Hydra.Options (DirectChainConfig (..), networkId, startChainFrom)
99+
import Hydra.Options (DirectChainConfig (..), startChainFrom)
100100
import Hydra.Tx (HeadId, IsTx (balance), Party, txId)
101101
import Hydra.Tx.ContestationPeriod (ContestationPeriod (UnsafeContestationPeriod), fromNominalDiffTime)
102102
import Hydra.Tx.DepositDeadline (DepositDeadline (..))

hydra-cluster/test/Test/DirectChainSpec.hs

+1
Original file line numberDiff line numberDiff line change
@@ -429,6 +429,7 @@ spec = around (showLogsOnFailure "DirectChainSpec") $ do
429429
)
430430
""
431431
let hydraScriptsTxId = fromString <$> splitWhen (== ',') (filter (/= '\n') hydraScriptsTxIdStr)
432+
threadDelay 1
432433
failAfter 5 $ void $ queryScriptRegistry networkId nodeSocket hydraScriptsTxId
433434

434435
it "can only contest once" $ \tracer -> do

hydra-node/src/Hydra/Chain/Blockfrost/Client.hs

+8-16
Original file line numberDiff line numberDiff line change
@@ -39,10 +39,8 @@ import Data.Default (def)
3939
import Data.SOP.NonEmpty (NonEmpty (..))
4040
import Data.Set qualified as Set
4141
import Hydra.Cardano.Api.Prelude (StakePoolKey, fromNetworkMagic)
42-
import Hydra.Chain.ScriptRegistry (buildScriptPublishingTx)
43-
import Hydra.Contract.Head qualified as Head
44-
import Hydra.Ledger.Cardano (adjustUTxO)
45-
import Hydra.Plutus (commitValidatorScript, initialValidatorScript)
42+
import Hydra.Chain.ScriptRegistry (buildScriptPublishingTxs)
43+
import Hydra.Tx (txId)
4644
import Money qualified
4745
import Ouroboros.Consensus.Block (GenesisWindow (..))
4846
import Ouroboros.Consensus.Cardano.Block (CardanoEras)
@@ -88,18 +86,12 @@ publishHydraScripts projectPath sk = do
8886
let eraHistory = mkEraHistory genesis
8987
utxo <- Blockfrost.getAddressUtxos address
9088
let cardanoUTxO = toCardanoUTxO utxo changeAddress
91-
flip evalStateT cardanoUTxO $
92-
forM scripts $ \script -> do
93-
nextUTxO <- get
94-
(tx, body, spentUTxO) <- liftIO $ buildScriptPublishingTx pparams systemStart networkId eraHistory stakePools changeAddress sk script nextUTxO
95-
_ <- lift $ Blockfrost.submitTx $ Blockfrost.CBORString $ fromStrict $ serialiseToCBOR tx
96-
put $ pickKeyAddressUTxO $ adjustUTxO tx spentUTxO
97-
pure $ getTxId body
98-
where
99-
pickKeyAddressUTxO utxo = maybe mempty UTxO.singleton $ UTxO.findBy (\(_, txOut) -> isKeyAddress (txOutAddress txOut)) utxo
100-
101-
scripts = [initialValidatorScript, commitValidatorScript, Head.validatorScript]
10289

90+
let txs = buildScriptPublishingTxs pparams systemStart networkId eraHistory stakePools cardanoUTxO sk
91+
forM txs $ \(tx :: Tx) -> do
92+
void $ Blockfrost.submitTx $ Blockfrost.CBORString $ fromStrict $ serialiseToCBOR tx
93+
pure $ txId tx
94+
where
10395
vk = getVerificationKey sk
10496

10597
vkAddress networkMagic = textAddrOf (toCardanoNetworkMagic networkMagic) vk
@@ -127,7 +119,7 @@ toCardanoTxIn :: Blockfrost.AddressUtxo -> TxIn
127119
toCardanoTxIn Blockfrost.AddressUtxo{_addressUtxoTxHash = Blockfrost.TxHash{unTxHash}, _addressUtxoOutputIndex} =
128120
case deserialiseFromRawBytesHex AsTxId (encodeUtf8 unTxHash) of
129121
Left err -> error (show err)
130-
Right txId -> TxIn txId (TxIx (fromIntegral _addressUtxoOutputIndex))
122+
Right txid -> TxIn txid (TxIx (fromIntegral _addressUtxoOutputIndex))
131123

132124
-- REVIEW! TxOutDatumNone and ReferenceScriptNone
133125
toCardanoTxOut :: Blockfrost.AddressUtxo -> AddressInEra -> TxOut CtxUTxO

hydra-node/src/Hydra/Chain/CardanoClient.hs

+16-17
Original file line numberDiff line numberDiff line change
@@ -76,22 +76,21 @@ buildTransactionWithBody ::
7676
TxBodyContent BuildTx ->
7777
-- | Unspent transaction outputs to spend.
7878
UTxO ->
79-
IO (Either (TxBodyErrorAutoBalance Era) Tx)
79+
Either (TxBodyErrorAutoBalance Era) Tx
8080
buildTransactionWithBody pparams systemStart eraHistory stakePools changeAddress body utxoToSpend = do
81-
pure $
82-
second (flip Tx [] . balancedTxBody) $
83-
makeTransactionBodyAutoBalance
84-
shelleyBasedEra
85-
systemStart
86-
(toLedgerEpochInfo eraHistory)
87-
(LedgerProtocolParameters pparams)
88-
stakePools
89-
mempty
90-
mempty
91-
(UTxO.toApi utxoToSpend)
92-
body
93-
changeAddress
94-
Nothing
81+
second (flip Tx [] . balancedTxBody) $
82+
makeTransactionBodyAutoBalance
83+
shelleyBasedEra
84+
systemStart
85+
(toLedgerEpochInfo eraHistory)
86+
(LedgerProtocolParameters pparams)
87+
stakePools
88+
mempty
89+
mempty
90+
(UTxO.toApi utxoToSpend)
91+
body
92+
changeAddress
93+
Nothing
9594

9695
buildTransaction ::
9796
-- | Current network identifier
@@ -136,7 +135,7 @@ buildTransactionWithPParams pparams networkId socket changeAddress utxoToSpend c
136135
systemStart <- querySystemStart networkId socket QueryTip
137136
eraHistory <- queryEraHistory networkId socket QueryTip
138137
stakePools <- queryStakePools networkId socket QueryTip
139-
buildTransactionWithPParams' pparams systemStart eraHistory stakePools changeAddress utxoToSpend collateral outs
138+
pure $ buildTransactionWithPParams' pparams systemStart eraHistory stakePools changeAddress utxoToSpend collateral outs
140139

141140
buildTransactionWithPParams' ::
142141
-- | Protocol parameters
@@ -152,7 +151,7 @@ buildTransactionWithPParams' ::
152151
[TxIn] ->
153152
-- | Outputs to create.
154153
[TxOut CtxTx] ->
155-
IO (Either (TxBodyErrorAutoBalance Era) Tx)
154+
Either (TxBodyErrorAutoBalance Era) Tx
156155
buildTransactionWithPParams' pparams systemStart eraHistory stakePools changeAddress utxoToSpend collateral outs = do
157156
buildTransactionWithBody pparams systemStart eraHistory stakePools changeAddress bodyContent utxoToSpend
158157
where

hydra-node/src/Hydra/Chain/ScriptRegistry.hs

+50-28
Original file line numberDiff line numberDiff line change
@@ -24,6 +24,7 @@ import Hydra.Cardano.Api (
2424
TxId,
2525
TxIn (..),
2626
TxIx (..),
27+
UTxO,
2728
WitCtx (..),
2829
examplePlutusScriptAlwaysFails,
2930
getTxBody,
@@ -36,7 +37,6 @@ import Hydra.Cardano.Api (
3637
mkTxOutAutoBalance,
3738
mkVkAddress,
3839
selectLovelace,
39-
throwErrorAsException,
4040
txOutAddress,
4141
txOutValue,
4242
pattern TxOutDatumNone,
@@ -63,29 +63,23 @@ import Hydra.Tx.ScriptRegistry (ScriptRegistry (..), newScriptRegistry)
6363
-- This is implemented by repeated querying until we have all necessary
6464
-- reference scripts as we do only know the transaction id, not the indices.
6565
--
66-
-- NOTE: This is limited to an upper bound of 10 to not query too much before
67-
-- providing an error.
68-
--
69-
-- NOTE: If this should change, make sure to update the command line help.
70-
--
7166
-- Can throw at least 'NewScriptRegistryException' on failure.
7267
queryScriptRegistry ::
73-
(MonadIO m, MonadThrow m, MonadDelay m) =>
68+
(MonadIO m, MonadThrow m) =>
7469
-- | cardano-node's network identifier.
7570
-- A combination of network discriminant + magic number.
7671
NetworkId ->
7772
-- | Filepath to the cardano-node's domain socket
7873
SocketPath ->
7974
[TxId] ->
8075
m ScriptRegistry
81-
queryScriptRegistry networkId socketPath txIds = go 10
76+
queryScriptRegistry networkId socketPath txIds = do
77+
utxo <- liftIO $ queryUTxOByTxIn networkId socketPath QueryTip candidates
78+
case newScriptRegistry utxo of
79+
Left e -> throwIO e
80+
Right sr -> pure sr
8281
where
83-
go n = do
84-
utxo <- liftIO $ queryUTxOByTxIn networkId socketPath QueryTip candidates
85-
case newScriptRegistry utxo of
86-
Left e -> if n == (0 :: Integer) then throwIO e else threadDelay 1 >> go (n - 1)
87-
Right sr -> pure sr
88-
candidates = concatMap (\txId -> [TxIn txId ix | ix <- [TxIx 0 .. TxIx 10]]) txIds -- Arbitrary but, high-enough.
82+
candidates = map (\txid -> TxIn txid (TxIx 0)) txIds
8983

9084
publishHydraScripts ::
9185
-- | Expected network discriminant.
@@ -96,22 +90,51 @@ publishHydraScripts ::
9690
SigningKey PaymentKey ->
9791
IO [TxId]
9892
publishHydraScripts networkId socketPath sk = do
93+
txs <- publishHydraScripts' networkId socketPath sk
94+
pure $ getTxId . getTxBody <$> txs
95+
96+
publishHydraScripts' ::
97+
-- | Expected network discriminant.
98+
NetworkId ->
99+
-- | Path to the cardano-node's domain socket
100+
SocketPath ->
101+
-- | Keys assumed to hold funds to pay for the publishing transaction.
102+
SigningKey PaymentKey ->
103+
IO [Tx]
104+
publishHydraScripts' networkId socketPath sk = do
99105
pparams <- queryProtocolParameters networkId socketPath QueryTip
100106
systemStart <- querySystemStart networkId socketPath QueryTip
101107
eraHistory <- queryEraHistory networkId socketPath QueryTip
102108
stakePools <- queryStakePools networkId socketPath QueryTip
103109
utxo <- queryUTxOFor networkId socketPath QueryTip vk
104-
flip evalStateT utxo $
110+
let txs = buildScriptPublishingTxs pparams systemStart networkId eraHistory stakePools utxo sk
111+
forM txs $ \tx -> do
112+
submitTransaction networkId socketPath tx
113+
pure tx
114+
where
115+
vk = getVerificationKey sk
116+
117+
buildScriptPublishingTxs ::
118+
PParams LedgerEra ->
119+
SystemStart ->
120+
NetworkId ->
121+
EraHistory ->
122+
Set PoolId ->
123+
UTxO ->
124+
SigningKey PaymentKey ->
125+
[Tx]
126+
buildScriptPublishingTxs pparams systemStart networkId eraHistory stakePools startUTxO sk =
127+
flip evalState (startUTxO, mempty) $
105128
forM scripts $ \script -> do
106-
nextUTxO <- get
107-
(tx, body, spentUTxO) <- liftIO $ buildScriptPublishingTx pparams systemStart networkId eraHistory stakePools changeAddress sk script nextUTxO
108-
_ <- lift $ submitTransaction networkId socketPath tx
109-
put $ pickKeyAddressUTxO $ adjustUTxO tx spentUTxO
110-
pure $ getTxId body
129+
(nextUTxO, _) <- get
130+
let (tx, _, spentUTxO) = buildScriptPublishingTx pparams systemStart networkId eraHistory stakePools changeAddress sk script nextUTxO
131+
modify' (\(_, existingTxs) -> (pickKeyAddressUTxO $ adjustUTxO tx spentUTxO, tx : existingTxs))
132+
pure tx
111133
where
112134
pickKeyAddressUTxO utxo = maybe mempty UTxO.singleton $ UTxO.findBy (\(_, txOut) -> isKeyAddress (txOutAddress txOut)) utxo
113135

114136
scripts = [initialValidatorScript, commitValidatorScript, Head.validatorScript]
137+
115138
vk = getVerificationKey sk
116139

117140
changeAddress = mkVkAddress networkId vk
@@ -126,19 +149,18 @@ buildScriptPublishingTx ::
126149
SigningKey PaymentKey ->
127150
PlutusScript ->
128151
UTxO.UTxO ->
129-
IO (Tx, TxBody, UTxO.UTxO)
130-
buildScriptPublishingTx pparams systemStart networkId eraHistory stakePools changeAddress sk script utxo = do
152+
(Tx, TxBody, UTxO.UTxO)
153+
buildScriptPublishingTx pparams systemStart networkId eraHistory stakePools changeAddress sk script utxo =
131154
let output = mkScriptTxOut <$> [mkScriptRef script]
132155
totalDeposit = sum (selectLovelace . txOutValue <$> output)
133156
utxoToSpend =
134157
maybe mempty UTxO.singleton $
135158
UTxO.find (\o -> selectLovelace (txOutValue o) > totalDeposit) utxo
136-
buildTransactionWithPParams' pparams systemStart eraHistory stakePools changeAddress utxoToSpend [] output
137-
>>= \case
138-
Left e -> throwErrorAsException e
139-
Right rawTx -> do
140-
let body = getTxBody rawTx
141-
pure (makeSignedTransaction [makeShelleyKeyWitness body (WitnessPaymentKey sk)] body, body, utxoToSpend)
159+
in case buildTransactionWithPParams' pparams systemStart eraHistory stakePools changeAddress utxoToSpend [] output of
160+
Left e -> error $ show e
161+
Right rawTx -> do
162+
let body = getTxBody rawTx
163+
(makeSignedTransaction [makeShelleyKeyWitness body (WitnessPaymentKey sk)] body, body, utxoToSpend)
142164
where
143165
mkScriptTxOut =
144166
mkTxOutAutoBalance

hydra-node/src/Hydra/Options.hs

+3-11
Original file line numberDiff line numberDiff line change
@@ -387,13 +387,6 @@ defaultDirectChainConfig =
387387
, depositDeadline = defaultDepositDeadline
388388
}
389389

390-
defaultDirectChainBackend :: ChainBackend
391-
defaultDirectChainBackend =
392-
DirectBackend
393-
{ networkId = defaultDirectChainConfig.networkId
394-
, nodeSocket = defaultDirectChainConfig.nodeSocket
395-
}
396-
397390
instance Arbitrary ChainConfig where
398391
arbitrary =
399392
oneof
@@ -736,10 +729,9 @@ hydraScriptsTxIdsParser =
736729
( long "hydra-scripts-tx-id"
737730
<> metavar "TXID"
738731
<> help
739-
"The transaction which is expected to have published Hydra scripts as \
740-
\reference scripts in its outputs. Note: All scripts need to be in the \
741-
\first 10 outputs. See release notes for pre-published versions. You \
742-
\can use the 'publish-scripts' sub-command to publish them yourself."
732+
"The transactions which are expected to have published Hydra scripts as \
733+
\reference scripts in their outputs. You can use the 'publish-scripts' \
734+
\sub-command to publish scripts yourself."
743735
)
744736
where
745737
parseFromHex = mapM (deserialiseFromRawBytesHex AsTxId)

weeder.toml

+2
Original file line numberDiff line numberDiff line change
@@ -12,6 +12,8 @@ roots = [
1212
, "spy'$"
1313
, "showFromAction$"
1414
, "redeemer$"
15+
# toCardanoGenesisParameters will be needed for full blockfrost integration
16+
, "toCardanoGenesisParameters"
1517
]
1618
root-instances = [
1719
# Stock instances are treated as roots.

0 commit comments

Comments
 (0)