2024-05-09 19:15:37 +00:00
|
|
|
{-# LANGUAGE OverloadedStrings #-}
|
|
|
|
|
|
|
|
module Zenith.Scanner where
|
|
|
|
|
2024-08-10 12:04:40 +00:00
|
|
|
import Control.Concurrent.Async (concurrently_, withAsync)
|
2024-05-09 19:15:37 +00:00
|
|
|
import Control.Exception (throwIO, try)
|
2024-08-10 12:04:40 +00:00
|
|
|
import Control.Monad (when)
|
2024-05-09 19:15:37 +00:00
|
|
|
import Control.Monad.IO.Class (liftIO)
|
2024-09-29 17:32:12 +00:00
|
|
|
import Control.Monad.Logger
|
|
|
|
( NoLoggingT
|
|
|
|
, logErrorN
|
|
|
|
, logInfoN
|
|
|
|
, runFileLoggingT
|
|
|
|
, runNoLoggingT
|
|
|
|
)
|
2024-05-09 19:15:37 +00:00
|
|
|
import Data.Aeson
|
|
|
|
import Data.HexString
|
|
|
|
import qualified Data.Text as T
|
|
|
|
import Data.Time (getCurrentTime)
|
|
|
|
import Database.Persist.Sqlite
|
|
|
|
import System.Console.AsciiProgress
|
|
|
|
import ZcashHaskell.Types
|
|
|
|
( BlockResponse(..)
|
|
|
|
, RawZebraTx(..)
|
|
|
|
, Transaction(..)
|
2024-08-10 12:04:40 +00:00
|
|
|
, ZcashNet(..)
|
2024-05-09 19:15:37 +00:00
|
|
|
, ZebraGetBlockChainInfo(..)
|
|
|
|
, ZebraTxResponse(..)
|
|
|
|
, fromRawOBundle
|
|
|
|
, fromRawSBundle
|
|
|
|
, fromRawTBundle
|
|
|
|
)
|
|
|
|
import ZcashHaskell.Utils (getBlockTime, makeZebraCall, readZebraTransaction)
|
2024-08-10 12:04:40 +00:00
|
|
|
import Zenith.Core (checkBlockChain, syncWallet)
|
2024-07-10 15:52:04 +00:00
|
|
|
import Zenith.DB
|
2024-09-23 18:04:36 +00:00
|
|
|
( ZcashBlock(..)
|
|
|
|
, ZcashBlockId
|
|
|
|
, clearWalletData
|
2024-08-10 12:04:40 +00:00
|
|
|
, clearWalletTransactions
|
2024-09-24 19:34:19 +00:00
|
|
|
, getBlock
|
2024-08-10 12:04:40 +00:00
|
|
|
, getMaxBlock
|
|
|
|
, getMinBirthdayHeight
|
2024-07-10 15:52:04 +00:00
|
|
|
, getUnconfirmedBlocks
|
2024-08-10 12:04:40 +00:00
|
|
|
, getWallets
|
2024-07-10 15:52:04 +00:00
|
|
|
, initDb
|
2024-08-10 12:04:40 +00:00
|
|
|
, initPool
|
2024-09-23 18:04:36 +00:00
|
|
|
, saveBlock
|
2024-07-10 15:52:04 +00:00
|
|
|
, saveConfs
|
|
|
|
, saveTransaction
|
2024-08-10 12:04:40 +00:00
|
|
|
, updateWalletSync
|
2024-07-10 15:52:04 +00:00
|
|
|
)
|
2024-09-23 18:04:36 +00:00
|
|
|
import Zenith.Types (Config(..), HexStringDB(..), ZcashNetDB(..))
|
2024-05-09 19:15:37 +00:00
|
|
|
import Zenith.Utils (jsonNumber)
|
|
|
|
|
|
|
|
-- | Function to scan the Zcash blockchain through the Zebra node and populate the Zenith database
|
2024-08-10 12:04:40 +00:00
|
|
|
rescanZebra ::
|
|
|
|
T.Text -- ^ Host
|
2024-05-09 19:15:37 +00:00
|
|
|
-> Int -- ^ Port
|
|
|
|
-> T.Text -- ^ Path to database file
|
2024-08-10 12:04:40 +00:00
|
|
|
-> IO ()
|
|
|
|
rescanZebra host port dbFilePath = do
|
2024-05-09 19:15:37 +00:00
|
|
|
bc <-
|
2024-08-10 12:04:40 +00:00
|
|
|
try $ checkBlockChain host port :: IO
|
2024-05-09 19:15:37 +00:00
|
|
|
(Either IOError ZebraGetBlockChainInfo)
|
|
|
|
case bc of
|
2024-08-10 12:04:40 +00:00
|
|
|
Left e -> print e
|
2024-05-09 19:15:37 +00:00
|
|
|
Right bStatus -> do
|
2024-08-10 12:04:40 +00:00
|
|
|
let znet = ZcashNetDB $ zgb_net bStatus
|
|
|
|
pool1 <- runNoLoggingT $ initPool dbFilePath
|
2024-09-29 17:32:12 +00:00
|
|
|
{-pool2 <- runNoLoggingT $ initPool dbFilePath-}
|
|
|
|
{-pool3 <- runNoLoggingT $ initPool dbFilePath-}
|
2024-08-10 12:04:40 +00:00
|
|
|
clearWalletTransactions pool1
|
|
|
|
clearWalletData pool1
|
2024-08-10 12:52:45 +00:00
|
|
|
dbBlock <- getMaxBlock pool1 znet
|
2024-08-10 12:04:40 +00:00
|
|
|
b <- liftIO $ getMinBirthdayHeight pool1
|
2024-05-09 19:15:37 +00:00
|
|
|
let sb = max dbBlock b
|
|
|
|
if sb > zgb_blocks bStatus || sb < 1
|
|
|
|
then liftIO $ throwIO $ userError "Invalid starting block for scan"
|
|
|
|
else do
|
2024-08-10 12:04:40 +00:00
|
|
|
print $
|
|
|
|
"Scanning from " ++ show sb ++ " to " ++ show (zgb_blocks bStatus)
|
|
|
|
let bList = [sb .. (zgb_blocks bStatus)]
|
|
|
|
{-
|
|
|
|
let batch = length bList `div` 3
|
|
|
|
let bl1 = take batch bList
|
|
|
|
let bl2 = take batch $ drop batch bList
|
|
|
|
let bl3 = drop (2 * batch) bList
|
|
|
|
-}
|
|
|
|
_ <-
|
|
|
|
displayConsoleRegions $ do
|
|
|
|
pg1 <- newProgressBar def {pgTotal = fromIntegral $ length bList}
|
|
|
|
{-pg2 <- newProgressBar def {pgTotal = fromIntegral $ length bl2}-}
|
|
|
|
{-pg3 <- newProgressBar def {pgTotal = fromIntegral $ length bl3}-}
|
|
|
|
mapM_ (processBlock host port pool1 pg1 znet) bList
|
|
|
|
{-`concurrently_`-}
|
|
|
|
{-mapM_ (processBlock host port pool2 pg2 znet) bl2 `concurrently_`-}
|
|
|
|
{-mapM_ (processBlock host port pool3 pg3 znet) bl3-}
|
|
|
|
print "Please wait..."
|
|
|
|
print "Rescan complete"
|
2024-05-09 19:15:37 +00:00
|
|
|
|
|
|
|
-- | Function to process a raw block and extract the transaction information
|
|
|
|
processBlock ::
|
|
|
|
T.Text -- ^ Host name for `zebrad`
|
|
|
|
-> Int -- ^ Port for `zebrad`
|
|
|
|
-> ConnectionPool -- ^ DB file path
|
|
|
|
-> ProgressBar -- ^ Progress bar
|
2024-08-10 12:04:40 +00:00
|
|
|
-> ZcashNetDB -- ^ the network
|
2024-05-09 19:15:37 +00:00
|
|
|
-> Int -- ^ The block number to process
|
2024-08-10 12:04:40 +00:00
|
|
|
-> IO ()
|
|
|
|
processBlock host port pool pg net b = do
|
2024-05-09 19:15:37 +00:00
|
|
|
r <-
|
|
|
|
liftIO $
|
|
|
|
makeZebraCall
|
|
|
|
host
|
|
|
|
port
|
|
|
|
"getblock"
|
|
|
|
[Data.Aeson.String $ T.pack $ show b, jsonNumber 1]
|
|
|
|
case r of
|
|
|
|
Left e -> liftIO $ throwIO $ userError e
|
|
|
|
Right blk -> do
|
|
|
|
r2 <-
|
|
|
|
liftIO $
|
|
|
|
makeZebraCall
|
|
|
|
host
|
|
|
|
port
|
|
|
|
"getblock"
|
|
|
|
[Data.Aeson.String $ T.pack $ show b, jsonNumber 0]
|
|
|
|
case r2 of
|
|
|
|
Left e2 -> liftIO $ throwIO $ userError e2
|
|
|
|
Right hb -> do
|
|
|
|
let blockTime = getBlockTime hb
|
2024-09-23 18:04:36 +00:00
|
|
|
bi <-
|
|
|
|
saveBlock pool $
|
|
|
|
ZcashBlock
|
|
|
|
(fromIntegral $ bl_height blk)
|
|
|
|
(HexStringDB $ bl_hash blk)
|
|
|
|
(fromIntegral $ bl_confirmations blk)
|
|
|
|
blockTime
|
|
|
|
net
|
|
|
|
mapM_ (processTx host port bi pool) $ bl_txs blk
|
2024-05-09 19:15:37 +00:00
|
|
|
liftIO $ tick pg
|
|
|
|
|
|
|
|
-- | Function to process a raw transaction
|
|
|
|
processTx ::
|
|
|
|
T.Text -- ^ Host name for `zebrad`
|
|
|
|
-> Int -- ^ Port for `zebrad`
|
2024-09-23 18:04:36 +00:00
|
|
|
-> ZcashBlockId -- ^ Block ID
|
2024-05-09 19:15:37 +00:00
|
|
|
-> ConnectionPool -- ^ DB file path
|
|
|
|
-> HexString -- ^ transaction id
|
2024-08-10 12:04:40 +00:00
|
|
|
-> IO ()
|
2024-09-23 18:04:36 +00:00
|
|
|
processTx host port bt pool t = do
|
2024-05-09 19:15:37 +00:00
|
|
|
r <-
|
|
|
|
liftIO $
|
|
|
|
makeZebraCall
|
|
|
|
host
|
|
|
|
port
|
|
|
|
"getrawtransaction"
|
|
|
|
[Data.Aeson.String $ toText t, jsonNumber 1]
|
|
|
|
case r of
|
|
|
|
Left e -> liftIO $ throwIO $ userError e
|
|
|
|
Right rawTx -> do
|
|
|
|
case readZebraTransaction (ztr_hex rawTx) of
|
|
|
|
Nothing -> return ()
|
|
|
|
Just rzt -> do
|
|
|
|
_ <-
|
2024-08-10 12:04:40 +00:00
|
|
|
runNoLoggingT $
|
2024-09-23 18:04:36 +00:00
|
|
|
saveTransaction pool bt $
|
2024-05-09 19:15:37 +00:00
|
|
|
Transaction
|
|
|
|
t
|
|
|
|
(ztr_blockheight rawTx)
|
|
|
|
(ztr_conf rawTx)
|
|
|
|
(fromIntegral $ zt_expiry rzt)
|
|
|
|
(fromRawTBundle $ zt_tBundle rzt)
|
|
|
|
(fromRawSBundle $ zt_sBundle rzt)
|
|
|
|
(fromRawOBundle $ zt_oBundle rzt)
|
|
|
|
return ()
|
2024-07-10 15:52:04 +00:00
|
|
|
|
|
|
|
-- | Function to update unconfirmed transactions
|
|
|
|
updateConfs ::
|
|
|
|
T.Text -- ^ Host name for `zebrad`
|
|
|
|
-> Int -- ^ Port for `zebrad`
|
|
|
|
-> ConnectionPool
|
|
|
|
-> IO ()
|
|
|
|
updateConfs host port pool = do
|
|
|
|
targetBlocks <- getUnconfirmedBlocks pool
|
|
|
|
mapM_ updateTx targetBlocks
|
|
|
|
where
|
|
|
|
updateTx :: Int -> IO ()
|
|
|
|
updateTx b = do
|
|
|
|
r <-
|
|
|
|
makeZebraCall
|
|
|
|
host
|
|
|
|
port
|
|
|
|
"getblock"
|
|
|
|
[Data.Aeson.String $ T.pack $ show b, jsonNumber 1]
|
|
|
|
case r of
|
|
|
|
Left e -> throwIO $ userError e
|
|
|
|
Right blk -> do
|
|
|
|
saveConfs pool b $ fromInteger $ bl_confirmations blk
|
2024-08-10 12:04:40 +00:00
|
|
|
|
|
|
|
clearSync :: Config -> IO ()
|
|
|
|
clearSync config = do
|
|
|
|
let zHost = c_zebraHost config
|
|
|
|
let zPort = c_zebraPort config
|
|
|
|
let dbPath = c_dbPath config
|
|
|
|
pool <- runNoLoggingT $ initPool dbPath
|
|
|
|
bc <-
|
|
|
|
try $ checkBlockChain zHost zPort :: IO
|
|
|
|
(Either IOError ZebraGetBlockChainInfo)
|
|
|
|
case bc of
|
|
|
|
Left e1 -> throwIO e1
|
|
|
|
Right chainInfo -> do
|
|
|
|
x <- initDb dbPath
|
|
|
|
case x of
|
|
|
|
Left e2 -> throwIO $ userError e2
|
|
|
|
Right x' -> do
|
|
|
|
when x' $ rescanZebra zHost zPort dbPath
|
|
|
|
_ <- clearWalletTransactions pool
|
|
|
|
w <- getWallets pool $ zgb_net chainInfo
|
|
|
|
liftIO $ mapM_ (updateWalletSync pool 0 . entityKey) w
|
|
|
|
w' <- liftIO $ getWallets pool $ zgb_net chainInfo
|
2024-09-29 17:32:12 +00:00
|
|
|
r <- runFileLoggingT "zenith.log" $ mapM (syncWallet config) w'
|
2024-08-10 12:04:40 +00:00
|
|
|
liftIO $ print r
|
2024-09-24 19:34:19 +00:00
|
|
|
|
|
|
|
-- | Detect chain re-orgs
|
|
|
|
checkIntegrity ::
|
|
|
|
T.Text -- ^ Database path
|
|
|
|
-> T.Text -- ^ Zebra host
|
|
|
|
-> Int -- ^ Zebra port
|
|
|
|
-> Int -- ^ The block to start the check
|
|
|
|
-> Int -- ^ depth
|
|
|
|
-> IO Int
|
|
|
|
checkIntegrity dbP zHost zPort b d =
|
|
|
|
if b < 1
|
|
|
|
then return 1
|
|
|
|
else do
|
|
|
|
r <-
|
|
|
|
makeZebraCall
|
|
|
|
zHost
|
|
|
|
zPort
|
|
|
|
"getblock"
|
|
|
|
[Data.Aeson.String $ T.pack $ show b, jsonNumber 1]
|
|
|
|
case r of
|
|
|
|
Left e -> throwIO $ userError e
|
|
|
|
Right blk -> do
|
|
|
|
pool <- runNoLoggingT $ initPool dbP
|
|
|
|
dbBlk <- getBlock pool b
|
|
|
|
case dbBlk of
|
|
|
|
Nothing -> throwIO $ userError "Block mismatch, rescan needed"
|
|
|
|
Just dbBlk' ->
|
|
|
|
if bl_hash blk == getHex (zcashBlockHash $ entityVal dbBlk')
|
|
|
|
then return b
|
|
|
|
else checkIntegrity dbP zHost zPort (b - 5 * d) (d + 1)
|