2023-02-12 16:23:32 -05:00
|
|
|
{-# LANGUAGE ImplicitPrelude #-}
|
2022-12-11 17:51:11 -05:00
|
|
|
|
|
|
|
module Main (main) where
|
|
|
|
|
2023-05-13 13:53:43 -04:00
|
|
|
import Control.Monad.Except
|
|
|
|
import Control.Monad.IO.Rerunnable
|
|
|
|
import Control.Monad.Logger
|
2023-02-12 16:23:32 -05:00
|
|
|
import Control.Monad.Reader
|
2023-01-29 11:35:46 -05:00
|
|
|
import qualified Data.Text.IO as TI
|
2023-05-13 13:53:43 -04:00
|
|
|
import Database.Persist.Monad
|
2023-05-29 15:58:27 -04:00
|
|
|
import Dhall hiding (double, record)
|
2023-05-29 15:56:15 -04:00
|
|
|
import Internal.Budget
|
2023-05-29 17:33:59 -04:00
|
|
|
import Internal.Database
|
2023-05-29 15:56:15 -04:00
|
|
|
import Internal.History
|
2023-05-29 14:46:30 -04:00
|
|
|
import Internal.Types.Main
|
2023-01-05 22:16:06 -05:00
|
|
|
import Internal.Utils
|
|
|
|
import Options.Applicative
|
|
|
|
import RIO
|
|
|
|
import RIO.FilePath
|
|
|
|
import qualified RIO.Text as T
|
2022-12-11 18:34:05 -05:00
|
|
|
|
2022-12-11 17:51:11 -05:00
|
|
|
main :: IO ()
|
|
|
|
main = parse =<< execParser o
|
|
|
|
where
|
2023-01-05 22:16:06 -05:00
|
|
|
o =
|
|
|
|
info
|
|
|
|
(options <**> helper)
|
|
|
|
( fullDesc
|
|
|
|
<> progDesc "Pwn your budget"
|
|
|
|
<> header "pwncash - your budget, your life"
|
|
|
|
)
|
2022-12-11 17:51:11 -05:00
|
|
|
|
2022-12-11 18:34:05 -05:00
|
|
|
data Options = Options FilePath Mode
|
|
|
|
|
2023-01-05 22:16:06 -05:00
|
|
|
data Mode
|
|
|
|
= Reset
|
2022-12-11 17:51:11 -05:00
|
|
|
| DumpCurrencies
|
|
|
|
| DumpAccounts
|
|
|
|
| DumpAccountKeys
|
|
|
|
| Sync
|
|
|
|
|
2022-12-11 18:34:05 -05:00
|
|
|
configFile :: Parser FilePath
|
2023-01-05 22:16:06 -05:00
|
|
|
configFile =
|
|
|
|
strOption
|
|
|
|
( long "config"
|
|
|
|
<> short 'c'
|
|
|
|
<> metavar "CONFIG"
|
|
|
|
<> value "main.dhall"
|
|
|
|
<> help "config file to use"
|
|
|
|
)
|
2022-12-11 18:34:05 -05:00
|
|
|
|
2022-12-11 17:51:11 -05:00
|
|
|
options :: Parser Options
|
2023-01-05 22:16:06 -05:00
|
|
|
options =
|
|
|
|
getConf reset
|
|
|
|
<|> getConf dumpCurrencies
|
|
|
|
<|> getConf dumpAccounts
|
|
|
|
<|> getConf dumpAccountKeys
|
|
|
|
<|> getConf sync
|
2022-12-11 18:34:05 -05:00
|
|
|
where
|
|
|
|
getConf m = Options <$> configFile <*> m
|
2022-12-11 17:51:11 -05:00
|
|
|
|
2022-12-11 18:34:05 -05:00
|
|
|
reset :: Parser Mode
|
2023-01-05 22:16:06 -05:00
|
|
|
reset =
|
|
|
|
flag'
|
|
|
|
Reset
|
|
|
|
( long "reset"
|
|
|
|
<> short 'R'
|
|
|
|
<> help "Reset the database"
|
|
|
|
)
|
2022-12-11 17:51:11 -05:00
|
|
|
|
2022-12-11 18:34:05 -05:00
|
|
|
dumpCurrencies :: Parser Mode
|
2023-01-05 22:16:06 -05:00
|
|
|
dumpCurrencies =
|
|
|
|
flag'
|
|
|
|
DumpCurrencies
|
|
|
|
( long "currencies"
|
|
|
|
<> short 'C'
|
|
|
|
<> help "Dump all currencies in the configuration"
|
|
|
|
)
|
2022-12-11 17:51:11 -05:00
|
|
|
|
2022-12-11 18:34:05 -05:00
|
|
|
dumpAccounts :: Parser Mode
|
2023-01-05 22:16:06 -05:00
|
|
|
dumpAccounts =
|
|
|
|
flag'
|
|
|
|
DumpAccounts
|
|
|
|
( long "accounts"
|
|
|
|
<> short 'A'
|
|
|
|
<> help "Dump all accounts in the configuration"
|
|
|
|
)
|
2022-12-11 17:51:11 -05:00
|
|
|
|
|
|
|
-- TODO 'alias' is a better name for these
|
2022-12-11 18:34:05 -05:00
|
|
|
dumpAccountKeys :: Parser Mode
|
2023-01-05 22:16:06 -05:00
|
|
|
dumpAccountKeys =
|
|
|
|
flag'
|
|
|
|
DumpAccountKeys
|
|
|
|
( long "account_keys"
|
|
|
|
<> short 'K'
|
|
|
|
<> help "Dump all account keys/aliases"
|
|
|
|
)
|
2022-12-11 17:51:11 -05:00
|
|
|
|
2022-12-11 18:34:05 -05:00
|
|
|
sync :: Parser Mode
|
2023-01-05 22:16:06 -05:00
|
|
|
sync =
|
|
|
|
flag'
|
|
|
|
Sync
|
|
|
|
( long "sync"
|
|
|
|
<> short 'S'
|
|
|
|
<> help "Sync config to database"
|
|
|
|
)
|
2022-12-11 17:51:11 -05:00
|
|
|
|
|
|
|
parse :: Options -> IO ()
|
2023-01-05 22:16:06 -05:00
|
|
|
parse (Options c Reset) = do
|
2022-12-11 18:53:54 -05:00
|
|
|
config <- readConfig c
|
2023-05-07 20:29:33 -04:00
|
|
|
runDB (sqlConfig config) nukeTables
|
2023-01-05 22:16:06 -05:00
|
|
|
parse (Options c DumpAccounts) = runDumpAccounts c
|
2022-12-11 18:34:05 -05:00
|
|
|
parse (Options c DumpAccountKeys) = runDumpAccountKeys c
|
2023-01-05 22:16:06 -05:00
|
|
|
parse (Options c DumpCurrencies) = runDumpCurrencies c
|
|
|
|
parse (Options c Sync) = runSync c
|
2022-12-11 18:34:05 -05:00
|
|
|
|
2023-01-05 22:23:22 -05:00
|
|
|
runDumpCurrencies :: MonadUnliftIO m => FilePath -> m ()
|
2022-12-11 18:34:05 -05:00
|
|
|
runDumpCurrencies c = do
|
|
|
|
cs <- currencies <$> readConfig c
|
2023-01-05 22:23:22 -05:00
|
|
|
liftIO $ putStrLn $ T.unpack $ T.unlines $ fmap fmt cs
|
2022-12-11 17:51:11 -05:00
|
|
|
where
|
2023-01-05 22:16:06 -05:00
|
|
|
fmt Currency {curSymbol = s, curFullname = f} =
|
2022-12-11 17:51:11 -05:00
|
|
|
T.concat [s, ": ", f]
|
|
|
|
|
2023-01-05 22:23:22 -05:00
|
|
|
runDumpAccounts :: MonadUnliftIO m => FilePath -> m ()
|
2022-12-11 18:34:05 -05:00
|
|
|
runDumpAccounts c = do
|
|
|
|
ar <- accounts <$> readConfig c
|
2022-12-11 17:51:11 -05:00
|
|
|
mapM_ (\(h, f) -> printTree h $ f ar) ps
|
|
|
|
where
|
2023-01-05 22:16:06 -05:00
|
|
|
ps =
|
|
|
|
[ ("Assets", arAssets)
|
|
|
|
, ("Equity", arEquity)
|
|
|
|
, ("Expenses", arExpenses)
|
|
|
|
, ("Income", arIncome)
|
|
|
|
, ("Liabilities", arLiabilities)
|
|
|
|
]
|
2022-12-11 17:51:11 -05:00
|
|
|
printTree h ts = do
|
2023-01-05 22:23:22 -05:00
|
|
|
liftIO $ putStrLn h
|
2022-12-11 17:51:11 -05:00
|
|
|
mapM (go 1) ts
|
|
|
|
go i (Placeholder d n cs) = do
|
|
|
|
printAcnt i d n
|
|
|
|
mapM_ (go (i + 1)) cs
|
|
|
|
go i (Account d n) = printAcnt i d n
|
|
|
|
printAcnt i d n = do
|
|
|
|
let ind = T.replicate (i * 2) " "
|
2023-01-05 22:23:22 -05:00
|
|
|
liftIO $ putStrLn $ T.unpack $ T.concat [ind, n, ": ", d]
|
2022-12-11 17:51:11 -05:00
|
|
|
|
2023-01-05 22:23:22 -05:00
|
|
|
runDumpAccountKeys :: MonadUnliftIO m => FilePath -> m ()
|
2022-12-11 18:34:05 -05:00
|
|
|
runDumpAccountKeys c = do
|
|
|
|
ar <- accounts <$> readConfig c
|
2023-01-05 22:16:06 -05:00
|
|
|
let ks =
|
|
|
|
paths2IDs $
|
|
|
|
fmap (double . fst) $
|
|
|
|
concatMap (t3 . uncurry tree2Records) $
|
|
|
|
flattenAcntRoot ar
|
2022-12-11 17:51:11 -05:00
|
|
|
mapM_ (uncurry printPair) ks
|
|
|
|
where
|
|
|
|
printPair i p = do
|
2023-01-05 22:23:22 -05:00
|
|
|
liftIO $ putStrLn $ T.unpack $ T.concat [acntPath2Text p, ": ", i]
|
2022-12-11 17:51:11 -05:00
|
|
|
t3 (_, _, x) = x
|
|
|
|
double x = (x, x)
|
|
|
|
|
2023-05-07 20:29:33 -04:00
|
|
|
runSync :: FilePath -> IO ()
|
2022-12-11 18:34:05 -05:00
|
|
|
runSync c = do
|
|
|
|
config <- readConfig c
|
2023-05-13 13:53:43 -04:00
|
|
|
let (hTs, hSs) = splitHistory $ statements config
|
|
|
|
pool <- runNoLoggingT $ mkPool $ sqlConfig config
|
|
|
|
handle err $ do
|
|
|
|
-- _ <- askLoggerIO
|
|
|
|
|
|
|
|
-- get the current DB state
|
2023-05-29 18:14:43 -04:00
|
|
|
(state, updates) <- runSqlQueryT pool $ do
|
2023-05-13 13:53:43 -04:00
|
|
|
runMigration migrateAll
|
2023-05-29 18:14:43 -04:00
|
|
|
liftIOExceptT $ getDBState config
|
2023-05-13 13:53:43 -04:00
|
|
|
|
|
|
|
-- read desired statements from disk
|
2023-05-29 18:14:43 -04:00
|
|
|
bSs <-
|
|
|
|
flip runReaderT state $
|
|
|
|
catMaybes <$> mapErrorsIO (readHistStmt root) hSs
|
2023-05-13 13:53:43 -04:00
|
|
|
|
|
|
|
-- update the DB
|
2023-05-29 18:14:43 -04:00
|
|
|
runSqlQueryT pool $ withTransaction $ flip runReaderT state $ do
|
2023-06-13 20:12:29 -04:00
|
|
|
let runHist = do
|
|
|
|
ts <- catMaybes <$> mapErrors readHistTransfer hTs
|
|
|
|
insertHistory $ bSs ++ ts
|
|
|
|
let runBudget = mapErrors insertBudget $ budget config
|
2023-05-29 18:14:43 -04:00
|
|
|
updateDBState updates -- TODO this will only work if foreign keys are deferred
|
2023-06-13 20:12:29 -04:00
|
|
|
res <- runExceptT $ combineError runHist runBudget $ \_ _ -> ()
|
|
|
|
rerunnableIO $ fromEither res -- TODO why is this here?
|
2023-01-29 11:35:46 -05:00
|
|
|
where
|
2023-05-29 18:14:43 -04:00
|
|
|
root = takeDirectory c
|
2023-01-29 11:35:46 -05:00
|
|
|
err (InsertException es) = do
|
|
|
|
liftIO $ mapM_ TI.putStrLn $ concatMap showError es
|
|
|
|
exitFailure
|
2023-01-07 23:41:56 -05:00
|
|
|
|
|
|
|
-- showBalances
|
2023-05-29 15:58:27 -04:00
|
|
|
|
|
|
|
readConfig :: MonadUnliftIO m => FilePath -> m Config
|
|
|
|
readConfig confpath = liftIO $ unfix <$> Dhall.inputFile Dhall.auto confpath
|