Implement reading QR codes from database

This commit is contained in:
Rene Vergara 2024-06-06 14:10:58 -05:00
parent 0c5b2952c7
commit eb925c21f7
Signed by: pitmutt
GPG key ID: 65122AD495A7F5B2

View file

@ -15,6 +15,7 @@ import Data.Maybe (fromMaybe, isJust)
import qualified Data.Text as T import qualified Data.Text as T
import qualified Data.Text.Encoding as E import qualified Data.Text.Encoding as E
import Data.Time.Clock.POSIX (posixSecondsToUTCTime) import Data.Time.Clock.POSIX (posixSecondsToUTCTime)
import Database.Esqueleto.Experimental (ConnectionPool)
import Database.Persist import Database.Persist
import Lens.Micro ((&), (+~), (.~), (?~), (^.), set) import Lens.Micro ((&), (+~), (.~), (?~), (^.), set)
import Lens.Micro.TH import Lens.Micro.TH
@ -35,6 +36,17 @@ import Zenith.GUI.Theme
import Zenith.Types hiding (ZcashAddress) import Zenith.Types hiding (ZcashAddress)
import Zenith.Utils (displayAmount, showAddress) import Zenith.Utils (displayAmount, showAddress)
data AppEvent
= AppInit
| ShowMsg !T.Text
| CloseMsg
| WalletClicked
| AccountClicked
| SetPool !ZcashPool
| SwitchQr !(Maybe QrCode)
| SwitchAddr !Int
deriving (Eq, Show)
data AppModel = AppModel data AppModel = AppModel
{ _configuration :: !Config { _configuration :: !Config
, _network :: !ZcashNet , _network :: !ZcashNet
@ -51,19 +63,11 @@ data AppModel = AppModel
, _balance :: !Integer , _balance :: !Integer
, _unconfBalance :: !(Maybe Integer) , _unconfBalance :: !(Maybe Integer)
, _selPool :: !ZcashPool , _selPool :: !ZcashPool
, _qrCodeWidget :: !(Maybe QrCode)
} deriving (Eq, Show) } deriving (Eq, Show)
makeLenses ''AppModel makeLenses ''AppModel
data AppEvent
= AppInit
| ShowMsg !T.Text
| CloseMsg
| WalletClicked
| AccountClicked
| SetPool !ZcashPool
deriving (Eq, Show)
remixArrowRightWideLine :: T.Text remixArrowRightWideLine :: T.Text
remixArrowRightWideLine = toGlyph 0xF496 remixArrowRightWideLine = toGlyph 0xF496
@ -168,108 +172,84 @@ buildUI wenv model = widgetTree
"addrScroll" "addrScroll"
]) `styleBasic` ]) `styleBasic`
[padding 3, radius 2, bgColor white] [padding 3, radius 2, bgColor white]
, addrQRCode currentAddress (model ^. selPool) , addrQRCode
] ]
addrQRCode :: addrQRCode :: WidgetNode AppModel AppEvent
Maybe (Entity WalletAddress) addrQRCode =
-> ZcashPool box_
-> WidgetNode AppModel AppEvent [alignMiddle]
addrQRCode wAddr zp = (hstack
case encodeText (defaultQRCodeOptions L) Utf8WithoutECI =<< dispAddr of [ filler
Just qr -> , vstack
box_ [ box_
[alignMiddle] [onClick (SetPool Orchard)]
(hstack (remixIcon remixShieldCheckFill `styleBasic`
[ filler [ textSize 14
, vstack , padding 4
[ box_ , styleIf (model ^. selPool == Orchard) (bgColor btnColor)
[onClick (SetPool Orchard)] , styleIf (model ^. selPool == Orchard) (textColor white)
(remixIcon remixShieldCheckFill `styleBasic` ])
[ textSize 14
, padding 4
, styleIf
(model ^. selPool == Orchard)
(bgColor btnColor)
])
, filler
, box_
[onClick (SetPool Sapling)]
(remixIcon remixShieldLine `styleBasic`
[ textSize 14
, padding 4
, styleIf
(model ^. selPool == Sapling)
(bgColor btnColor)
])
, filler
, box_
[onClick (SetPool Transparent)]
(remixIcon remixDislikeLine `styleBasic`
[ textSize 14
, padding 4
, styleIf
(model ^. selPool == Transparent)
(bgColor btnColor)
])
]
, vstack
[ label
(case model ^. selPool of
Orchard -> "Unified"
Sapling -> "Legacy Shielded"
Transparent -> "Transparent"
Sprout -> "Unknown")
, imageMem_
(T.pack $ show zp)
(qrCodeBytes qr)
(qrCodeSize qr)
[fitNone]
]
, filler , filler
]) , box_
Nothing -> [onClick (SetPool Sapling)]
box_ [alignMiddle] (image_ "./assets/2620_color.png" [fitFill]) (remixIcon remixShieldLine `styleBasic`
where [ textSize 14
qrCodeImg :: QRImage -> Image PixelRGBA8 , padding 4
qrCodeImg qr = promoteImage (toImage 4 1 qr) , styleIf (model ^. selPool == Sapling) (bgColor btnColor)
qrCodeSize :: QRImage -> Size , styleIf (model ^. selPool == Sapling) (textColor white)
qrCodeSize qr = ])
Size , filler
(fromIntegral $ imageWidth $ qrCodeImg qr) , box_
(fromIntegral $ imageHeight $ qrCodeImg qr) [onClick (SetPool Transparent)]
qrCodeBytes :: QRImage -> BS.ByteString (remixIcon remixDislikeLine `styleBasic`
qrCodeBytes qr = [ textSize 14
BS.pack $ , padding 4
pixelFold , styleIf
(\bs _ _ (PixelRGBA8 i j k l) -> bs <> [i, j, k, l]) (model ^. selPool == Transparent)
[] (bgColor btnColor)
(qrCodeImg qr) , styleIf
dispAddr :: Maybe T.Text (model ^. selPool == Transparent)
dispAddr = (textColor white)
case zp of ])
Transparent -> ]
T.append "zcash:" . encodeTransparentReceiver (model ^. network) <$> , vstack
(t_rec =<< [ label
(isValidUnifiedAddress . (case model ^. selPool of
E.encodeUtf8 . getUA . walletAddressUAddress . entityVal) =<< Orchard -> "Unified"
wAddr) Sapling -> "Legacy Shielded"
Sapling -> Transparent -> "Transparent"
T.append "zcash:" <$> Sprout -> "Unknown") `styleBasic`
(getSaplingFromUA . [textColor white]
E.encodeUtf8 . getUA . walletAddressUAddress . entityVal =<< , box_
wAddr) [alignMiddle]
Orchard -> (case model ^. qrCodeWidget of
T.append "zcash:" . getUA . walletAddressUAddress . entityVal <$> Just qr ->
wAddr imageMem_
Sprout -> Nothing (qrCodeName qr)
(qrCodeBytes qr)
(Size
(fromIntegral $ qrCodeHeight qr)
(fromIntegral $ qrCodeWidth qr))
[fitWidth]
Nothing -> image_ "./assets/2620_color.png" [fitEither]) `styleBasic`
[bgColor white, height 100, width 100]
] `styleBasic`
[bgColor btnColor, border 2 btnColor]
, filler
] `styleBasic`
[bgColor white])
addrRow :: Int -> Entity WalletAddress -> WidgetNode AppModel AppEvent addrRow :: Int -> Entity WalletAddress -> WidgetNode AppModel AppEvent
addrRow idx wAddr = addrRow idx wAddr =
box_ box_
[onClick $ ShowMsg ("You clicked address " <> showt idx), alignLeft] [onClick $ SwitchAddr idx, alignLeft]
(label (label
(walletAddressName (entityVal wAddr) <> (walletAddressName (entityVal wAddr) <>
": " <> showAddress (walletAddressUAddress $ entityVal wAddr))) `styleBasic` ": " <> showAddress (walletAddressUAddress $ entityVal wAddr))) `styleBasic`
[padding 1, borderB 1 gray] [ padding 1
, borderB 1 gray
, styleIf (model ^. selAddr == idx) (borderL 2 btnHiLite)
, styleIf (model ^. selAddr == idx) (borderR 2 btnHiLite)
]
txBox = txBox =
boxShadow $ boxShadow $
box_ box_
@ -327,6 +307,74 @@ buildUI wenv model = widgetTree
alert CloseMsg $ alert CloseMsg $
hstack [filler, label $ fromMaybe "" (model ^. msg), filler] hstack [filler, label $ fromMaybe "" (model ^. msg), filler]
generateQRCodes :: Config -> IO ()
generateQRCodes config = do
let dbFilePath = c_dbPath config
pool <- runNoLoggingT $ initPool dbFilePath
addrs <- getExternalAddresses pool
mapM_ (checkExistingQrs pool) addrs
where
checkExistingQrs :: ConnectionPool -> Entity WalletAddress -> IO ()
checkExistingQrs pool wAddr = do
s <- getQrCodes pool (entityKey wAddr)
if not (null s)
then return ()
else do
generateOneQr pool Orchard wAddr
generateOneQr pool Sapling wAddr
generateOneQr pool Transparent wAddr
generateOneQr ::
ConnectionPool -> ZcashPool -> Entity WalletAddress -> IO ()
generateOneQr p zp wAddr =
case encodeText (defaultQRCodeOptions L) Utf8WithoutECI =<<
dispAddr zp (entityVal wAddr) of
Just qr -> do
_ <-
runNoLoggingT $
saveQrCode p $
QrCode
(entityKey wAddr)
zp
(qrCodeData qr)
(qrCodeH qr)
(qrCodeW qr)
(walletAddressName (entityVal wAddr) <> T.pack (show zp))
return ()
Nothing -> return ()
qrCodeImg :: QRImage -> Image PixelRGBA8
qrCodeImg qr = promoteImage (toImage 4 2 qr)
qrCodeH :: QRImage -> Int
qrCodeH qr = fromIntegral $ imageHeight $ qrCodeImg qr
qrCodeW :: QRImage -> Int
qrCodeW qr = fromIntegral $ imageWidth $ qrCodeImg qr
qrCodeData :: QRImage -> BS.ByteString
qrCodeData qr =
BS.pack $
pixelFold
(\bs _ _ (PixelRGBA8 i j k l) -> bs <> [i, j, k, l])
[]
(qrCodeImg qr)
dispAddr :: ZcashPool -> WalletAddress -> Maybe T.Text
dispAddr zp w =
case zp of
Transparent ->
T.append "zcash:" .
encodeTransparentReceiver
(maybe
TestNet
ua_net
((isValidUnifiedAddress .
E.encodeUtf8 . getUA . walletAddressUAddress)
w)) <$>
(t_rec =<<
(isValidUnifiedAddress . E.encodeUtf8 . getUA . walletAddressUAddress)
w)
Sapling ->
T.append "zcash:" <$>
(getSaplingFromUA . E.encodeUtf8 . getUA . walletAddressUAddress) w
Orchard -> Just $ (T.append "zcash:" . getUA . walletAddressUAddress) w
Sprout -> Nothing
handleEvent :: handleEvent ::
WidgetEnv AppModel AppEvent WidgetEnv AppModel AppEvent
-> WidgetNode AppModel AppEvent -> WidgetNode AppModel AppEvent
@ -339,8 +387,31 @@ handleEvent wenv node model evt =
ShowMsg t -> [Model $ model & msg ?~ t] ShowMsg t -> [Model $ model & msg ?~ t]
WalletClicked -> [Model $ model & msg ?~ "You clicked Wallet!"] WalletClicked -> [Model $ model & msg ?~ "You clicked Wallet!"]
AccountClicked -> [Model $ model & msg ?~ "You clicked Account!"] AccountClicked -> [Model $ model & msg ?~ "You clicked Account!"]
SetPool p -> [Model $ model & selPool .~ p] SetPool p ->
[ Model $ model & selPool .~ p
, Task $
SwitchQr <$> do
dbPool <- runNoLoggingT $ initPool $ c_dbPath $ model ^. configuration
case currentAddress of
Nothing -> return Nothing
Just wAddr -> getQrCode dbPool p $ entityKey wAddr
]
SwitchQr q -> [Model $ model & qrCodeWidget .~ q]
SwitchAddr i -> [Model $ model & selAddr .~ i, Event $ SetPool Orchard]
CloseMsg -> [Model $ model & msg .~ Nothing] CloseMsg -> [Model $ model & msg .~ Nothing]
where
currentWallet =
if null (model ^. wallets)
then Nothing
else Just ((model ^. wallets) !! (model ^. selWallet))
currentAccount =
if null (model ^. accounts)
then Nothing
else Just ((model ^. accounts) !! (model ^. selAcc))
currentAddress =
if null (model ^. addresses)
then Nothing
else Just ((model ^. addresses) !! (model ^. selAddr))
runZenithGUI :: Config -> IO () runZenithGUI :: Config -> IO ()
runZenithGUI config = do runZenithGUI config = do
@ -358,6 +429,7 @@ runZenithGUI config = do
Left e1 -> throwIO e1 Left e1 -> throwIO e1
Right chainInfo -> do Right chainInfo -> do
initDb dbFilePath initDb dbFilePath
generateQRCodes config
walList <- getWallets pool $ zgb_net chainInfo walList <- getWallets pool $ zgb_net chainInfo
accList <- accList <-
if not (null walList) if not (null walList)
@ -371,6 +443,10 @@ runZenithGUI config = do
if not (null addrList) if not (null addrList)
then getUserTx pool $ entityKey $ head addrList then getUserTx pool $ entityKey $ head addrList
else return [] else return []
qr <-
if not (null addrList)
then getQrCode pool Orchard $ entityKey $ head addrList
else return Nothing
let model = let model =
AppModel AppModel
config config
@ -387,7 +463,8 @@ runZenithGUI config = do
True True
314259000 314259000
(Just 300000) (Just 300000)
Transparent Orchard
qr
startApp model handleEvent buildUI params startApp model handleEvent buildUI params
Left e -> do Left e -> do
initDb dbFilePath initDb dbFilePath
@ -410,10 +487,12 @@ runZenithGUI config = do
314259000 314259000
(Just 30000) (Just 30000)
Orchard Orchard
Nothing
startApp model handleEvent buildUI params startApp model handleEvent buildUI params
where where
params = params =
[ appWindowTitle "Zenith - Zcash Full Node Wallet" [ appWindowTitle "Zenith - Zcash Full Node Wallet"
, appWindowState $ MainWindowNormal (1000, 600)
, appTheme zenithTheme , appTheme zenithTheme
, appFontDef "Regular" "./assets/Atkinson-Hyperlegible-Regular-102.ttf" --"./assets/DejaVuSansMono.ttf" , appFontDef "Regular" "./assets/Atkinson-Hyperlegible-Regular-102.ttf" --"./assets/DejaVuSansMono.ttf"
, appFontDef "Bold" "./assets/Atkinson-Hyperlegible-Bold-102.ttf" , appFontDef "Bold" "./assets/Atkinson-Hyperlegible-Bold-102.ttf"