Skip to content

Commit f80c67b

Browse files
committed
update entity, convert runs and make a start on queries
1 parent 0ee19b0 commit f80c67b

27 files changed

+2130
-2043
lines changed

cardano-db-sync/src/Cardano/DbSync.hs

+8-8
Original file line numberDiff line numberDiff line change
@@ -57,7 +57,7 @@ import Ouroboros.Network.NodeToClient (IOManager, withIOManager)
5757
import Paths_cardano_db_sync (version)
5858
import System.Directory (createDirectoryIfMissing)
5959
import Prelude (id)
60-
import Hasql.Connection as HC
60+
import qualified Hasql.Connection as HsqlC
6161

6262
runDbSyncNode :: MetricSetters -> [(Text, Text)] -> SyncNodeParams -> SyncNodeConfig -> IO ()
6363
runDbSyncNode metricsSetters knownMigrations params syncNodeConfigFromFile =
@@ -116,8 +116,7 @@ runDbSync metricsSetters knownMigrations iomgr trce params syncNodeConfigFromFil
116116
then logInfo trce "All user indexes were created"
117117
else logInfo trce "New user indexes were not created. They may be created later if necessary."
118118

119-
let setting = Db.toConnectionSetting pgConfig
120-
119+
let dbConnectionSetting = Db.toConnectionSetting pgConfig
121120

122121
-- For testing and debugging.
123122
whenJust (enpMaybeRollback params) $ \slotNo ->
@@ -126,7 +125,7 @@ runDbSync metricsSetters knownMigrations iomgr trce params syncNodeConfigFromFil
126125
metricsSetters
127126
trce
128127
iomgr
129-
connectionSetting
128+
dbConnectionSetting
130129
ranMigrations
131130
(void . runMigration)
132131
syncNodeConfigFromFile
@@ -154,6 +153,7 @@ runSyncNode ::
154153
MetricSetters ->
155154
Trace IO Text ->
156155
IOManager ->
156+
-- | Database connection settings
157157
Setting ->
158158
-- | migrations were ran on startup
159159
Bool ->
@@ -163,7 +163,7 @@ runSyncNode ::
163163
SyncNodeParams ->
164164
SyncOptions ->
165165
IO ()
166-
runSyncNode metricsSetters trce iomgr connSetting ranMigrations runMigrationFnc syncNodeConfigFromFile syncNodeParams syncOptions = do
166+
runSyncNode metricsSetters trce iomgr dbConnSetting ranMigrations runMigrationFnc syncNodeConfigFromFile syncNodeParams syncOptions = do
167167
whenJust maybeLedgerDir $
168168
\enpLedgerStateDir -> do
169169
createDirectoryIfMissing True (unLedgerStateDir enpLedgerStateDir)
@@ -174,11 +174,11 @@ runSyncNode metricsSetters trce iomgr connSetting ranMigrations runMigrationFnc
174174
let useLedger = shouldUseLedger (sioLedger $ dncInsertOptions syncNodeConfigFromFile)
175175
-- Our main thread
176176
bracket
177-
(runOrThrowIO $ HC.acquire [connSetting])
177+
(runOrThrowIO $ HsqlC.acquire [dbConnSetting])
178178
release
179-
(\connection -> do
179+
(\dbConn -> do
180180
runOrThrowIO $ runExceptT $ do
181-
let dbEnv = Db.DbEnv connection (dncEnableDbLogging syncNodeConfigFromFile)
181+
let dbEnv = Db.DbEnv dbConn (dncEnableDbLogging syncNodeConfigFromFile)
182182
genCfg <- readCardanoGenesisConfig syncNodeConfigFromFile
183183
isJsonbInSchema <- queryIsJsonbInSchema dbEnv
184184
logProtocolMagicId trce $ genesisProtocolMagicId genCfg

cardano-db-sync/src/Cardano/DbSync/Api.hs

+8-8
Original file line numberDiff line numberDiff line change
@@ -124,7 +124,7 @@ getIsConsumedFixed env =
124124
where
125125
txOutTableType = getTxOutTableType env
126126
pcm = soptPruneConsumeMigration $ envOptions env
127-
backend = envBackend env
127+
backend = envDbEnv env
128128

129129
noneFixed :: FixesRan -> Bool
130130
noneFixed NoneFixRan = True
@@ -197,7 +197,7 @@ runRemoveJsonbFromSchema
197197
=> SyncEnv
198198
-> DbAction e m ()
199199
runRemoveJsonbFromSchema syncEnv = do
200-
DB.runDbTx DB.Write transx
200+
DB.runDbT DB.Write transx
201201
where
202202
dbEnv = envDbEnv syncEnv
203203
transx = mkDbTransaction "runRemoveJsonbFromSchema" mkCallSite (DB.disableJsonbInSchema (dbConnection dbEnv))
@@ -310,12 +310,12 @@ getDbLatestBlockInfo backend = do
310310

311311
getDbTipBlockNo :: SyncEnv -> IO (Point.WithOrigin BlockNo)
312312
getDbTipBlockNo env = do
313-
mblk <- getDbLatestBlockInfo (envBackend env)
313+
mblk <- getDbLatestBlockInfo (envDbEnv env)
314314
pure $ maybe Point.Origin (Point.At . bBlockNo) mblk
315315

316316
logDbState :: SyncEnv -> IO ()
317317
logDbState env = do
318-
mblk <- getDbLatestBlockInfo (envBackend env)
318+
mblk <- getDbLatestBlockInfo (envDbEnv env)
319319
case mblk of
320320
Nothing -> logInfo tracer "Database is empty"
321321
Just tip -> logInfo tracer $ mconcat ["Database tip is at ", showTip tip]
@@ -334,7 +334,7 @@ logDbState env = do
334334

335335
getCurrentTipBlockNo :: SyncEnv -> IO (WithOrigin BlockNo)
336336
getCurrentTipBlockNo env = do
337-
maybeTip <- getDbLatestBlockInfo (envBackend env)
337+
maybeTip <- getDbLatestBlockInfo (envDbEnv env)
338338
case maybeTip of
339339
Just tip -> pure $ At (bBlockNo tip)
340340
Nothing -> pure Origin
@@ -487,7 +487,7 @@ getLatestPoints env = do
487487
verifySnapshotPoint env snapshotPoints
488488
NoLedger _ -> do
489489
-- Brings the 5 latest.
490-
lastPoints <- DB.runDbIohkNoLogging (envBackend env) DB.queryLatestPoints
490+
lastPoints <- DB.runDbIohkNoLogging (envDbEnv env) DB.queryLatestPoints
491491
pure $ mapMaybe convert lastPoints
492492
where
493493
convert (Nothing, _) = Nothing
@@ -499,7 +499,7 @@ verifySnapshotPoint env snapPoints =
499499
where
500500
validLedgerFileToPoint :: SnapshotPoint -> IO (Maybe (CardanoPoint, Bool))
501501
validLedgerFileToPoint (OnDisk lsf) = do
502-
hashes <- getSlotHash (envBackend env) (lsfSlotNo lsf)
502+
hashes <- getSlotHash (envDbEnv env) (lsfSlotNo lsf)
503503
let valid = find (\(_, h) -> lsfHash lsf == hashToAnnotation h) hashes
504504
case valid of
505505
Just (slot, hash) | slot == lsfSlotNo lsf -> pure $ convertToDiskPoint slot hash
@@ -508,7 +508,7 @@ verifySnapshotPoint env snapPoints =
508508
case pnt of
509509
GenesisPoint -> pure Nothing
510510
BlockPoint slotNo hsh -> do
511-
hashes <- getSlotHash (envBackend env) slotNo
511+
hashes <- getSlotHash (envDbEnv env) slotNo
512512
let valid = find (\(_, dbHash) -> getHeaderHash hsh == dbHash) hashes
513513
case valid of
514514
Just (dbSlotNo, _) | slotNo == dbSlotNo -> pure $ Just (pnt, True)

cardano-db-sync/src/Cardano/DbSync/Default.hs

+1-1
Original file line numberDiff line numberDiff line change
@@ -52,7 +52,7 @@ insertListBlocks ::
5252
[CardanoBlock] ->
5353
IO (Either SyncNodeError ())
5454
insertListBlocks synEnv blocks = do
55-
DB.runDbIohkLogging (envBackend synEnv) tracer
55+
DB.runDbIohkLogging (envDbEnv synEnv) tracer
5656
. runExceptT
5757
$ traverse_ (applyAndInsertBlockMaybe synEnv tracer) blocks
5858
where

cardano-db-sync/src/Cardano/DbSync/Era/Universal/Insert/GovAction.hs

+1-1
Original file line numberDiff line numberDiff line change
@@ -335,7 +335,7 @@ insertCommitteeHash cred = do
335335
insertDrep :: (MonadBaseControl IO m, MonadIO m) => DRep StandardCrypto -> ReaderT SqlBackend m DB.DrepHashId
336336
insertDrep = \case
337337
DRepCredential cred -> insertCredDrepHash cred
338-
DRepAlwaysAbstain -> DB.insertAlwaysAbstainDrep
338+
DRepAlwaysAbstain -> DB.insertDrepHashAlwaysAbstain
339339
DRepAlwaysNoConfidence -> DB.insertAlwaysNoConfidence
340340

341341
insertCredDrepHash :: (MonadBaseControl IO m, MonadIO m) => Ledger.Credential 'DRepRole StandardCrypto -> ReaderT SqlBackend m DB.DrepHashId

cardano-db-sync/src/Cardano/DbSync/Error.hs

+2-2
Original file line numberDiff line numberDiff line change
@@ -42,7 +42,7 @@ data SyncInvariant
4242

4343
data SyncNodeError
4444
= SNErrDefault !Text
45-
| SNErrDbTransaction !DB.DbError
45+
| SNErrDatabase !DB.DbError
4646
| SNErrInvariant !Text !SyncInvariant
4747
| SNEErrBlockMismatch !Word64 !ByteString !ByteString
4848
| SNErrIgnoreShelleyInitiation
@@ -67,7 +67,7 @@ instance Show SyncNodeError where
6767
show =
6868
\case
6969
SNErrDefault t -> "Error SNErrDefault: " <> show t
70-
SNErrDbTransaction err -> "Error SNErrDbTransaction: " <> show err
70+
SNErrDatabase err -> "Error SNErrDatabase: " <> show err
7171
SNErrInvariant loc i -> "Error SNErrInvariant: " <> Show.show loc <> ": " <> show (renderSyncInvariant i)
7272
SNEErrBlockMismatch blkNo hashDb hashBlk ->
7373
mconcat

cardano-db-sync/src/Cardano/DbSync/Sync.hs

+14-14
Original file line numberDiff line numberDiff line change
@@ -206,8 +206,8 @@ dbSyncProtocols syncEnv metricsSetters tc codecConfig version bversion =
206206
tracer :: Trace IO Text
207207
tracer = getTrace syncEnv
208208

209-
backend :: SqlBackend
210-
backend = envDbEnv syncEnv
209+
dbEnv :: DB.DbEnv
210+
dbEnv = envDbEnv syncEnv
211211

212212
initAction channel = do
213213
consumedFixed <- getIsConsumedFixed syncEnv
@@ -225,7 +225,7 @@ dbSyncProtocols syncEnv metricsSetters tc codecConfig version bversion =
225225
(cChainSyncCodec codecs)
226226
channel
227227
( Client.chainSyncClientPeer $
228-
chainSyncClientFixConsumed backend syncEnv wrongEntriesSize
228+
chainSyncClientFixConsumed dbEnv syncEnv wrongEntriesSize
229229
)
230230
logInfo tracer $
231231
mconcat ["Fixed ", textShow fixedEntries, " consumed_by_tx_id wrong entries"]
@@ -237,15 +237,15 @@ dbSyncProtocols syncEnv metricsSetters tc codecConfig version bversion =
237237
let onlyFix = soptOnlyFix $ envOptions syncEnv
238238
if noneFixed fr && (onlyFix || not skipFix)
239239
then do
240-
fd <- runDbIohkLogging backend tracer $ getWrongPlutusData tracer
240+
fd <- runDbIohkLogging dbEnv tracer $ getWrongPlutusData tracer
241241
unless (nullData fd) $
242242
void $
243243
runPeer
244244
localChainSyncTracer
245245
(cChainSyncCodec codecs)
246246
channel
247247
( Client.chainSyncClientPeer $
248-
chainSyncClientFixData backend tracer fd
248+
chainSyncClientFixData dbEnv tracer fd
249249
)
250250
if onlyFix
251251
then do
@@ -255,15 +255,15 @@ dbSyncProtocols syncEnv metricsSetters tc codecConfig version bversion =
255255
else
256256
if isDataFixed fr && (onlyFix || not skipFix)
257257
then do
258-
ls <- runDbIohkLogging backend tracer $ getWrongPlutusScripts tracer
258+
ls <- runDbIohkLogging dbEnv tracer $ getWrongPlutusScripts tracer
259259
unless (nullPlutusScripts ls) $
260260
void $
261261
runPeer
262262
localChainSyncTracer
263263
(cChainSyncCodec codecs)
264264
channel
265265
( Client.chainSyncClientPeer $
266-
chainSyncClientFixScripts backend tracer ls
266+
chainSyncClientFixScripts dbEnv tracer ls
267267
)
268268
when onlyFix $ panic "All Good! This error is only thrown to exit db-sync"
269269
setIsFixed syncEnv AllFixRan
@@ -464,7 +464,7 @@ drainThePipe n0 client = go n0
464464

465465
chainSyncClientFixConsumed ::
466466
SqlBackend -> SyncEnv -> Word64 -> ChainSyncClient CardanoBlock (Point CardanoBlock) (Tip CardanoBlock) IO Integer
467-
chainSyncClientFixConsumed backend syncEnv wrongTotalSize = Client.ChainSyncClient $ do
467+
chainSyncClientFixConsumed dbEnv syncEnv wrongTotalSize = Client.ChainSyncClient $ do
468468
liftIO $ logInfo tracer "Starting chainsync to fix consumed_by_tx_id Byron entries. See issue https://github.com/IntersectMBO/cardano-db-sync/issues/1821. This makes resyncing unnecessary."
469469
pure $ Client.SendMsgFindIntersect [genesisPoint] clientStIntersect
470470
where
@@ -483,7 +483,7 @@ chainSyncClientFixConsumed backend syncEnv wrongTotalSize = Client.ChainSyncClie
483483
clientStNext (sizeFixedTotal, (sizeFixEntries, fixEntries)) =
484484
Client.ClientStNext
485485
{ Client.recvMsgRollForward = \blk _tip -> Client.ChainSyncClient $ do
486-
mNewEntries <- fixConsumedBy backend syncEnv blk
486+
mNewEntries <- fixConsumedBy dbEnv syncEnv blk
487487
case mNewEntries of
488488
Nothing -> do
489489
fixAccumulatedEntries fixEntries
@@ -501,7 +501,7 @@ chainSyncClientFixConsumed backend syncEnv wrongTotalSize = Client.ChainSyncClie
501501
Client.SendMsgRequestNext (pure ()) (clientStNext (sizeFixedTotal, (sizeFixEntries, fixEntries)))
502502
}
503503

504-
fixAccumulatedEntries = fixEntriesConsumed backend tracer . concat . reverse
504+
fixAccumulatedEntries = fixEntriesConsumed dbEnv tracer . concat . reverse
505505

506506
fixAccumulatedEntriesMaybe :: (Integer, [[FixEntry]]) -> IO (Integer, Integer, [[FixEntry]])
507507
fixAccumulatedEntriesMaybe (n, entries)
@@ -516,7 +516,7 @@ chainSyncClientFixConsumed backend syncEnv wrongTotalSize = Client.ChainSyncClie
516516

517517
chainSyncClientFixData ::
518518
SqlBackend -> Trace IO Text -> FixData -> ChainSyncClient CardanoBlock (Point CardanoBlock) (Tip CardanoBlock) IO ()
519-
chainSyncClientFixData backend tracer fixData = Client.ChainSyncClient $ do
519+
chainSyncClientFixData dbEnv tracer fixData = Client.ChainSyncClient $ do
520520
liftIO $ logInfo tracer "Starting chainsync to fix Plutus Data. This will update database values in tables datum and redeemer_data."
521521
clientStIdle True (sizeFixData fixData) fixData
522522
where
@@ -566,7 +566,7 @@ chainSyncClientFixData backend tracer fixData = Client.ChainSyncClient $ do
566566
clientStNext lastSize fdOnPoint fdRest =
567567
Client.ClientStNext
568568
{ Client.recvMsgRollForward = \blk _tip -> Client.ChainSyncClient $ do
569-
runDbIohkLogging backend tracer $ fixPlutusData tracer blk fdOnPoint
569+
runDbIohkLogging dbEnv tracer $ fixPlutusData tracer blk fdOnPoint
570570
clientStIdle False lastSize fdRest
571571
, Client.recvMsgRollBackward = \_point _tip ->
572572
Client.ChainSyncClient $
@@ -576,7 +576,7 @@ chainSyncClientFixData backend tracer fixData = Client.ChainSyncClient $ do
576576

577577
chainSyncClientFixScripts ::
578578
SqlBackend -> Trace IO Text -> FixPlutusScripts -> ChainSyncClient CardanoBlock (Point CardanoBlock) (Tip CardanoBlock) IO ()
579-
chainSyncClientFixScripts backend tracer fps = Client.ChainSyncClient $ do
579+
chainSyncClientFixScripts dbEnv tracer fps = Client.ChainSyncClient $ do
580580
liftIO $ logInfo tracer "Starting chainsync to fix Plutus Scripts. This will update database values in tables script."
581581
clientStIdle True (sizeFixPlutusScripts fps) fps
582582
where
@@ -626,7 +626,7 @@ chainSyncClientFixScripts backend tracer fps = Client.ChainSyncClient $ do
626626
clientStNext lastSize fpsOnPoint fpsRest =
627627
Client.ClientStNext
628628
{ Client.recvMsgRollForward = \blk _tip -> Client.ChainSyncClient $ do
629-
runDbIohkLogging backend tracer $ fixPlutusScripts tracer blk fpsOnPoint
629+
runDbIohkLogging dbEnv tracer $ fixPlutusScripts tracer blk fpsOnPoint
630630
clientStIdle False lastSize fpsRest
631631
, Client.recvMsgRollBackward = \_point _tip ->
632632
Client.ChainSyncClient $

0 commit comments

Comments
 (0)