@@ -24,6 +24,7 @@ import Hydra.Cardano.Api (
24
24
TxId ,
25
25
TxIn (.. ),
26
26
TxIx (.. ),
27
+ UTxO ,
27
28
WitCtx (.. ),
28
29
examplePlutusScriptAlwaysFails ,
29
30
getTxBody ,
@@ -36,7 +37,6 @@ import Hydra.Cardano.Api (
36
37
mkTxOutAutoBalance ,
37
38
mkVkAddress ,
38
39
selectLovelace ,
39
- throwErrorAsException ,
40
40
txOutAddress ,
41
41
txOutValue ,
42
42
pattern TxOutDatumNone ,
@@ -63,29 +63,23 @@ import Hydra.Tx.ScriptRegistry (ScriptRegistry (..), newScriptRegistry)
63
63
-- This is implemented by repeated querying until we have all necessary
64
64
-- reference scripts as we do only know the transaction id, not the indices.
65
65
--
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
- --
71
66
-- Can throw at least 'NewScriptRegistryException' on failure.
72
67
queryScriptRegistry ::
73
- (MonadIO m , MonadThrow m , MonadDelay m ) =>
68
+ (MonadIO m , MonadThrow m ) =>
74
69
-- | cardano-node's network identifier.
75
70
-- A combination of network discriminant + magic number.
76
71
NetworkId ->
77
72
-- | Filepath to the cardano-node's domain socket
78
73
SocketPath ->
79
74
[TxId ] ->
80
75
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
82
81
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
89
83
90
84
publishHydraScripts ::
91
85
-- | Expected network discriminant.
@@ -96,22 +90,51 @@ publishHydraScripts ::
96
90
SigningKey PaymentKey ->
97
91
IO [TxId ]
98
92
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
99
105
pparams <- queryProtocolParameters networkId socketPath QueryTip
100
106
systemStart <- querySystemStart networkId socketPath QueryTip
101
107
eraHistory <- queryEraHistory networkId socketPath QueryTip
102
108
stakePools <- queryStakePools networkId socketPath QueryTip
103
109
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 ) $
105
128
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
111
133
where
112
134
pickKeyAddressUTxO utxo = maybe mempty UTxO. singleton $ UTxO. findBy (\ (_, txOut) -> isKeyAddress (txOutAddress txOut)) utxo
113
135
114
136
scripts = [initialValidatorScript, commitValidatorScript, Head. validatorScript]
137
+
115
138
vk = getVerificationKey sk
116
139
117
140
changeAddress = mkVkAddress networkId vk
@@ -126,19 +149,18 @@ buildScriptPublishingTx ::
126
149
SigningKey PaymentKey ->
127
150
PlutusScript ->
128
151
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 =
131
154
let output = mkScriptTxOut <$> [mkScriptRef script]
132
155
totalDeposit = sum (selectLovelace . txOutValue <$> output)
133
156
utxoToSpend =
134
157
maybe mempty UTxO. singleton $
135
158
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)
142
164
where
143
165
mkScriptTxOut =
144
166
mkTxOutAutoBalance
0 commit comments