Skip to content
This repository was archived by the owner on Aug 18, 2020. It is now read-only.

Commit 8f750bb

Browse files
committed
Merge branch 'release/1.3.1'
2 parents 0d22897 + 3fa92ec commit 8f750bb

File tree

390 files changed

+14575
-16732
lines changed

Some content is hidden

Large Commits have some content hidden by default. Use the searchbox below for content that may be hidden.

390 files changed

+14575
-16732
lines changed

.gitignore

Lines changed: 11 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -42,6 +42,7 @@ GTAGS
4242
GRTAGS
4343
GPATH
4444
TAGS
45+
.projectile
4546

4647
# Vim
4748
tags*
@@ -103,7 +104,6 @@ result*
103104
# remove when done debugging
104105
1.1.1-1-w/
105106

106-
107107
# Created by https://www.gitignore.io/api/python
108108

109109
### Python ###
@@ -207,3 +207,13 @@ venv.bak/
207207
.mypy_cache/
208208

209209
# End of https://www.gitignore.io/api/python
210+
211+
# Don't include config files with sensitive data or tls certs
212+
/faucet/test-config.json
213+
/faucet/tls/*
214+
/faucet/wallet-source.json
215+
/faucet/existing-wallet-details.json
216+
/faucet/generated-wallet-details.json
217+
/faucet/default.nix
218+
/faucet/shell.nix
219+
/faucet/recaptcha-secret.txt

CHANGELOG.md

Lines changed: 29 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,5 +1,34 @@
11
# CHANGELOG
22

3+
## Cardano SL 1.3.1
4+
5+
### Features
6+
7+
- Add genesis data for the Cardano SL public Testnet. ([#3265](https://github.com/input-output-hk/cardano-sl/pull/3265), [#3349](https://github.com/input-output-hk/cardano-sl/pull/3349), [#3585](https://github.com/input-output-hk/cardano-sl/pull/3585), DEVOPS-398)
8+
9+
- Add a "faucet" API to dispense Testnet Ada to users. ([#2939](https://github.com/input-output-hk/cardano-sl/pull/2939), DEVOPS-834)
10+
11+
- Support additional fields for Daedalus bug reports in the report server. ([#3394](https://github.com/input-output-hk/cardano-sl/pull/3394), TSD-116)
12+
13+
### Fixes
14+
15+
- Fix a case where the error reporting system can cause the node to stop syncing. ([#3294](https://github.com/input-output-hk/cardano-sl/pull/3294), CDEC-469, CDEC-439)
16+
17+
- Adjust the address format to distinguish testnet and mainnet addresses. ([#3540](https://github.com/input-output-hk/cardano-sl/pull/3540), [#3556](https://github.com/input-output-hk/cardano-sl/pull/3556), [#3558](https://github.com/input-output-hk/cardano-sl/pull/3558), [#3561](https://github.com/input-output-hk/cardano-sl/pull/3561), [#3578](https://github.com/input-output-hk/cardano-sl/pull/3578), [#3583](https://github.com/input-output-hk/cardano-sl/pull/3583), [#3618](https://github.com/input-output-hk/cardano-sl/pull/3618), [#3659](https://github.com/input-output-hk/cardano-sl/pull/3659), [#3685](https://github.com/input-output-hk/cardano-sl/pull/3685), CO-353, CO-354)
18+
19+
- Add a workaround for the RocksDB issue which prevented Daedalus Windows users with non-ASCII usernames from starting the wallet. ([#3465](https://github.com/input-output-hk/cardano-sl/pull/3465), CBR-391)
20+
21+
- Add support to cardano-sl-launcher for launching Daedalus in "safe mode". ([#3421](https://github.com/input-output-hk/cardano-sl/pull/3421), DDW-380)
22+
23+
- Fix the x509 certificate generation tool to allow using IP addresses as subject alternate names. ([#3390](https://github.com/input-output-hk/cardano-sl/pull/3390), DEVOPS-992)
24+
25+
- Fix display of the git version in Cardano Explorer. ([#3386](https://github.com/input-output-hk/cardano-sl/pull/3386), DEVOPS-999)
26+
27+
- Update Windows build script to use a newer openssl version. ([#3397](https://github.com/input-output-hk/cardano-sl/pull/3397), DEVOPS-1003)
28+
29+
- Fix a build system issue which caused slow builds. ([#3622](https://github.com/input-output-hk/cardano-sl/pull/3622), DEVOPS-916)
30+
31+
332
## Cardano SL 1.3.0 (Mainnet)
433

534
### Features

appveyor.yml

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -63,7 +63,7 @@ before_test:
6363
$env:PATH="$env:PATH;C:\ghc\ghc-8.2.2\bin"
6464
6565
# Install OpenSSL 1.0.2 (see https://github.com/appveyor/ci/issues/1665)
66-
- ps: (New-Object Net.WebClient).DownloadFile('https://slproweb.com/download/Win64OpenSSL-1_0_2o.exe', "$($env:USERPROFILE)\Win64OpenSSL.exe")
66+
- ps: (New-Object Net.WebClient).DownloadFile('https://slproweb.com/download/Win64OpenSSL-1_0_2p.exe', "$($env:USERPROFILE)\Win64OpenSSL.exe")
6767
- ps: cmd /c start /wait "$($env:USERPROFILE)\Win64OpenSSL.exe" /silent /verysilent /sp- /suppressmsgboxes /DIR=C:\OpenSSL-Win64-v102
6868
- ps: Install-Product node 6
6969
# Install stack

auxx/cardano-sl-auxx.cabal

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,5 +1,5 @@
11
name: cardano-sl-auxx
2-
version: 1.3.0
2+
version: 1.3.1
33
synopsis: Cardano SL - Auxx
44
description: Cardano SL - Auxx
55
license: MIT

auxx/src/Command/BlockGen.hs

Lines changed: 3 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -14,6 +14,7 @@ import System.Wlog (logInfo)
1414
import Pos.AllSecrets (mkAllSecretsSimple)
1515
import Pos.Client.KeyStorage (getSecretKeysPlain)
1616
import Pos.Core (gdBootStakeholders, genesisData)
17+
import Pos.Core.NetworkMagic (makeNetworkMagic)
1718
import Pos.Crypto (ProtocolMagic, encToSecret)
1819
import Pos.Generator.Block (BlockGenParams (..), genBlocks, tgpTxCountRange)
1920
import Pos.Infra.StateLock (Priority (..), withStateLock)
@@ -30,7 +31,8 @@ generateBlocks pm GenBlocksParams{..} = withStateLock HighPriority ApplyBlock $
3031
seed <- liftIO $ maybe randomIO pure bgoSeed
3132
logInfo $ "Generating with seed " <> show seed
3233

33-
allSecrets <- mkAllSecretsSimple . map encToSecret <$> getSecretKeysPlain
34+
let nm = makeNetworkMagic pm
35+
allSecrets <- mkAllSecretsSimple nm . map encToSecret <$> getSecretKeysPlain
3436

3537
let bgenParams =
3638
BlockGenParams

auxx/src/Command/Proc.hs

Lines changed: 20 additions & 13 deletions
Original file line numberDiff line numberDiff line change
@@ -17,11 +17,11 @@ import qualified Text.JSON.Canonical as CanonicalJSON
1717

1818
import Pos.Client.KeyStorage (addSecretKey, getSecretKeysPlain)
1919
import Pos.Client.Txp.Balances (getBalance)
20-
import Pos.Core (AddrStakeDistribution (..), Address, HeavyDlgIndex (..),
21-
SoftwareVersion (..), StakeholderId, addressHash, mkMultiKeyDistr,
22-
unsafeGetCoin)
20+
import Pos.Core (AddrStakeDistribution (..), HeavyDlgIndex (..), SoftwareVersion (..),
21+
StakeholderId, addressHash, mkMultiKeyDistr, unsafeGetCoin)
2322
import Pos.Core.Common (AddrAttributes (..), AddrSpendingData (..), makeAddress)
2423
import Pos.Core.Configuration (genesisSecretKeys)
24+
import Pos.Core.NetworkMagic (makeNetworkMagic)
2525
import Pos.Core.Txp (TxOut (..))
2626
import Pos.Crypto (ProtocolMagic, PublicKey, emptyPassphrase, encToPublic, fullPublicKeyF,
2727
hashHexF, noPassEncrypt, safeCreatePsk, unsafeCheatingHashCoerce,
@@ -93,6 +93,8 @@ createCommandProcs mpm hasAuxxMode printAction mDiffusion = rights . fix $ \comm
9393

9494
let name = "addr" in
9595
needsAuxxMode name >>= \Dict ->
96+
needsProtocolMagic name >>= \pm ->
97+
let nm = makeNetworkMagic pm in
9698
return CommandProc
9799
{ cpName = name
98100
, cpArgumentPrepare = map
@@ -103,9 +105,9 @@ createCommandProcs mpm hasAuxxMode printAction mDiffusion = rights . fix $ \comm
103105
, cpExec = \(pk', mDistr) -> do
104106
pk <- toLeft pk'
105107
addr <- case mDistr of
106-
Nothing -> makePubKeyAddressAuxx pk
108+
Nothing -> makePubKeyAddressAuxx nm pk
107109
Just distr -> return $
108-
makeAddress (PubKeyASD pk) (AddrAttributes Nothing distr)
110+
makeAddress (PubKeyASD pk) (AddrAttributes Nothing distr nm)
109111
return $ ValueAddress addr
110112
, cpHelp = "address for the specified public key. a stake distribution \
111113
\ can be specified manually (by default it uses the current epoch \
@@ -114,6 +116,7 @@ createCommandProcs mpm hasAuxxMode printAction mDiffusion = rights . fix $ \comm
114116

115117
let name = "addr-hd" in
116118
needsAuxxMode name >>= \Dict ->
119+
needsProtocolMagic name >>= \pm ->
117120
return CommandProc
118121
{ cpName = name
119122
, cpArgumentPrepare = identity
@@ -123,7 +126,8 @@ createCommandProcs mpm hasAuxxMode printAction mDiffusion = rights . fix $ \comm
123126
sk <- evaluateWHNF (sks !! i) -- WHNF is sufficient to force possible errors
124127
-- from using (!!). I'd use NF but there's no
125128
-- NFData instance for secret keys.
126-
addrHD <- deriveHDAddressAuxx sk
129+
let nm = makeNetworkMagic pm
130+
addrHD <- deriveHDAddressAuxx nm sk
127131
return $ ValueAddress addrHD
128132
, cpHelp = "address of the HD wallet for the specified public key"
129133
},
@@ -181,12 +185,16 @@ createCommandProcs mpm hasAuxxMode printAction mDiffusion = rights . fix $ \comm
181185

182186
let name = "balance" in
183187
needsAuxxMode name >>= \Dict ->
188+
needsProtocolMagic name >>= \pm ->
189+
let nm = makeNetworkMagic pm in
184190
return CommandProc
185191
{ cpName = name
186192
, cpArgumentPrepare = identity
187193
, cpArgumentConsumer = getArg (tyAddress `tyEither` tyPublicKey `tyEither` tyInt) "addr"
188194
, cpExec = \addr' -> do
189-
addr <- toLeft addr'
195+
addr <- case addr' of
196+
Left a -> pure a
197+
Right pki -> makePubKeyAddressAuxx nm =<< toLeft pki
190198
balance <- getBalance addr
191199
return $ ValueNumber (fromIntegral . unsafeGetCoin $ balance)
192200
, cpHelp = "check the amount of coins on the specified address"
@@ -465,6 +473,8 @@ createCommandProcs mpm hasAuxxMode printAction mDiffusion = rights . fix $ \comm
465473

466474
let name = "listaddr" in
467475
needsAuxxMode name >>= \Dict ->
476+
needsProtocolMagic name >>= \pm ->
477+
let nm = makeNetworkMagic pm in
468478
return CommandProc
469479
{ cpName = name
470480
, cpArgumentPrepare = identity
@@ -474,8 +484,8 @@ createCommandProcs mpm hasAuxxMode printAction mDiffusion = rights . fix $ \comm
474484
printAction "Available addresses:"
475485
for_ (zip [0 :: Int ..] sks) $ \(i, sk) -> do
476486
let pk = encToPublic sk
477-
addr <- makePubKeyAddressAuxx pk
478-
addrHD <- deriveHDAddressAuxx sk
487+
addr <- makePubKeyAddressAuxx nm pk
488+
addrHD <- deriveHDAddressAuxx nm sk
479489
printAction $
480490
sformat (" #"%int%": addr: "%build%"\n"%
481491
" pk: "%fullPublicKeyF%"\n"%
@@ -484,7 +494,7 @@ createCommandProcs mpm hasAuxxMode printAction mDiffusion = rights . fix $ \comm
484494
i addr pk (addressHash pk) addrHD
485495
walletMB <- (^. usWallet) <$> (view userSecret >>= atomically . readTVar)
486496
whenJust walletMB $ \wallet -> do
487-
addrHD <- deriveHDAddressAuxx (_wusRootKey wallet)
497+
addrHD <- deriveHDAddressAuxx nm (_wusRootKey wallet)
488498
printAction $
489499
sformat (" Wallet address:\n"%
490500
" HD addr: "%build)
@@ -535,9 +545,6 @@ instance MonadAuxxMode m => ToLeft m PublicKey Int where
535545
instance MonadAuxxMode m => ToLeft m StakeholderId PublicKey where
536546
toLeft = return . either identity addressHash
537547

538-
instance MonadAuxxMode m => ToLeft m Address PublicKey where
539-
toLeft = either return makePubKeyAddressAuxx
540-
541548
getPublicKeyFromIndex :: MonadAuxxMode m => Int -> m PublicKey
542549
getPublicKeyFromIndex i = do
543550
sks <- getSecretKeysPlain

auxx/src/Command/Tx.hs

Lines changed: 7 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -40,6 +40,7 @@ import Pos.Client.Txp.Util (createTx)
4040
import Pos.Core (BlockVersionData (bvdSlotDuration), IsBootstrapEraAddr (..),
4141
Timestamp (..), deriveFirstHDAddress, makePubKeyAddress, mkCoin)
4242
import Pos.Core.Configuration (genesisBlockVersionData, genesisSecretKeys)
43+
import Pos.Core.NetworkMagic (makeNetworkMagic)
4344
import Pos.Core.Txp (TxAux (..), TxIn (TxInUtxo), TxOut (..), TxOutAux (..), txaF)
4445
import Pos.Crypto (EncryptedSecretKey, ProtocolMagic, emptyPassphrase, encToPublic,
4546
fakeSigner, hash, safeToPublic, toPublic, withSafeSigners)
@@ -103,18 +104,19 @@ sendToAllGenesis pm diffusion (SendToAllGenesisParams genesisTxsPerThread txsPer
103104
logInfo $ sformat ("Found "%shown%" keys in the genesis block.") (length keysToSend)
104105
startAtTxt <- liftIO $ lookupEnv "AUXX_START_AT"
105106
let startAt = fromMaybe 0 . readMaybe . fromMaybe "" $ startAtTxt :: Int
107+
let nm = makeNetworkMagic pm
106108
-- construct a transaction, and add it to the queue
107109
let addTx secretKey = do
108110
let signer = fakeSigner secretKey
109111
publicKey = toPublic secretKey
110112
-- construct transaction output
111-
outAddr <- makePubKeyAddressAuxx publicKey
113+
outAddr <- makePubKeyAddressAuxx nm publicKey
112114
let txOut1 = TxOut {
113115
txOutAddress = outAddr,
114116
txOutValue = mkCoin 1
115117
}
116118
txOuts = TxOutAux txOut1 :| []
117-
utxo <- getOwnUtxoForPk $ safeToPublic signer
119+
utxo <- getOwnUtxoForPk nm $ safeToPublic signer
118120
etx <- createTx pm mempty utxo signer txOuts publicKey
119121
case etx of
120122
Left err -> logError (sformat ("Error: "%build%" while trying to contruct tx") err)
@@ -220,11 +222,12 @@ send
220222
-> m ()
221223
send pm diffusion idx outputs = do
222224
skey <- takeSecret
225+
let nm = makeNetworkMagic pm
223226
let curPk = encToPublic skey
224-
let plainAddresses = map (flip makePubKeyAddress curPk . IsBootstrapEraAddr) [False, True]
227+
let plainAddresses = map (flip (makePubKeyAddress nm) curPk . IsBootstrapEraAddr) [False, True]
225228
let (hdAddresses, hdSecrets) = unzip $ map
226229
(\ibea -> fromMaybe (error "send: pass mismatch") $
227-
deriveFirstHDAddress (IsBootstrapEraAddr ibea) emptyPassphrase skey) [False, True]
230+
deriveFirstHDAddress nm (IsBootstrapEraAddr ibea) emptyPassphrase skey) [False, True]
228231
let allAddresses = hdAddresses ++ plainAddresses
229232
let allSecrets = hdSecrets ++ [skey, skey]
230233
etx <- withSafeSigners allSecrets (pure emptyPassphrase) $ \signers -> runExceptT @AuxxException $ do

auxx/src/Mode.hs

Lines changed: 12 additions & 9 deletions
Original file line numberDiff line numberDiff line change
@@ -43,6 +43,7 @@ import Pos.Context (HasNodeContext (..))
4343
import Pos.Core (Address, HasConfiguration, HasPrimaryKey (..), IsBootstrapEraAddr (..),
4444
deriveFirstHDAddress, largestPubKeyAddressBoot,
4545
largestPubKeyAddressSingleKey, makePubKeyAddress, siEpoch)
46+
import Pos.Core.NetworkMagic (NetworkMagic)
4647
import Pos.Crypto (EncryptedSecretKey, PublicKey, emptyPassphrase)
4748
import Pos.DB (DBSum (..), MonadGState (..), NodeDBs, gsIsBootstrapEra)
4849
import Pos.DB.Class (MonadDB (..), MonadDBRead (..))
@@ -211,11 +212,11 @@ instance (HasConfigurations, HasCompileInfo) =>
211212
MonadAddresses AuxxMode where
212213
type AddrData AuxxMode = PublicKey
213214
getNewAddress = makePubKeyAddressAuxx
214-
getFakeChangeAddress = do
215+
getFakeChangeAddress nm = do
215216
epochIndex <- siEpoch <$> getCurrentSlotInaccurate
216217
gsIsBootstrapEra epochIndex <&> \case
217-
False -> largestPubKeyAddressBoot
218-
True -> largestPubKeyAddressSingleKey
218+
False -> largestPubKeyAddressBoot nm
219+
True -> largestPubKeyAddressSingleKey nm
219220

220221
instance MonadKeysRead AuxxMode where
221222
getSecret = getSecretDefault
@@ -242,20 +243,22 @@ instance (HasConfigurations) =>
242243
-- whether we are currently in bootstrap era.
243244
makePubKeyAddressAuxx ::
244245
MonadAuxxMode m
245-
=> PublicKey
246+
=> NetworkMagic
247+
-> PublicKey
246248
-> m Address
247-
makePubKeyAddressAuxx pk = do
249+
makePubKeyAddressAuxx nm pk = do
248250
epochIndex <- siEpoch <$> getCurrentSlotInaccurate
249251
ibea <- IsBootstrapEraAddr <$> gsIsBootstrapEra epochIndex
250-
pure $ makePubKeyAddress ibea pk
252+
pure $ makePubKeyAddress nm ibea pk
251253

252254
-- | Similar to @makePubKeyAddressAuxx@ but create HD address.
253255
deriveHDAddressAuxx ::
254256
MonadAuxxMode m
255-
=> EncryptedSecretKey
257+
=> NetworkMagic
258+
-> EncryptedSecretKey
256259
-> m Address
257-
deriveHDAddressAuxx hdwSk = do
260+
deriveHDAddressAuxx nm hdwSk = do
258261
epochIndex <- siEpoch <$> getCurrentSlotInaccurate
259262
ibea <- IsBootstrapEraAddr <$> gsIsBootstrapEra epochIndex
260263
pure $ fst $ fromMaybe (error "makePubKeyHDAddressAuxx: pass mismatch") $
261-
deriveFirstHDAddress ibea emptyPassphrase hdwSk
264+
deriveFirstHDAddress nm ibea emptyPassphrase hdwSk

binary/cardano-sl-binary.cabal

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,5 +1,5 @@
11
name: cardano-sl-binary
2-
version: 1.3.0
2+
version: 1.3.1
33
synopsis: Cardano SL - binary serialization
44
description: This package defines a type class for binary serialization,
55
helpers and instances.

binary/test/cardano-sl-binary-test.cabal

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,5 +1,5 @@
11
name: cardano-sl-binary-test
2-
version: 1.3.0
2+
version: 1.3.1
33
synopsis: Cardano SL - binary serializarion (tests)
44
description: This package contains test helpers for cardano-sl-binary.
55
license: MIT

block/bench/Block.hs

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -24,17 +24,17 @@ import Pos.Core (Block, BlockHeader, BlockVersionData (..), Body, Body
2424
_mbUpdatePayload)
2525
import Pos.Core.Block.Main ()
2626
import Pos.Core.Common (CoinPortion, SharedSeed (..))
27-
import Pos.Core.ProtocolConstants (ProtocolConstants (..))
2827
import Pos.Core.Genesis
29-
import Pos.Crypto (ProtocolMagic (..))
28+
import Pos.Core.ProtocolConstants (ProtocolConstants (..))
29+
import Pos.Crypto (ProtocolMagic (..), ProtocolMagicId (..), RequiresNetworkMagic (..))
3030

3131
import Test.Pos.Block.Arbitrary.Generate (generateMainBlock)
3232

3333
-- We need 'ProtocolMagic' and 'ProtocolConstants' in order to generate a
3434
-- 'MainBlock'.
3535

3636
pm :: ProtocolMagic
37-
pm = ProtocolMagic 0
37+
pm = ProtocolMagic (ProtocolMagicId 0) NMMustBeNothing
3838

3939
pc :: ProtocolConstants
4040
pc = ProtocolConstants

block/bench/cardano-sl-block-bench.cabal

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,5 +1,5 @@
11
name: cardano-sl-block-bench
2-
version: 1.3.0
2+
version: 1.3.1
33
synopsis: Cardano SL - block benchmark
44
description: Cardano SL - block benchmark
55
license: MIT

block/cardano-sl-block.cabal

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,5 +1,5 @@
11
name: cardano-sl-block
2-
version: 1.3.0
2+
version: 1.3.1
33
synopsis: Cardano SL - block processing
44
description: Cardano SL - block processing
55
license: MIT

block/src/Pos/Block/BListener.hs

Lines changed: 10 additions & 9 deletions
Original file line numberDiff line numberDiff line change
@@ -16,32 +16,33 @@ import Control.Monad.Trans (MonadTrans (..))
1616
import Mockable (SharedAtomicT)
1717

1818
import Pos.Block.Types (Blund)
19-
import Pos.DB.BatchOp (SomeBatchOp)
2019
import Pos.Core.Chrono (NE, NewestFirst (..), OldestFirst (..))
20+
import Pos.Core.NetworkMagic (NetworkMagic)
21+
import Pos.DB.BatchOp (SomeBatchOp)
2122

2223
class Monad m => MonadBListener m where
2324
-- Callback will be called after putting blocks into BlocksDB
2425
-- and before changing of GStateDB.
2526
-- Callback action will be performed under block lock.
26-
onApplyBlocks :: OldestFirst NE Blund -> m SomeBatchOp
27+
onApplyBlocks :: NetworkMagic -> OldestFirst NE Blund -> m SomeBatchOp
2728
-- Callback will be called before changing of GStateDB.
2829
-- Callback action will be performed under block lock.
29-
onRollbackBlocks :: NewestFirst NE Blund -> m SomeBatchOp
30+
onRollbackBlocks :: NetworkMagic -> NewestFirst NE Blund -> m SomeBatchOp
3031

3132
instance {-# OVERLAPPABLE #-}
3233
( MonadBListener m, Monad m, MonadTrans t, Monad (t m)
3334
, SharedAtomicT m ~ SharedAtomicT (t m) ) =>
3435
MonadBListener (t m)
3536
where
36-
onApplyBlocks = lift . onApplyBlocks
37-
onRollbackBlocks = lift . onRollbackBlocks
37+
onApplyBlocks nm = lift . onApplyBlocks nm
38+
onRollbackBlocks nm = lift . onRollbackBlocks nm
3839

3940
onApplyBlocksStub
4041
:: Monad m
41-
=> OldestFirst NE Blund -> m SomeBatchOp
42-
onApplyBlocksStub _ = pure mempty
42+
=> NetworkMagic -> OldestFirst NE Blund -> m SomeBatchOp
43+
onApplyBlocksStub _ _ = pure mempty
4344

4445
onRollbackBlocksStub
4546
:: Monad m
46-
=> NewestFirst NE Blund -> m SomeBatchOp
47-
onRollbackBlocksStub _ = pure mempty
47+
=> NetworkMagic -> NewestFirst NE Blund -> m SomeBatchOp
48+
onRollbackBlocksStub _ _ = pure mempty

0 commit comments

Comments
 (0)