Skip to content

Commit e5bfa0f

Browse files
ch1bov0d1ch
authored andcommitted
DRAFT: re-used publisch scripts tx building
1 parent 2adaffa commit e5bfa0f

File tree

2 files changed

+27
-25
lines changed

2 files changed

+27
-25
lines changed

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

+7-12
Original file line numberDiff line numberDiff line change
@@ -39,10 +39,11 @@ 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)
42+
import Hydra.Chain.ScriptRegistry (buildScriptPublishingTx, buildScriptPublishingTxs)
4343
import Hydra.Contract.Head qualified as Head
4444
import Hydra.Ledger.Cardano (adjustUTxO)
4545
import Hydra.Plutus (commitValidatorScript, initialValidatorScript)
46+
import Hydra.Tx (txId)
4647
import Money qualified
4748
import Ouroboros.Consensus.Block (GenesisWindow (..))
4849
import Ouroboros.Consensus.Cardano.Block (CardanoEras)
@@ -88,18 +89,12 @@ publishHydraScripts projectPath sk = do
8889
let eraHistory = mkEraHistory genesis
8990
utxo <- Blockfrost.getAddressUtxos address
9091
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]
10292

93+
let txs = buildScriptPublishingTxs pparams systemStart networkId eraHistory stakePools cardanoUTxO sk
94+
forM txs $ \(tx :: Tx) -> do
95+
void $ Blockfrost.submitTx $ Blockfrost.CBORString $ fromStrict $ serialiseToCBOR tx
96+
pure $ txId tx
97+
where
10398
vk = getVerificationKey sk
10499

105100
vkAddress networkMagic = textAddrOf (toCardanoNetworkMagic networkMagic) vk

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

+20-13
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,
@@ -55,6 +56,7 @@ import Hydra.Chain.CardanoClient (
5556
import Hydra.Contract.Head qualified as Head
5657
import Hydra.Ledger.Cardano (adjustUTxO)
5758
import Hydra.Plutus (commitValidatorScript, initialValidatorScript)
59+
import Hydra.Tx (txId)
5860
import Hydra.Tx.ScriptRegistry (ScriptRegistry (..), newScriptRegistry)
5961

6062
-- | Query for 'TxIn's in the search for outputs containing all the reference
@@ -78,14 +80,16 @@ queryScriptRegistry ::
7880
SocketPath ->
7981
[TxId] ->
8082
m ScriptRegistry
81-
queryScriptRegistry networkId socketPath txIds = go 10
83+
queryScriptRegistry networkId socketPath txIds =
84+
-- FIXME: No need to change semantics by looping
85+
go 10
8286
where
8387
go n = do
8488
utxo <- liftIO $ queryUTxOByTxIn networkId socketPath QueryTip candidates
8589
case newScriptRegistry utxo of
8690
Left e -> if n == (0 :: Integer) then throwIO e else threadDelay 1 >> go (n - 1)
8791
Right sr -> pure sr
88-
candidates = concatMap (\txId -> [TxIn txId ix | ix <- [TxIx 0 .. TxIx 10]]) txIds -- Arbitrary but, high-enough.
92+
candidates = concatMap (\txid -> [TxIn txid ix | ix <- [TxIx 0 .. TxIx 10]]) txIds -- Arbitrary but, high-enough.
8993

9094
publishHydraScripts ::
9195
-- | Expected network discriminant.
@@ -101,20 +105,23 @@ publishHydraScripts networkId socketPath sk = do
101105
eraHistory <- queryEraHistory networkId socketPath QueryTip
102106
stakePools <- queryStakePools networkId socketPath QueryTip
103107
utxo <- queryUTxOFor networkId socketPath QueryTip vk
104-
flip evalStateT utxo $
105-
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
108+
let txs = buildScriptPublishingTxs pparams systemStart networkId eraHistory stakePools utxo sk
109+
forM txs $ \tx -> do
110+
submitTransaction networkId socketPath tx
111+
pure $ txId tx
111112
where
112-
pickKeyAddressUTxO utxo = maybe mempty UTxO.singleton $ UTxO.findBy (\(_, txOut) -> isKeyAddress (txOutAddress txOut)) utxo
113-
114-
scripts = [initialValidatorScript, commitValidatorScript, Head.validatorScript]
115113
vk = getVerificationKey sk
116114

117-
changeAddress = mkVkAddress networkId vk
115+
buildScriptPublishingTxs ::
116+
PParams LedgerEra ->
117+
SystemStart ->
118+
NetworkId ->
119+
EraHistory ->
120+
Set PoolId ->
121+
UTxO ->
122+
SigningKey PaymentKey ->
123+
[Tx]
124+
buildScriptPublishingTxs = undefined
118125

119126
buildScriptPublishingTx ::
120127
PParams LedgerEra ->

0 commit comments

Comments
 (0)