This renames RawTransaction -> Posting and Entry -> LedgerTransaction, plus a bunch more cleanups for consistency. So while ledger 3 has transactions containing postings, and so do we when speaking to users, internally we call ledger 3's transactions LedgerTransaction, and we keep our old Transaction type as well, because it's useful and used all over the place. To review: - ledger 2 had Entrys containing Transactions. - hledger 0.4 had Entrys containing RawTransactions, and Transactions which are a RawTransaction with its parent Entry's info added. Transactions are what we most work with when reporting and are ubiquitous in the code and docs. - ledger 3 has Transactions containing Postings. - hledger 0.5 now has LedgerTransactions containing Postings, with Transactions kept as before (a Posting plus it's parent's info). These could be named PartialTransactions or TransactionPostings, but it gets too verbose and obscure for devs and users.
165 lines
7.8 KiB
Haskell
165 lines
7.8 KiB
Haskell
{-|
|
|
|
|
A 'RawLedger' is a parsed ledger file. We call it raw to distinguish from
|
|
the cached 'Ledger'.
|
|
|
|
-}
|
|
|
|
module Ledger.RawLedger
|
|
where
|
|
import qualified Data.Map as Map
|
|
import Data.Map ((!))
|
|
import Ledger.Utils
|
|
import Ledger.Types
|
|
import Ledger.AccountName
|
|
import Ledger.Amount
|
|
import Ledger.LedgerTransaction
|
|
import Ledger.Transaction
|
|
import Ledger.Posting
|
|
import Ledger.TimeLog
|
|
|
|
|
|
instance Show RawLedger where
|
|
show l = printf "RawLedger with %d transactions, %d accounts: %s"
|
|
((length $ ledger_txns l) +
|
|
(length $ modifier_txns l) +
|
|
(length $ periodic_txns l))
|
|
(length accounts)
|
|
(show accounts)
|
|
-- ++ (show $ rawLedgerTransactions l)
|
|
where accounts = flatten $ rawLedgerAccountNameTree l
|
|
|
|
rawLedgerEmpty :: RawLedger
|
|
rawLedgerEmpty = RawLedger { modifier_txns = []
|
|
, periodic_txns = []
|
|
, ledger_txns = []
|
|
, open_timelog_entries = []
|
|
, historical_prices = []
|
|
, final_comment_lines = []
|
|
}
|
|
|
|
addLedgerTransaction :: LedgerTransaction -> RawLedger -> RawLedger
|
|
addLedgerTransaction t l0 = l0 { ledger_txns = t : (ledger_txns l0) }
|
|
|
|
addModifierTransaction :: ModifierTransaction -> RawLedger -> RawLedger
|
|
addModifierTransaction mt l0 = l0 { modifier_txns = mt : (modifier_txns l0) }
|
|
|
|
addPeriodicTransaction :: PeriodicTransaction -> RawLedger -> RawLedger
|
|
addPeriodicTransaction pt l0 = l0 { periodic_txns = pt : (periodic_txns l0) }
|
|
|
|
addHistoricalPrice :: HistoricalPrice -> RawLedger -> RawLedger
|
|
addHistoricalPrice h l0 = l0 { historical_prices = h : (historical_prices l0) }
|
|
|
|
addTimeLogEntry :: TimeLogEntry -> RawLedger -> RawLedger
|
|
addTimeLogEntry tle l0 = l0 { open_timelog_entries = tle : (open_timelog_entries l0) }
|
|
|
|
rawLedgerTransactions :: RawLedger -> [Transaction]
|
|
rawLedgerTransactions = txnsof . ledger_txns
|
|
where txnsof ts = concat $ map flattenLedgerTransaction $ zip ts [1..]
|
|
|
|
rawLedgerAccountNamesUsed :: RawLedger -> [AccountName]
|
|
rawLedgerAccountNamesUsed = accountNamesFromTransactions . rawLedgerTransactions
|
|
|
|
rawLedgerAccountNames :: RawLedger -> [AccountName]
|
|
rawLedgerAccountNames = sort . expandAccountNames . rawLedgerAccountNamesUsed
|
|
|
|
rawLedgerAccountNameTree :: RawLedger -> Tree AccountName
|
|
rawLedgerAccountNameTree l = accountNameTreeFrom $ rawLedgerAccountNames l
|
|
|
|
-- | Remove ledger transactions we are not interested in.
|
|
-- Keep only those which fall between the begin and end dates, and match
|
|
-- the description pattern, and are cleared or real if those options are active.
|
|
filterRawLedger :: DateSpan -> [String] -> Bool -> Bool -> RawLedger -> RawLedger
|
|
filterRawLedger span pats clearedonly realonly =
|
|
filterRawLedgerPostingsByRealness realonly .
|
|
filterRawLedgerTransactionsByClearedStatus clearedonly .
|
|
filterRawLedgerTransactionsByDate span .
|
|
filterRawLedgerTransactionsByDescription pats
|
|
|
|
-- | Keep only ledger transactions whose description matches the description patterns.
|
|
filterRawLedgerTransactionsByDescription :: [String] -> RawLedger -> RawLedger
|
|
filterRawLedgerTransactionsByDescription pats (RawLedger ms ps ts tls hs f) =
|
|
RawLedger ms ps (filter matchdesc ts) tls hs f
|
|
where matchdesc = matchpats pats . ltdescription
|
|
|
|
-- | Keep only ledger transactions which fall between begin and end dates.
|
|
-- We include transactions on the begin date and exclude transactions on the end
|
|
-- date, like ledger. An empty date string means no restriction.
|
|
filterRawLedgerTransactionsByDate :: DateSpan -> RawLedger -> RawLedger
|
|
filterRawLedgerTransactionsByDate (DateSpan begin end) (RawLedger ms ps ts tls hs f) =
|
|
RawLedger ms ps (filter matchdate ts) tls hs f
|
|
where
|
|
matchdate t = (maybe True (ltdate t>=) begin) && (maybe True (ltdate t<) end)
|
|
|
|
-- | Keep only ledger transactions with cleared status, if the flag is true, otherwise
|
|
-- do no filtering.
|
|
filterRawLedgerTransactionsByClearedStatus :: Bool -> RawLedger -> RawLedger
|
|
filterRawLedgerTransactionsByClearedStatus False l = l
|
|
filterRawLedgerTransactionsByClearedStatus True (RawLedger ms ps ts tls hs f) =
|
|
RawLedger ms ps (filter ltstatus ts) tls hs f
|
|
|
|
-- | Strip out any virtual postings, if the flag is true, otherwise do
|
|
-- no filtering.
|
|
filterRawLedgerPostingsByRealness :: Bool -> RawLedger -> RawLedger
|
|
filterRawLedgerPostingsByRealness False l = l
|
|
filterRawLedgerPostingsByRealness True (RawLedger mts pts ts tls hs f) =
|
|
RawLedger mts pts (map filtertxns ts) tls hs f
|
|
where filtertxns t@LedgerTransaction{ltpostings=ps} = t{ltpostings=filter isReal ps}
|
|
|
|
-- | Strip out any postings to accounts deeper than the specified depth
|
|
-- (and any ledger transactions which have no postings as a result).
|
|
filterRawLedgerPostingsByDepth :: Int -> RawLedger -> RawLedger
|
|
filterRawLedgerPostingsByDepth depth (RawLedger mts pts ts tls hs f) =
|
|
RawLedger mts pts (filter (not . null . ltpostings) $ map filtertxns ts) tls hs f
|
|
where filtertxns t@LedgerTransaction{ltpostings=ps} =
|
|
t{ltpostings=filter ((<= depth) . accountNameLevel . paccount) ps}
|
|
|
|
-- | Keep only ledger transactions which affect accounts matched by the account patterns.
|
|
filterRawLedgerTransactionsByAccount :: [String] -> RawLedger -> RawLedger
|
|
filterRawLedgerTransactionsByAccount apats (RawLedger ms ps ts tls hs f) =
|
|
RawLedger ms ps (filter (any (matchpats apats . paccount) . ltpostings) ts) tls hs f
|
|
|
|
-- | Give all a ledger's amounts their canonical display settings. That
|
|
-- is, in each commodity, amounts will use the display settings of the
|
|
-- first amount detected, and the greatest precision of the amounts
|
|
-- detected. Also, amounts are converted to cost basis if that flag is
|
|
-- active.
|
|
canonicaliseAmounts :: Bool -> RawLedger -> RawLedger
|
|
canonicaliseAmounts costbasis l@(RawLedger ms ps ts tls hs f) = RawLedger ms ps (map fixledgertransaction ts) tls hs f
|
|
where
|
|
fixledgertransaction (LedgerTransaction d s c de co ts pr) = LedgerTransaction d s c de co (map fixrawposting ts) pr
|
|
fixrawposting (Posting s ac a c t) = Posting s ac (fixmixedamount a) c t
|
|
fixmixedamount (Mixed as) = Mixed $ map fixamount as
|
|
fixamount = fixcommodity . (if costbasis then costOfAmount else id)
|
|
fixcommodity a = a{commodity=c} where c = canonicalcommoditymap ! (symbol $ commodity a)
|
|
canonicalcommoditymap =
|
|
Map.fromList [(s,firstc{precision=maxp}) | s <- commoditysymbols,
|
|
let cs = commoditymap ! s,
|
|
let firstc = head cs,
|
|
let maxp = maximum $ map precision cs
|
|
]
|
|
commoditymap = Map.fromList [(s,commoditieswithsymbol s) | s <- commoditysymbols]
|
|
commoditieswithsymbol s = filter ((s==) . symbol) commodities
|
|
commoditysymbols = nub $ map symbol commodities
|
|
commodities = map commodity $ concatMap (amounts . amount) $ rawLedgerTransactions l
|
|
|
|
-- | Get just the amounts from a ledger, in the order parsed.
|
|
rawLedgerAmounts :: RawLedger -> [MixedAmount]
|
|
rawLedgerAmounts = map amount . rawLedgerTransactions
|
|
|
|
-- | Get just the ammount commodities from a ledger, in the order parsed.
|
|
rawLedgerCommodities :: RawLedger -> [Commodity]
|
|
rawLedgerCommodities = map commodity . concatMap amounts . rawLedgerAmounts
|
|
|
|
-- | Get just the amount precisions from a ledger, in the order parsed.
|
|
rawLedgerPrecisions :: RawLedger -> [Int]
|
|
rawLedgerPrecisions = map precision . rawLedgerCommodities
|
|
|
|
-- | Close any open timelog sessions using the provided current time.
|
|
rawLedgerConvertTimeLog :: LocalTime -> RawLedger -> RawLedger
|
|
rawLedgerConvertTimeLog t l0 = l0 { ledger_txns = convertedTimeLog ++ ledger_txns l0
|
|
, open_timelog_entries = []
|
|
}
|
|
where convertedTimeLog = entriesFromTimeLogEntries t $ open_timelog_entries l0
|
|
|