mirror of
https://github.com/simonmichael/hledger.git
synced 2024-11-08 07:09:28 +03:00
refactor: take an axe to canonicaliseAmounts
This commit is contained in:
parent
a430badb85
commit
10c0a9a958
@ -13,6 +13,7 @@ import Hledger.Cli.Options
|
||||
import Prelude hiding ( putStr )
|
||||
import System.IO.UTF8
|
||||
#endif
|
||||
import qualified Data.Map as Map
|
||||
|
||||
|
||||
-- | Print various statistics for the ledger.
|
||||
@ -70,5 +71,5 @@ showStats _ _ l today =
|
||||
tnum7 = length $ filter withinlast7 ts
|
||||
withinlast7 t = d >= addDays (-7) today && (d<=today) where d = tdate t
|
||||
txnrate7 = fromIntegral tnum7 / 7 :: Double
|
||||
cs = commodities l
|
||||
cs = Map.elems $ commodities l
|
||||
|
||||
|
@ -28,6 +28,7 @@ $ hledger -f sample.ledger balance o
|
||||
|
||||
module Hledger.Tests
|
||||
where
|
||||
import qualified Data.Map as Map
|
||||
import Test.HUnit.Tools (runVerboseTests)
|
||||
import System.Exit (exitFailure, exitWith, ExitCode(ExitSuccess)) -- base 3 compatible
|
||||
import System.Time (ClockTime(TOD))
|
||||
@ -235,7 +236,7 @@ tests = TestList [
|
||||
," c:d "
|
||||
,""
|
||||
]
|
||||
let j' = canonicaliseAmounts True j -- enable cost basis adjustment
|
||||
let j' = journalCanonicaliseAmounts $ journalConvertAmountsToCost j -- enable cost basis adjustment
|
||||
showBalanceReport [] nullfilterspec nullledger{journal=j'} `is`
|
||||
unlines
|
||||
[" $500 a:b"
|
||||
@ -284,12 +285,12 @@ tests = TestList [
|
||||
-- ,"cacheLedger" ~:
|
||||
-- length (Map.keys $ accountmap $ cacheLedger journal7) `is` 15
|
||||
|
||||
,"canonicaliseAmounts" ~:
|
||||
,"journalCanonicaliseAmounts" ~:
|
||||
"use the greatest precision" ~:
|
||||
journalPrecisions (canonicaliseAmounts False $ journalWithAmounts ["1","2.00"]) `is` [2,2]
|
||||
(map precision $ journalAmountAndPriceCommodities $ journalCanonicaliseAmounts $ journalWithAmounts ["1","2.00"]) `is` [2,2]
|
||||
|
||||
,"commodities" ~:
|
||||
commodities ledger7 `is` [Commodity {symbol="$", side=L, spaced=False, comma=False, precision=2}]
|
||||
Map.elems (commodities ledger7) `is` [Commodity {symbol="$", side=L, spaced=False, comma=False, precision=2}]
|
||||
|
||||
,"dateSpanFromOpts" ~: do
|
||||
let todaysdate = parsedate "2008/11/26"
|
||||
|
@ -187,66 +187,87 @@ journalSelectingDate ActualDate j = j
|
||||
journalSelectingDate EffectiveDate j =
|
||||
j{jtxns=map (ledgerTransactionWithDate EffectiveDate) $ jtxns j}
|
||||
|
||||
-- | Convert all the journal's amounts to their canonical display settings.
|
||||
-- Ie, in each commodity, amounts will use the display settings of the first
|
||||
-- amount detected, and the greatest precision of the amounts detected.
|
||||
-- Also, missing unit prices are added if known from the price history.
|
||||
-- Also, amounts are converted to cost basis if that flag is active.
|
||||
-- XXX refactor
|
||||
canonicaliseAmounts :: Bool -> Journal -> Journal
|
||||
canonicaliseAmounts costbasis j@Journal{jtxns=ts} = j{jtxns=map fixledgertransaction ts}
|
||||
where
|
||||
fixledgertransaction (Transaction d ed s c de co ts pr) = Transaction d ed s c de co (map fixrawposting ts) pr
|
||||
where
|
||||
fixrawposting (Posting s ac a c t txn) = Posting s ac (fixmixedamount a) c t txn
|
||||
fixmixedamount (Mixed as) = Mixed $ map fixamount as
|
||||
fixamount = (if costbasis then costOfAmount else id) . fixprice . fixcommodity
|
||||
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 . pamount) (journalPostings j)
|
||||
++ concatMap (amounts . hamount) (historical_prices j))
|
||||
fixprice :: Amount -> Amount
|
||||
fixprice a@Amount{price=Just _} = a
|
||||
fixprice a@Amount{commodity=c} = a{price=journalHistoricalPriceFor j d c}
|
||||
|
||||
-- | Get the price for a commodity on the specified day from the price database, if known.
|
||||
-- Does only one lookup step, ie will not look up the price of a price.
|
||||
journalHistoricalPriceFor :: Journal -> Day -> Commodity -> Maybe MixedAmount
|
||||
journalHistoricalPriceFor j d Commodity{symbol=s} = do
|
||||
let ps = reverse $ filter ((<= d).hdate) $ filter ((s==).hsymbol) $ sortBy (comparing hdate) $ historical_prices j
|
||||
case ps of (HistoricalPrice{hamount=a}:_) -> Just $ canonicaliseCommodities a
|
||||
_ -> Nothing
|
||||
where
|
||||
canonicaliseCommodities (Mixed as) = Mixed $ map canonicaliseCommodity as
|
||||
where canonicaliseCommodity a@Amount{commodity=Commodity{symbol=s}} =
|
||||
a{commodity=findWithDefault (error "programmer error: canonicaliseCommodity failed") s canonicalcommoditymap}
|
||||
|
||||
-- | Close any open timelog sessions using the provided current time.
|
||||
-- | Close any open timelog sessions in this journal using the provided current time.
|
||||
journalCloseTimeLogEntries :: LocalTime -> Journal -> Journal
|
||||
journalCloseTimeLogEntries now j@Journal{jtxns=ts, open_timelog_entries=es} =
|
||||
j{jtxns = ts ++ (timeLogEntriesToTransactions now es), open_timelog_entries = []}
|
||||
|
||||
-- | Get just the amounts from a ledger, in the order parsed.
|
||||
-- | Apply this journal's historical price records to unpriced amounts where possible.
|
||||
journalApplyHistoricalPrices :: Journal -> Journal
|
||||
journalApplyHistoricalPrices j@Journal{jtxns=ts} = j{jtxns=map fixtransaction ts}
|
||||
where
|
||||
fixtransaction t@Transaction{tdate=d, tpostings=ps} = t{tpostings=map fixposting ps}
|
||||
where
|
||||
fixposting p@Posting{pamount=a} = p{pamount=fixmixedamount a}
|
||||
fixmixedamount (Mixed as) = Mixed $ map fixamount as
|
||||
fixamount = fixprice
|
||||
fixprice a@Amount{price=Just _} = a
|
||||
fixprice a@Amount{commodity=c} = a{price=journalHistoricalPriceFor j d c}
|
||||
|
||||
-- | Get the price for a commodity on the specified day from the price database, if known.
|
||||
-- Does only one lookup step, ie will not look up the price of a price.
|
||||
journalHistoricalPriceFor :: Journal -> Day -> Commodity -> Maybe MixedAmount
|
||||
journalHistoricalPriceFor j d Commodity{symbol=s} = do
|
||||
let ps = reverse $ filter ((<= d).hdate) $ filter ((s==).hsymbol) $ sortBy (comparing hdate) $ historical_prices j
|
||||
case ps of (HistoricalPrice{hamount=a}:_) -> Just a
|
||||
_ -> Nothing
|
||||
|
||||
-- | Convert all this journal's amounts to cost by applying their prices, if any.
|
||||
journalConvertAmountsToCost :: Journal -> Journal
|
||||
journalConvertAmountsToCost j@Journal{jtxns=ts} = j{jtxns=map fixtransaction ts}
|
||||
where
|
||||
fixtransaction t@Transaction{tpostings=ps} = t{tpostings=map fixposting ps}
|
||||
fixposting p@Posting{pamount=a} = p{pamount=fixmixedamount a}
|
||||
fixmixedamount (Mixed as) = Mixed $ map fixamount as
|
||||
fixamount = costOfAmount
|
||||
|
||||
-- | Convert all the journal's amounts to their canonical display
|
||||
-- settings. Ie, all amounts in a given commodity will use (a) the
|
||||
-- display settings of the first, and (b) the greatest precision, of the
|
||||
-- amounts in that commodity. Prices are canonicalised as well, so consider
|
||||
-- calling journalApplyHistoricalPrices before this.
|
||||
journalCanonicaliseAmounts :: Journal -> Journal
|
||||
journalCanonicaliseAmounts j@Journal{jtxns=ts} = j{jtxns=map fixtransaction ts}
|
||||
where
|
||||
fixtransaction t@Transaction{tpostings=ps} = t{tpostings=map fixposting ps}
|
||||
fixposting p@Posting{pamount=a} = p{pamount=fixmixedamount a}
|
||||
fixmixedamount (Mixed as) = Mixed $ map fixamount as
|
||||
fixamount a@Amount{commodity=c,price=p} = a{commodity=fixcommodity c, price=maybe Nothing (Just . fixmixedamount) p}
|
||||
fixcommodity c@Commodity{symbol=s} = findWithDefault c s canonicalcommoditymap
|
||||
canonicalcommoditymap = journalCanonicalCommodities j
|
||||
|
||||
-- | Get this journal's unique, display-preference-canonicalised commodities, by symbol.
|
||||
journalCanonicalCommodities :: Journal -> Map.Map String Commodity
|
||||
journalCanonicalCommodities j =
|
||||
Map.fromList [(s,firstc{precision=maxp}) | s <- commoditysymbols,
|
||||
let cs = commoditymap ! s,
|
||||
let firstc = head cs,
|
||||
let maxp = maximum $ map precision cs
|
||||
]
|
||||
where
|
||||
commoditymap = Map.fromList [(s,commoditieswithsymbol s) | s <- commoditysymbols]
|
||||
commoditieswithsymbol s = filter ((s==) . symbol) commodities
|
||||
commoditysymbols = nub $ map symbol commodities
|
||||
commodities = journalAmountAndPriceCommodities j
|
||||
|
||||
-- | Get all this journal's amounts' commodities, in the order parsed.
|
||||
journalAmountCommodities :: Journal -> [Commodity]
|
||||
journalAmountCommodities = map commodity . concatMap amounts . journalAmounts
|
||||
|
||||
-- | Get all this journal's amount and price commodities, in the order parsed.
|
||||
journalAmountAndPriceCommodities :: Journal -> [Commodity]
|
||||
journalAmountAndPriceCommodities = concatMap amountCommodities . concatMap amounts . journalAmounts
|
||||
|
||||
-- | Get this amount's commodity and any commodities referenced in its price.
|
||||
amountCommodities :: Amount -> [Commodity]
|
||||
amountCommodities Amount{commodity=c,price=Nothing} = [c]
|
||||
amountCommodities Amount{commodity=c,price=Just ma} = c:(concatMap amountCommodities $ amounts ma)
|
||||
|
||||
-- | Get all this journal's amounts, in the order parsed.
|
||||
journalAmounts :: Journal -> [MixedAmount]
|
||||
journalAmounts = map pamount . journalPostings
|
||||
|
||||
-- | Get just the ammount commodities from a ledger, in the order parsed.
|
||||
journalCommodities :: Journal -> [Commodity]
|
||||
journalCommodities = map commodity . concatMap amounts . journalAmounts
|
||||
|
||||
-- | Get just the amount precisions from a ledger, in the order parsed.
|
||||
journalPrecisions :: Journal -> [Int]
|
||||
journalPrecisions = map precision . journalCommodities
|
||||
|
||||
-- | The (fully specified) date span containing all the raw ledger's transactions,
|
||||
-- | The (fully specified) date span containing this journal's transactions,
|
||||
-- or DateSpan Nothing Nothing if there are none.
|
||||
journalDateSpan :: Journal -> DateSpan
|
||||
journalDateSpan j
|
||||
|
@ -53,7 +53,7 @@ aliases for easier interaction. Here's an example:
|
||||
|
||||
module Hledger.Data.Ledger
|
||||
where
|
||||
import Data.Map (findWithDefault, fromList)
|
||||
import Data.Map (Map, findWithDefault, fromList)
|
||||
import Hledger.Data.Utils
|
||||
import Hledger.Data.Types
|
||||
import Hledger.Data.Account (nullacct)
|
||||
@ -81,8 +81,11 @@ nullledger = Ledger{
|
||||
-- | Generate a ledger, from a journal and related environmental
|
||||
-- information, with basic data cleanups, but don't cache it yet.
|
||||
makeUncachedLedger :: Bool -> FilePath -> ClockTime -> String -> Journal -> UncachedLedger
|
||||
makeUncachedLedger costbasis f t s j =
|
||||
nullledger{journal=canonicaliseAmounts costbasis j{filepath=f,filereadtime=t,jtext=s}}
|
||||
makeUncachedLedger cost f t s j =
|
||||
nullledger{journal=journalCanonicaliseAmounts $
|
||||
journalApplyHistoricalPrices $
|
||||
(if cost then journalConvertAmountsToCost else id)
|
||||
j{filepath=f,filereadtime=t,jtext=s}}
|
||||
|
||||
-- | Filter a ledger's transactions as specified and generate derived data.
|
||||
filterAndCacheLedger :: FilterSpec -> UncachedLedger -> Ledger
|
||||
@ -156,8 +159,8 @@ subaccounts = ledgerSubAccounts
|
||||
postings :: Ledger -> [Posting]
|
||||
postings = ledgerPostings
|
||||
|
||||
commodities :: Ledger -> [Commodity]
|
||||
commodities = nub . journalCommodities . journal
|
||||
commodities :: Ledger -> Map String Commodity
|
||||
commodities = journalCanonicalCommodities . journal
|
||||
|
||||
accounttree :: Int -> Ledger -> Tree Account
|
||||
accounttree = ledgerAccountTree
|
||||
|
Loading…
Reference in New Issue
Block a user