2008-10-03 06:04:15 +04:00
|
|
|
{-|
|
|
|
|
|
2012-04-14 02:24:55 +04:00
|
|
|
A 'Journal' is a set of transactions, plus optional related data. This is
|
|
|
|
hledger's primary data object. It is usually parsed from a journal file or
|
|
|
|
other data format (see "Hledger.Read").
|
2008-10-03 06:04:15 +04:00
|
|
|
|
|
|
|
-}
|
|
|
|
|
2012-04-14 02:24:55 +04:00
|
|
|
module Hledger.Data.Journal (
|
|
|
|
-- * Parsing helpers
|
|
|
|
addHistoricalPrice,
|
|
|
|
addModifierTransaction,
|
|
|
|
addPeriodicTransaction,
|
|
|
|
addTimeLogEntry,
|
|
|
|
addTransaction,
|
|
|
|
journalApplyAliases,
|
2012-05-27 22:14:20 +04:00
|
|
|
journalBalanceTransactions,
|
2012-04-14 02:24:55 +04:00
|
|
|
journalCanonicaliseAmounts,
|
|
|
|
journalConvertAmountsToCost,
|
|
|
|
journalFinalise,
|
|
|
|
journalSelectingDate,
|
|
|
|
-- * Filtering
|
|
|
|
filterJournalPostings,
|
|
|
|
filterJournalTransactions,
|
|
|
|
-- * Querying
|
|
|
|
journalAccountInfo,
|
2012-05-27 22:14:20 +04:00
|
|
|
journalAccountNames,
|
2012-04-14 02:24:55 +04:00
|
|
|
journalAccountNamesUsed,
|
|
|
|
journalAmountAndPriceCommodities,
|
|
|
|
journalAmounts,
|
|
|
|
journalCanonicalCommodities,
|
|
|
|
journalDateSpan,
|
|
|
|
journalFilePath,
|
|
|
|
journalFilePaths,
|
|
|
|
journalPostings,
|
2012-04-14 05:12:42 +04:00
|
|
|
-- * Standard account types
|
2012-05-16 11:37:24 +04:00
|
|
|
journalBalanceSheetAccountQuery,
|
|
|
|
journalProfitAndLossAccountQuery,
|
2012-04-15 04:05:10 +04:00
|
|
|
journalIncomeAccountQuery,
|
|
|
|
journalExpenseAccountQuery,
|
|
|
|
journalAssetAccountQuery,
|
|
|
|
journalLiabilityAccountQuery,
|
|
|
|
journalEquityAccountQuery,
|
2012-04-17 21:32:56 +04:00
|
|
|
journalCashAccountQuery,
|
2012-04-14 02:24:55 +04:00
|
|
|
-- * Misc
|
|
|
|
groupPostings,
|
|
|
|
matchpats,
|
|
|
|
nullctx,
|
|
|
|
nulljournal,
|
|
|
|
-- * Tests
|
2012-05-27 22:14:20 +04:00
|
|
|
samplejournal,
|
2012-04-14 02:24:55 +04:00
|
|
|
tests_Hledger_Data_Journal,
|
|
|
|
)
|
2007-07-02 23:15:39 +04:00
|
|
|
where
|
2011-05-28 08:11:44 +04:00
|
|
|
import Data.List
|
2012-05-27 22:14:20 +04:00
|
|
|
import Data.Map (findWithDefault, (!), toAscList)
|
2011-05-28 08:11:44 +04:00
|
|
|
import Data.Ord
|
|
|
|
import Data.Time.Calendar
|
|
|
|
import Data.Time.LocalTime
|
|
|
|
import Data.Tree
|
2010-09-24 05:56:11 +04:00
|
|
|
import Safe (headDef)
|
2009-08-12 13:21:46 +04:00
|
|
|
import System.Time (ClockTime(TOD))
|
2011-05-28 08:11:44 +04:00
|
|
|
import Test.HUnit
|
|
|
|
import Text.Printf
|
|
|
|
import qualified Data.Map as Map
|
|
|
|
|
|
|
|
import Hledger.Utils
|
2010-05-20 03:08:53 +04:00
|
|
|
import Hledger.Data.Types
|
|
|
|
import Hledger.Data.AccountName
|
2012-05-27 22:14:20 +04:00
|
|
|
import Hledger.Data.Account()
|
2010-05-20 03:08:53 +04:00
|
|
|
import Hledger.Data.Amount
|
2012-05-27 22:14:20 +04:00
|
|
|
import Hledger.Data.Commodity
|
|
|
|
import Hledger.Data.Dates
|
|
|
|
import Hledger.Data.Transaction
|
2010-05-20 03:08:53 +04:00
|
|
|
import Hledger.Data.Posting
|
|
|
|
import Hledger.Data.TimeLog
|
2012-05-16 11:57:10 +04:00
|
|
|
import Hledger.Query
|
2007-07-02 23:15:39 +04:00
|
|
|
|
|
|
|
|
2009-12-16 10:00:43 +03:00
|
|
|
instance Show Journal where
|
2010-05-24 02:15:08 +04:00
|
|
|
show j = printf "Journal %s with %d transactions, %d accounts: %s"
|
2010-09-24 05:56:11 +04:00
|
|
|
(journalFilePath j)
|
2009-12-21 08:23:07 +03:00
|
|
|
(length (jtxns j) +
|
|
|
|
length (jmodifiertxns j) +
|
|
|
|
length (jperiodictxns j))
|
2008-10-09 13:25:58 +04:00
|
|
|
(length accounts)
|
|
|
|
(show accounts)
|
2009-12-16 10:00:43 +03:00
|
|
|
-- ++ (show $ journalTransactions l)
|
2009-12-21 08:23:07 +03:00
|
|
|
where accounts = flatten $ journalAccountNameTree j
|
2008-10-03 16:10:05 +04:00
|
|
|
|
2012-04-14 02:24:55 +04:00
|
|
|
-- showJournalDebug j = unlines [
|
|
|
|
-- show j
|
|
|
|
-- ,show (jtxns j)
|
|
|
|
-- ,show (jmodifiertxns j)
|
|
|
|
-- ,show (jperiodictxns j)
|
|
|
|
-- ,show $ open_timelog_entries j
|
|
|
|
-- ,show $ historical_prices j
|
|
|
|
-- ,show $ final_comment_lines j
|
|
|
|
-- ,show $ jContext j
|
|
|
|
-- ,show $ map fst $ files j
|
|
|
|
-- ]
|
2011-08-03 03:27:41 +04:00
|
|
|
|
2009-12-20 18:50:54 +03:00
|
|
|
nulljournal :: Journal
|
|
|
|
nulljournal = Journal { jmodifiertxns = []
|
|
|
|
, jperiodictxns = []
|
|
|
|
, jtxns = []
|
|
|
|
, open_timelog_entries = []
|
|
|
|
, historical_prices = []
|
|
|
|
, final_comment_lines = []
|
2010-11-13 18:03:40 +03:00
|
|
|
, jContext = nullctx
|
2010-09-24 05:56:11 +04:00
|
|
|
, files = []
|
2009-12-20 18:50:54 +03:00
|
|
|
, filereadtime = TOD 0 0
|
|
|
|
}
|
2008-12-08 04:48:03 +03:00
|
|
|
|
2010-11-13 18:03:40 +03:00
|
|
|
nullctx :: JournalContext
|
2011-08-04 12:45:18 +04:00
|
|
|
nullctx = Ctx { ctxYear = Nothing, ctxCommodity = Nothing, ctxAccount = [], ctxAliases = [] }
|
2010-11-13 18:03:40 +03:00
|
|
|
|
2010-09-24 05:56:11 +04:00
|
|
|
journalFilePath :: Journal -> FilePath
|
|
|
|
journalFilePath = fst . mainfile
|
|
|
|
|
|
|
|
journalFilePaths :: Journal -> [FilePath]
|
|
|
|
journalFilePaths = map fst . files
|
|
|
|
|
|
|
|
mainfile :: Journal -> (FilePath, String)
|
|
|
|
mainfile = headDef ("", "") . files
|
|
|
|
|
2009-12-16 11:07:26 +03:00
|
|
|
addTransaction :: Transaction -> Journal -> Journal
|
2009-12-16 20:58:51 +03:00
|
|
|
addTransaction t l0 = l0 { jtxns = t : jtxns l0 }
|
2008-12-08 04:48:03 +03:00
|
|
|
|
2009-12-16 10:00:43 +03:00
|
|
|
addModifierTransaction :: ModifierTransaction -> Journal -> Journal
|
2009-12-16 20:58:51 +03:00
|
|
|
addModifierTransaction mt l0 = l0 { jmodifiertxns = mt : jmodifiertxns l0 }
|
2008-12-08 04:48:03 +03:00
|
|
|
|
2009-12-16 10:00:43 +03:00
|
|
|
addPeriodicTransaction :: PeriodicTransaction -> Journal -> Journal
|
2009-12-16 20:58:51 +03:00
|
|
|
addPeriodicTransaction pt l0 = l0 { jperiodictxns = pt : jperiodictxns l0 }
|
2008-12-08 04:48:03 +03:00
|
|
|
|
2009-12-16 10:00:43 +03:00
|
|
|
addHistoricalPrice :: HistoricalPrice -> Journal -> Journal
|
2009-09-22 20:51:27 +04:00
|
|
|
addHistoricalPrice h l0 = l0 { historical_prices = h : historical_prices l0 }
|
2008-12-16 13:54:20 +03:00
|
|
|
|
2009-12-16 10:00:43 +03:00
|
|
|
addTimeLogEntry :: TimeLogEntry -> Journal -> Journal
|
2009-09-22 20:51:27 +04:00
|
|
|
addTimeLogEntry tle l0 = l0 { open_timelog_entries = tle : open_timelog_entries l0 }
|
2008-12-08 04:48:03 +03:00
|
|
|
|
2009-12-19 08:57:54 +03:00
|
|
|
journalPostings :: Journal -> [Posting]
|
|
|
|
journalPostings = concatMap tpostings . jtxns
|
2008-10-03 16:10:05 +04:00
|
|
|
|
2012-04-14 02:24:55 +04:00
|
|
|
-- | All account names used in this journal.
|
2009-12-16 10:00:43 +03:00
|
|
|
journalAccountNamesUsed :: Journal -> [AccountName]
|
2011-07-17 19:54:21 +04:00
|
|
|
journalAccountNamesUsed = sort . accountNamesFromPostings . journalPostings
|
2008-10-03 16:10:05 +04:00
|
|
|
|
2009-12-16 10:00:43 +03:00
|
|
|
journalAccountNames :: Journal -> [AccountName]
|
|
|
|
journalAccountNames = sort . expandAccountNames . journalAccountNamesUsed
|
2008-10-03 16:10:05 +04:00
|
|
|
|
2009-12-16 10:00:43 +03:00
|
|
|
journalAccountNameTree :: Journal -> Tree AccountName
|
|
|
|
journalAccountNameTree = accountNameTreeFrom . journalAccountNames
|
2008-10-10 08:23:25 +04:00
|
|
|
|
2012-04-14 05:12:42 +04:00
|
|
|
-- standard account types
|
|
|
|
|
2012-04-15 04:05:10 +04:00
|
|
|
-- | A query for Profit & Loss accounts in this journal.
|
|
|
|
-- Cf <http://en.wikipedia.org/wiki/Chart_of_accounts#Profit_.26_Loss_accounts>.
|
2012-05-16 11:12:49 +04:00
|
|
|
journalProfitAndLossAccountQuery :: Journal -> Query
|
|
|
|
journalProfitAndLossAccountQuery j = Or [journalIncomeAccountQuery j
|
2012-04-15 04:05:10 +04:00
|
|
|
,journalExpenseAccountQuery j
|
|
|
|
]
|
|
|
|
|
|
|
|
-- | A query for Income (Revenue) accounts in this journal.
|
|
|
|
-- This is currently hard-coded to the case-insensitive regex @^(income|revenue)s?(:|$)@.
|
2012-05-16 11:12:49 +04:00
|
|
|
journalIncomeAccountQuery :: Journal -> Query
|
|
|
|
journalIncomeAccountQuery _ = Acct "^(income|revenue)s?(:|$)"
|
2012-04-15 04:05:10 +04:00
|
|
|
|
|
|
|
-- | A query for Expense accounts in this journal.
|
|
|
|
-- This is currently hard-coded to the case-insensitive regex @^expenses?(:|$)@.
|
2012-05-16 11:12:49 +04:00
|
|
|
journalExpenseAccountQuery :: Journal -> Query
|
|
|
|
journalExpenseAccountQuery _ = Acct "^expenses?(:|$)"
|
2012-04-14 05:12:42 +04:00
|
|
|
|
2012-05-16 11:37:24 +04:00
|
|
|
-- | A query for Asset, Liability & Equity accounts in this journal.
|
2012-04-14 05:12:42 +04:00
|
|
|
-- Cf <http://en.wikipedia.org/wiki/Chart_of_accounts#Balance_Sheet_Accounts>.
|
2012-05-16 11:12:49 +04:00
|
|
|
journalBalanceSheetAccountQuery :: Journal -> Query
|
|
|
|
journalBalanceSheetAccountQuery j = Or [journalAssetAccountQuery j
|
2012-04-15 04:05:10 +04:00
|
|
|
,journalLiabilityAccountQuery j
|
|
|
|
,journalEquityAccountQuery j
|
|
|
|
]
|
|
|
|
|
|
|
|
-- | A query for Asset accounts in this journal.
|
|
|
|
-- This is currently hard-coded to the case-insensitive regex @^assets?(:|$)@.
|
2012-05-16 11:12:49 +04:00
|
|
|
journalAssetAccountQuery :: Journal -> Query
|
|
|
|
journalAssetAccountQuery _ = Acct "^assets?(:|$)"
|
2012-04-15 04:05:10 +04:00
|
|
|
|
|
|
|
-- | A query for Liability accounts in this journal.
|
|
|
|
-- This is currently hard-coded to the case-insensitive regex @^liabilit(y|ies)(:|$)@.
|
2012-05-16 11:12:49 +04:00
|
|
|
journalLiabilityAccountQuery :: Journal -> Query
|
|
|
|
journalLiabilityAccountQuery _ = Acct "^liabilit(y|ies)(:|$)"
|
2012-04-15 04:05:10 +04:00
|
|
|
|
|
|
|
-- | A query for Equity accounts in this journal.
|
|
|
|
-- This is currently hard-coded to the case-insensitive regex @^equity(:|$)@.
|
2012-05-16 11:12:49 +04:00
|
|
|
journalEquityAccountQuery :: Journal -> Query
|
|
|
|
journalEquityAccountQuery _ = Acct "^equity(:|$)"
|
2012-04-14 05:12:42 +04:00
|
|
|
|
2012-04-17 21:32:56 +04:00
|
|
|
-- | A query for Cash (-equivalent) accounts in this journal (ie,
|
|
|
|
-- accounts which appear on the cashflow statement.) This is currently
|
|
|
|
-- hard-coded to be all the Asset accounts except for those containing the
|
|
|
|
-- case-insensitive regex @(receivable|A/R)@.
|
|
|
|
journalCashAccountQuery :: Journal -> Query
|
|
|
|
journalCashAccountQuery j = And [journalAssetAccountQuery j, Not $ Acct "(receivable|A/R)"]
|
|
|
|
|
2009-12-21 08:23:07 +03:00
|
|
|
-- Various kinds of filtering on journals. We do it differently depending
|
|
|
|
-- on the command.
|
|
|
|
|
2011-06-04 03:14:26 +04:00
|
|
|
-------------------------------------------------------------------------------
|
|
|
|
-- filtering V2
|
|
|
|
|
|
|
|
-- | Keep only postings matching the query expression.
|
|
|
|
-- This can leave unbalanced transactions.
|
2012-05-27 22:14:20 +04:00
|
|
|
filterJournalPostings :: Query -> Journal -> Journal
|
|
|
|
filterJournalPostings q j@Journal{jtxns=ts} = j{jtxns=map filtertransactionpostings ts}
|
2011-06-05 22:36:32 +04:00
|
|
|
where
|
2012-05-27 22:14:20 +04:00
|
|
|
filtertransactionpostings t@Transaction{tpostings=ps} = t{tpostings=filter (q `matchesPosting`) ps}
|
2011-06-05 22:36:32 +04:00
|
|
|
|
|
|
|
-- | Keep only transactions matching the query expression.
|
2012-05-27 22:14:20 +04:00
|
|
|
filterJournalTransactions :: Query -> Journal -> Journal
|
|
|
|
filterJournalTransactions q j@Journal{jtxns=ts} = j{jtxns=filter (q `matchesTransaction`) ts}
|
2011-06-04 03:14:26 +04:00
|
|
|
|
2012-05-27 22:14:20 +04:00
|
|
|
{-
|
2011-06-04 03:14:26 +04:00
|
|
|
-------------------------------------------------------------------------------
|
|
|
|
-- filtering V1
|
|
|
|
|
2011-06-03 06:14:36 +04:00
|
|
|
-- | Keep only transactions we are interested in, as described by the
|
|
|
|
-- filter specification.
|
2009-12-21 08:23:07 +03:00
|
|
|
filterJournalTransactions :: FilterSpec -> Journal -> Journal
|
|
|
|
filterJournalTransactions FilterSpec{datespan=datespan
|
|
|
|
,cleared=cleared
|
|
|
|
-- ,real=real
|
|
|
|
-- ,empty=empty
|
|
|
|
,acctpats=apats
|
|
|
|
,descpats=dpats
|
|
|
|
,depth=depth
|
2012-05-09 19:34:05 +04:00
|
|
|
,fMetadata=md
|
2009-12-21 08:23:07 +03:00
|
|
|
} =
|
|
|
|
filterJournalTransactionsByClearedStatus cleared .
|
|
|
|
filterJournalPostingsByDepth depth .
|
|
|
|
filterJournalTransactionsByAccount apats .
|
2012-04-09 00:43:48 +04:00
|
|
|
filterJournalTransactionsByMetadata md .
|
2009-12-21 08:23:07 +03:00
|
|
|
filterJournalTransactionsByDescription dpats .
|
2011-06-03 06:14:36 +04:00
|
|
|
filterJournalTransactionsByDate datespan
|
2009-12-21 08:23:07 +03:00
|
|
|
|
2011-06-03 06:14:36 +04:00
|
|
|
-- | Keep only postings we are interested in, as described by the filter
|
|
|
|
-- specification. This can leave unbalanced transactions.
|
2009-12-21 08:23:07 +03:00
|
|
|
filterJournalPostings :: FilterSpec -> Journal -> Journal
|
|
|
|
filterJournalPostings FilterSpec{datespan=datespan
|
|
|
|
,cleared=cleared
|
|
|
|
,real=real
|
|
|
|
,empty=empty
|
|
|
|
,acctpats=apats
|
|
|
|
,descpats=dpats
|
|
|
|
,depth=depth
|
2012-05-09 19:34:05 +04:00
|
|
|
,fMetadata=md
|
2009-12-21 08:23:07 +03:00
|
|
|
} =
|
|
|
|
filterJournalPostingsByRealness real .
|
|
|
|
filterJournalPostingsByClearedStatus cleared .
|
|
|
|
filterJournalPostingsByEmpty empty .
|
|
|
|
filterJournalPostingsByDepth depth .
|
|
|
|
filterJournalPostingsByAccount apats .
|
2012-04-09 00:43:48 +04:00
|
|
|
filterJournalTransactionsByMetadata md .
|
2009-12-21 08:23:07 +03:00
|
|
|
filterJournalTransactionsByDescription dpats .
|
2011-06-03 06:14:36 +04:00
|
|
|
filterJournalTransactionsByDate datespan
|
2009-04-03 14:58:05 +04:00
|
|
|
|
2012-04-09 00:43:48 +04:00
|
|
|
-- | Keep only transactions whose metadata matches all metadata specifications.
|
|
|
|
filterJournalTransactionsByMetadata :: [(String,String)] -> Journal -> Journal
|
|
|
|
filterJournalTransactionsByMetadata pats j@Journal{jtxns=ts} = j{jtxns=filter matchmd ts}
|
|
|
|
where matchmd t = all (`elem` tmetadata t) pats
|
|
|
|
|
2010-07-13 10:30:06 +04:00
|
|
|
-- | Keep only transactions whose description matches the description patterns.
|
2009-12-16 11:07:26 +03:00
|
|
|
filterJournalTransactionsByDescription :: [String] -> Journal -> Journal
|
2009-12-21 08:43:10 +03:00
|
|
|
filterJournalTransactionsByDescription pats j@Journal{jtxns=ts} = j{jtxns=filter matchdesc ts}
|
2009-12-16 20:58:51 +03:00
|
|
|
where matchdesc = matchpats pats . tdescription
|
2009-04-03 14:58:05 +04:00
|
|
|
|
2010-07-13 10:30:06 +04:00
|
|
|
-- | Keep only transactions which fall between begin and end dates.
|
2009-04-03 14:58:05 +04:00
|
|
|
-- We include transactions on the begin date and exclude transactions on the end
|
2008-10-10 08:23:25 +04:00
|
|
|
-- date, like ledger. An empty date string means no restriction.
|
2009-12-16 11:07:26 +03:00
|
|
|
filterJournalTransactionsByDate :: DateSpan -> Journal -> Journal
|
2009-12-21 08:43:10 +03:00
|
|
|
filterJournalTransactionsByDate (DateSpan begin end) j@Journal{jtxns=ts} = j{jtxns=filter match ts}
|
|
|
|
where match t = maybe True (tdate t>=) begin && maybe True (tdate t<) end
|
2008-10-10 08:23:25 +04:00
|
|
|
|
2010-07-13 10:30:06 +04:00
|
|
|
-- | Keep only transactions which have the requested cleared/uncleared
|
|
|
|
-- status, if there is one.
|
2009-12-21 08:23:07 +03:00
|
|
|
filterJournalTransactionsByClearedStatus :: Maybe Bool -> Journal -> Journal
|
|
|
|
filterJournalTransactionsByClearedStatus Nothing j = j
|
2009-12-21 08:43:10 +03:00
|
|
|
filterJournalTransactionsByClearedStatus (Just val) j@Journal{jtxns=ts} = j{jtxns=filter match ts}
|
|
|
|
where match = (==val).tstatus
|
2009-12-21 08:23:07 +03:00
|
|
|
|
|
|
|
-- | Keep only postings which have the requested cleared/uncleared status,
|
|
|
|
-- if there is one.
|
2009-12-16 10:58:06 +03:00
|
|
|
filterJournalPostingsByClearedStatus :: Maybe Bool -> Journal -> Journal
|
2009-12-19 08:57:54 +03:00
|
|
|
filterJournalPostingsByClearedStatus Nothing j = j
|
2009-12-21 08:23:07 +03:00
|
|
|
filterJournalPostingsByClearedStatus (Just c) j@Journal{jtxns=ts} = j{jtxns=map filterpostings ts}
|
|
|
|
where filterpostings t@Transaction{tpostings=ps} = t{tpostings=filter ((==c) . postingCleared) ps}
|
2008-10-15 04:34:02 +04:00
|
|
|
|
2009-04-03 14:58:05 +04:00
|
|
|
-- | Strip out any virtual postings, if the flag is true, otherwise do
|
2008-10-17 04:57:00 +04:00
|
|
|
-- no filtering.
|
2009-12-16 10:00:43 +03:00
|
|
|
filterJournalPostingsByRealness :: Bool -> Journal -> Journal
|
|
|
|
filterJournalPostingsByRealness False l = l
|
2009-12-21 08:43:10 +03:00
|
|
|
filterJournalPostingsByRealness True j@Journal{jtxns=ts} = j{jtxns=map filterpostings ts}
|
2009-12-21 08:23:07 +03:00
|
|
|
where filterpostings t@Transaction{tpostings=ps} = t{tpostings=filter isReal ps}
|
|
|
|
|
|
|
|
-- | Strip out any postings with zero amount, unless the flag is true.
|
|
|
|
filterJournalPostingsByEmpty :: Bool -> Journal -> Journal
|
|
|
|
filterJournalPostingsByEmpty True l = l
|
2009-12-21 08:43:10 +03:00
|
|
|
filterJournalPostingsByEmpty False j@Journal{jtxns=ts} = j{jtxns=map filterpostings ts}
|
2009-12-21 08:23:07 +03:00
|
|
|
where filterpostings t@Transaction{tpostings=ps} = t{tpostings=filter (not . isEmptyPosting) ps}
|
|
|
|
|
2012-04-14 02:24:55 +04:00
|
|
|
-- -- | Keep only transactions which affect accounts deeper than the specified depth.
|
|
|
|
-- filterJournalTransactionsByDepth :: Maybe Int -> Journal -> Journal
|
|
|
|
-- filterJournalTransactionsByDepth Nothing j = j
|
|
|
|
-- filterJournalTransactionsByDepth (Just d) j@Journal{jtxns=ts} =
|
|
|
|
-- j{jtxns=(filter (any ((<= d+1) . accountNameLevel . paccount) . tpostings) ts)}
|
2009-04-03 14:58:05 +04:00
|
|
|
|
|
|
|
-- | Strip out any postings to accounts deeper than the specified depth
|
2010-07-13 10:30:06 +04:00
|
|
|
-- (and any transactions which have no postings as a result).
|
2009-12-21 08:23:07 +03:00
|
|
|
filterJournalPostingsByDepth :: Maybe Int -> Journal -> Journal
|
|
|
|
filterJournalPostingsByDepth Nothing j = j
|
2009-12-21 08:43:10 +03:00
|
|
|
filterJournalPostingsByDepth (Just d) j@Journal{jtxns=ts} =
|
|
|
|
j{jtxns=filter (not . null . tpostings) $ map filtertxns ts}
|
2009-12-16 20:58:51 +03:00
|
|
|
where filtertxns t@Transaction{tpostings=ps} =
|
2009-12-21 08:23:07 +03:00
|
|
|
t{tpostings=filter ((<= d) . accountNameLevel . paccount) ps}
|
2009-04-03 14:58:05 +04:00
|
|
|
|
2012-05-27 22:14:20 +04:00
|
|
|
-- | Keep only postings which affect accounts matched by the account patterns.
|
|
|
|
-- This can leave transactions unbalanced.
|
|
|
|
filterJournalPostingsByAccount :: [String] -> Journal -> Journal
|
|
|
|
filterJournalPostingsByAccount apats j@Journal{jtxns=ts} = j{jtxns=map filterpostings ts}
|
|
|
|
where filterpostings t@Transaction{tpostings=ps} = t{tpostings=filter (matchpats apats . paccount) ps}
|
|
|
|
|
2009-12-21 08:23:07 +03:00
|
|
|
-- | Keep only transactions which affect accounts matched by the account patterns.
|
2010-04-16 03:08:27 +04:00
|
|
|
-- More precisely: each positive account pattern excludes transactions
|
|
|
|
-- which do not contain a posting to a matched account, and each negative
|
|
|
|
-- account pattern excludes transactions containing a posting to a matched
|
|
|
|
-- account.
|
2009-12-21 08:23:07 +03:00
|
|
|
filterJournalTransactionsByAccount :: [String] -> Journal -> Journal
|
2010-04-16 03:08:27 +04:00
|
|
|
filterJournalTransactionsByAccount apats j@Journal{jtxns=ts} = j{jtxns=filter tmatch ts}
|
|
|
|
where
|
|
|
|
tmatch t = (null positives || any positivepmatch ps) && (null negatives || not (any negativepmatch ps)) where ps = tpostings t
|
|
|
|
positivepmatch p = any (`amatch` a) positives where a = paccount p
|
|
|
|
negativepmatch p = any (`amatch` a) negatives where a = paccount p
|
2011-06-09 01:52:10 +04:00
|
|
|
amatch pat a = regexMatchesCI (abspat pat) a
|
2010-04-16 03:08:27 +04:00
|
|
|
(negatives,positives) = partition isnegativepat apats
|
2008-11-22 09:35:10 +03:00
|
|
|
|
2012-05-27 22:14:20 +04:00
|
|
|
-}
|
2009-12-21 08:23:07 +03:00
|
|
|
|
|
|
|
-- | Convert this journal's transactions' primary date to either the
|
2009-07-09 23:22:27 +04:00
|
|
|
-- actual or effective date.
|
2009-12-16 10:00:43 +03:00
|
|
|
journalSelectingDate :: WhichDate -> Journal -> Journal
|
2009-12-19 08:57:54 +03:00
|
|
|
journalSelectingDate ActualDate j = j
|
|
|
|
journalSelectingDate EffectiveDate j =
|
2010-07-13 10:30:06 +04:00
|
|
|
j{jtxns=map (journalTransactionWithDate EffectiveDate) $ jtxns j}
|
2009-07-09 23:22:27 +04:00
|
|
|
|
2011-08-05 04:05:39 +04:00
|
|
|
-- | Apply additional account aliases (eg from the command-line) to all postings in a journal.
|
|
|
|
journalApplyAliases :: [(AccountName,AccountName)] -> Journal -> Journal
|
|
|
|
journalApplyAliases aliases j@Journal{jtxns=ts} = j{jtxns=map fixtransaction ts}
|
|
|
|
where
|
|
|
|
fixtransaction t@Transaction{tpostings=ps} = t{tpostings=map fixposting ps}
|
|
|
|
fixposting p@Posting{paccount=a} = p{paccount=accountNameApplyAliases aliases a}
|
|
|
|
|
2012-04-14 05:12:42 +04:00
|
|
|
-- | Do post-parse processing on a journal to make it ready for use: check
|
|
|
|
-- all transactions balance, canonicalise amount formats, close any open
|
|
|
|
-- timelog entries and so on.
|
2010-11-15 01:44:37 +03:00
|
|
|
journalFinalise :: ClockTime -> LocalTime -> FilePath -> String -> JournalContext -> Journal -> Either String Journal
|
2010-11-13 18:03:40 +03:00
|
|
|
journalFinalise tclock tlocal path txt ctx j@Journal{files=fs} =
|
2010-11-15 01:44:37 +03:00
|
|
|
journalBalanceTransactions $
|
2010-09-24 05:56:11 +04:00
|
|
|
journalCanonicaliseAmounts $
|
|
|
|
journalCloseTimeLogEntries tlocal
|
2010-11-13 18:03:40 +03:00
|
|
|
j{files=(path,txt):fs, filereadtime=tclock, jContext=ctx}
|
2010-05-23 03:35:34 +04:00
|
|
|
|
2010-11-15 01:44:37 +03:00
|
|
|
-- | Fill in any missing amounts and check that all journal transactions
|
|
|
|
-- balance, or return an error message. This is done after parsing all
|
|
|
|
-- amounts and working out the canonical commodities, since balancing
|
|
|
|
-- depends on display precision. Reports only the first error encountered.
|
|
|
|
journalBalanceTransactions :: Journal -> Either String Journal
|
|
|
|
journalBalanceTransactions j@Journal{jtxns=ts} =
|
|
|
|
case sequence $ map balance ts of Right ts' -> Right j{jtxns=ts'}
|
|
|
|
Left e -> Left e
|
|
|
|
where balance = balanceTransaction (Just $ journalCanonicalCommodities j)
|
|
|
|
|
2012-01-03 12:17:04 +04:00
|
|
|
-- | Convert all the journal's posting amounts (not price 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 posting amounts in that commodity.
|
2010-05-23 03:35:34 +04:00
|
|
|
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
|
2010-11-15 02:29:04 +03:00
|
|
|
fixamount a@Amount{commodity=c} = a{commodity=fixcommodity c}
|
2010-05-23 03:35:34 +04:00
|
|
|
fixcommodity c@Commodity{symbol=s} = findWithDefault c s canonicalcommoditymap
|
|
|
|
canonicalcommoditymap = journalCanonicalCommodities j
|
2010-05-22 23:00:20 +04:00
|
|
|
|
2012-04-14 02:24:55 +04:00
|
|
|
-- -- | 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=maybe Nothing (Just . UnitPrice) $ 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
|
2010-05-23 00:23:36 +04:00
|
|
|
|
2010-05-23 03:35:34 +04:00
|
|
|
-- | 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 = []}
|
|
|
|
|
2010-05-23 00:23:36 +04:00
|
|
|
-- | 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
|
2010-11-15 02:29:04 +03:00
|
|
|
-- similar to journalCanonicaliseAmounts
|
2010-05-23 00:23:36 +04:00
|
|
|
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
|
2011-08-30 17:16:30 +04:00
|
|
|
fixamount = canonicaliseAmountCommodity (Just $ journalCanonicalCommodities j) . costOfAmount
|
2010-05-23 00:23:36 +04:00
|
|
|
|
|
|
|
-- | Get this journal's unique, display-preference-canonicalised commodities, by symbol.
|
|
|
|
journalCanonicalCommodities :: Journal -> Map.Map String Commodity
|
2010-11-15 01:44:37 +03:00
|
|
|
journalCanonicalCommodities j = canonicaliseCommodities $ journalAmountCommodities j
|
2010-05-23 00:23:36 +04:00
|
|
|
|
|
|
|
-- | 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]
|
2011-01-15 05:04:53 +03:00
|
|
|
amountCommodities Amount{commodity=c,price=p} =
|
|
|
|
case p of Nothing -> [c]
|
|
|
|
Just (UnitPrice ma) -> c:(concatMap amountCommodities $ amounts ma)
|
|
|
|
Just (TotalPrice ma) -> c:(concatMap amountCommodities $ amounts ma)
|
2010-05-23 00:23:36 +04:00
|
|
|
|
|
|
|
-- | Get all this journal's amounts, in the order parsed.
|
2009-12-16 10:00:43 +03:00
|
|
|
journalAmounts :: Journal -> [MixedAmount]
|
2009-12-19 08:57:54 +03:00
|
|
|
journalAmounts = map pamount . journalPostings
|
2008-11-22 23:35:17 +03:00
|
|
|
|
2010-05-23 00:23:36 +04:00
|
|
|
-- | The (fully specified) date span containing this journal's transactions,
|
2009-04-04 15:19:15 +04:00
|
|
|
-- or DateSpan Nothing Nothing if there are none.
|
2009-12-16 10:00:43 +03:00
|
|
|
journalDateSpan :: Journal -> DateSpan
|
2009-12-19 08:57:54 +03:00
|
|
|
journalDateSpan j
|
2009-04-04 15:19:15 +04:00
|
|
|
| null ts = DateSpan Nothing Nothing
|
2009-12-16 20:58:51 +03:00
|
|
|
| otherwise = DateSpan (Just $ tdate $ head ts) (Just $ addDays 1 $ tdate $ last ts)
|
2009-04-04 15:19:15 +04:00
|
|
|
where
|
2009-12-19 08:57:54 +03:00
|
|
|
ts = sortBy (comparing tdate) $ jtxns j
|
2009-05-29 15:31:51 +04:00
|
|
|
|
2012-04-14 05:12:42 +04:00
|
|
|
-- Misc helpers
|
|
|
|
|
2010-07-13 10:30:06 +04:00
|
|
|
-- | Check if a set of hledger account/description filter patterns matches the
|
2009-05-29 15:31:51 +04:00
|
|
|
-- given account name or entry description. Patterns are case-insensitive
|
2010-04-14 20:19:01 +04:00
|
|
|
-- regular expressions. Prefixed with not:, they become anti-patterns.
|
2009-05-29 15:31:51 +04:00
|
|
|
matchpats :: [String] -> String -> Bool
|
|
|
|
matchpats pats str =
|
|
|
|
(null positives || any match positives) && (null negatives || not (any match negatives))
|
|
|
|
where
|
|
|
|
(negatives,positives) = partition isnegativepat pats
|
|
|
|
match "" = True
|
2011-06-09 01:52:10 +04:00
|
|
|
match pat = regexMatchesCI (abspat pat) str
|
2010-04-16 03:08:27 +04:00
|
|
|
|
|
|
|
negateprefix = "not:"
|
|
|
|
|
|
|
|
isnegativepat = (negateprefix `isPrefixOf`)
|
|
|
|
|
|
|
|
abspat pat = if isnegativepat pat then drop (length negateprefix) pat else pat
|
2009-12-21 08:23:07 +03:00
|
|
|
|
2010-05-23 03:35:34 +04:00
|
|
|
-- | Calculate the account tree and all account balances from a journal's
|
|
|
|
-- postings, returning the results for efficient lookup.
|
2010-05-23 02:05:12 +04:00
|
|
|
journalAccountInfo :: Journal -> (Tree AccountName, Map.Map AccountName Account)
|
|
|
|
journalAccountInfo j = (ant, amap)
|
2009-12-21 08:23:07 +03:00
|
|
|
where
|
2010-05-23 02:05:12 +04:00
|
|
|
(ant, psof, _, inclbalof) = (groupPostings . journalPostings) j
|
2009-12-21 08:23:07 +03:00
|
|
|
amap = Map.fromList [(a, acctinfo a) | a <- flatten ant]
|
|
|
|
acctinfo a = Account a (psof a) (inclbalof a)
|
|
|
|
|
2012-05-27 22:14:20 +04:00
|
|
|
tests_journalAccountInfo = [
|
|
|
|
"journalAccountInfo" ~: do
|
|
|
|
let (t,m) = journalAccountInfo samplejournal
|
|
|
|
assertEqual "account tree"
|
|
|
|
(Node "top" [
|
|
|
|
Node "assets" [
|
|
|
|
Node "assets:bank" [
|
|
|
|
Node "assets:bank:checking" [],
|
|
|
|
Node "assets:bank:saving" []
|
|
|
|
],
|
|
|
|
Node "assets:cash" []
|
|
|
|
],
|
|
|
|
Node "expenses" [
|
|
|
|
Node "expenses:food" [],
|
|
|
|
Node "expenses:supplies" []
|
|
|
|
],
|
|
|
|
Node "income" [
|
|
|
|
Node "income:gifts" [],
|
|
|
|
Node "income:salary" []
|
|
|
|
],
|
|
|
|
Node "liabilities" [
|
|
|
|
Node "liabilities:debts" []
|
|
|
|
]
|
|
|
|
]
|
|
|
|
)
|
|
|
|
t
|
|
|
|
mapM_
|
|
|
|
(\(e,a) -> assertEqual "" e a)
|
|
|
|
(zip [
|
|
|
|
("assets",Account "assets" [] (Mixed [dollars (-1)]))
|
|
|
|
,("assets:bank",Account "assets:bank" [] (Mixed [dollars 1]))
|
|
|
|
,("assets:bank:checking",Account "assets:bank:checking" [
|
|
|
|
Posting {
|
|
|
|
pstatus=False,
|
|
|
|
paccount="assets:bank:checking",
|
|
|
|
pamount=(Mixed [dollars 1]),
|
|
|
|
pcomment="",
|
|
|
|
ptype=RegularPosting,
|
2012-05-28 02:59:06 +04:00
|
|
|
ptags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
ptransaction=Nothing
|
|
|
|
},
|
|
|
|
Posting {
|
|
|
|
pstatus=False,
|
|
|
|
paccount="assets:bank:checking",
|
|
|
|
pamount=(Mixed [dollars 1]),
|
|
|
|
pcomment="",
|
|
|
|
ptype=RegularPosting,
|
2012-05-28 02:59:06 +04:00
|
|
|
ptags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
ptransaction=Nothing
|
|
|
|
},
|
|
|
|
Posting {
|
|
|
|
pstatus=False,
|
|
|
|
paccount="assets:bank:checking",
|
|
|
|
pamount=(Mixed [dollars (-1)]),
|
|
|
|
pcomment="",
|
|
|
|
ptype=RegularPosting,
|
2012-05-28 02:59:06 +04:00
|
|
|
ptags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
ptransaction=Nothing
|
|
|
|
},
|
|
|
|
Posting {
|
|
|
|
pstatus=False,
|
|
|
|
paccount="assets:bank:checking",
|
|
|
|
pamount=(Mixed [dollars (-1)]),
|
|
|
|
pcomment="",
|
|
|
|
ptype=RegularPosting,
|
2012-05-28 02:59:06 +04:00
|
|
|
ptags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
ptransaction=Nothing
|
|
|
|
}
|
|
|
|
] (Mixed [nullamt]))
|
|
|
|
,("assets:bank:saving",Account "assets:bank:saving" [
|
|
|
|
Posting {
|
|
|
|
pstatus=False,
|
|
|
|
paccount="assets:bank:saving",
|
|
|
|
pamount=(Mixed [dollars 1]),
|
|
|
|
pcomment="",
|
|
|
|
ptype=RegularPosting,
|
2012-05-28 02:59:06 +04:00
|
|
|
ptags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
ptransaction=Nothing
|
|
|
|
}
|
|
|
|
] (Mixed [dollars 1]))
|
|
|
|
,("assets:cash",Account "assets:cash" [
|
|
|
|
Posting {
|
|
|
|
pstatus=False,
|
|
|
|
paccount="assets:cash",
|
|
|
|
pamount=(Mixed [dollars (-2)]),
|
|
|
|
pcomment="",
|
|
|
|
ptype=RegularPosting,
|
2012-05-28 02:59:06 +04:00
|
|
|
ptags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
ptransaction=Nothing
|
|
|
|
}
|
|
|
|
] (Mixed [dollars (-2)]))
|
|
|
|
,("expenses",Account "expenses" [] (Mixed [dollars 2]))
|
|
|
|
,("expenses:food",Account "expenses:food" [
|
|
|
|
Posting {
|
|
|
|
pstatus=False,
|
|
|
|
paccount="expenses:food",
|
|
|
|
pamount=(Mixed [dollars 1]),
|
|
|
|
pcomment="",
|
|
|
|
ptype=RegularPosting,
|
2012-05-28 02:59:06 +04:00
|
|
|
ptags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
ptransaction=Nothing
|
|
|
|
}
|
|
|
|
] (Mixed [dollars 1]))
|
|
|
|
,("expenses:supplies",Account "expenses:supplies" [
|
|
|
|
Posting {
|
|
|
|
pstatus=False,
|
|
|
|
paccount="expenses:supplies",
|
|
|
|
pamount=(Mixed [dollars 1]),
|
|
|
|
pcomment="",
|
|
|
|
ptype=RegularPosting,
|
2012-05-28 02:59:06 +04:00
|
|
|
ptags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
ptransaction=Nothing
|
|
|
|
}
|
|
|
|
] (Mixed [dollars 1]))
|
|
|
|
,("income",Account "income" [] (Mixed [dollars (-2)]))
|
|
|
|
,("income:gifts",Account "income:gifts" [
|
|
|
|
Posting {
|
|
|
|
pstatus=False,
|
|
|
|
paccount="income:gifts",
|
|
|
|
pamount=(Mixed [dollars (-1)]),
|
|
|
|
pcomment="",
|
|
|
|
ptype=RegularPosting,
|
2012-05-28 02:59:06 +04:00
|
|
|
ptags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
ptransaction=Nothing
|
|
|
|
}
|
|
|
|
] (Mixed [dollars (-1)]))
|
|
|
|
,("income:salary",Account "income:salary" [
|
|
|
|
Posting {
|
|
|
|
pstatus=False,
|
|
|
|
paccount="income:salary",
|
|
|
|
pamount=(Mixed [dollars (-1)]),
|
|
|
|
pcomment="",
|
|
|
|
ptype=RegularPosting,
|
2012-05-28 02:59:06 +04:00
|
|
|
ptags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
ptransaction=Nothing
|
|
|
|
}
|
|
|
|
] (Mixed [dollars (-1)]))
|
|
|
|
,("liabilities",Account "liabilities" [] (Mixed [dollars 1]))
|
|
|
|
,("liabilities:debts",Account "liabilities:debts" [
|
|
|
|
Posting {
|
|
|
|
pstatus=False,
|
|
|
|
paccount="liabilities:debts",
|
|
|
|
pamount=(Mixed [dollars 1]),
|
|
|
|
pcomment="",
|
|
|
|
ptype=RegularPosting,
|
2012-05-28 02:59:06 +04:00
|
|
|
ptags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
ptransaction=Nothing
|
|
|
|
}
|
|
|
|
] (Mixed [dollars 1]))
|
|
|
|
,("top",Account "top" [] (Mixed [nullamt]))
|
|
|
|
]
|
|
|
|
(toAscList m)
|
|
|
|
)
|
|
|
|
]
|
|
|
|
|
2009-12-21 08:23:07 +03:00
|
|
|
-- | Given a list of postings, return an account name tree and three query
|
2010-05-23 03:35:34 +04:00
|
|
|
-- functions that fetch postings, subaccount-excluding-balance and
|
|
|
|
-- subaccount-including-balance by account name.
|
2009-12-21 08:23:07 +03:00
|
|
|
groupPostings :: [Posting] -> (Tree AccountName,
|
2012-05-27 22:14:20 +04:00
|
|
|
(AccountName -> [Posting]),
|
|
|
|
(AccountName -> MixedAmount),
|
|
|
|
(AccountName -> MixedAmount))
|
2010-05-23 02:05:12 +04:00
|
|
|
groupPostings ps = (ant, psof, exclbalof, inclbalof)
|
2009-12-21 08:23:07 +03:00
|
|
|
where
|
|
|
|
anames = sort $ nub $ map paccount ps
|
|
|
|
ant = accountNameTreeFrom $ expandAccountNames anames
|
|
|
|
allanames = flatten ant
|
|
|
|
pmap = Map.union (postingsByAccount ps) (Map.fromList [(a,[]) | a <- allanames])
|
|
|
|
psof = (pmap !)
|
|
|
|
balmap = Map.fromList $ flatten $ calculateBalances ant psof
|
|
|
|
exclbalof = fst . (balmap !)
|
|
|
|
inclbalof = snd . (balmap !)
|
|
|
|
|
|
|
|
-- | Add subaccount-excluding and subaccount-including balances to a tree
|
|
|
|
-- of account names somewhat efficiently, given a function that looks up
|
|
|
|
-- transactions by account name.
|
|
|
|
calculateBalances :: Tree AccountName -> (AccountName -> [Posting]) -> Tree (AccountName, (MixedAmount, MixedAmount))
|
|
|
|
calculateBalances ant psof = addbalances ant
|
|
|
|
where
|
|
|
|
addbalances (Node a subs) = Node (a,(bal,bal+subsbal)) subs'
|
|
|
|
where
|
|
|
|
bal = sumPostings $ psof a
|
|
|
|
subsbal = sum $ map (snd . snd . root) subs'
|
|
|
|
subs' = map addbalances subs
|
|
|
|
|
|
|
|
-- | Convert a list of postings to a map from account name to that
|
|
|
|
-- account's postings.
|
|
|
|
postingsByAccount :: [Posting] -> Map.Map AccountName [Posting]
|
|
|
|
postingsByAccount ps = m'
|
|
|
|
where
|
|
|
|
sortedps = sortBy (comparing paccount) ps
|
|
|
|
groupedps = groupBy (\p1 p2 -> paccount p1 == paccount p2) sortedps
|
|
|
|
m' = Map.fromList [(paccount $ head g, g) | g <- groupedps]
|
2010-12-27 23:26:22 +03:00
|
|
|
|
2011-08-30 15:37:36 +04:00
|
|
|
-- debug helpers
|
2012-04-14 02:24:55 +04:00
|
|
|
-- traceAmountPrecision a = trace (show $ map (precision . commodity) $ amounts a) a
|
|
|
|
-- tracePostingsCommodities ps = trace (show $ map ((map (precision . commodity) . amounts) . pamount) ps) ps
|
2011-08-30 15:37:36 +04:00
|
|
|
|
2012-04-14 05:12:42 +04:00
|
|
|
-- tests
|
|
|
|
|
2012-05-27 22:14:20 +04:00
|
|
|
-- A sample journal for testing, similar to data/sample.journal:
|
|
|
|
--
|
|
|
|
-- 2008/01/01 income
|
|
|
|
-- assets:bank:checking $1
|
|
|
|
-- income:salary
|
|
|
|
--
|
|
|
|
-- 2008/06/01 gift
|
|
|
|
-- assets:bank:checking $1
|
|
|
|
-- income:gifts
|
|
|
|
--
|
|
|
|
-- 2008/06/02 save
|
|
|
|
-- assets:bank:saving $1
|
|
|
|
-- assets:bank:checking
|
|
|
|
--
|
|
|
|
-- 2008/06/03 * eat & shop
|
|
|
|
-- expenses:food $1
|
|
|
|
-- expenses:supplies $1
|
|
|
|
-- assets:cash
|
|
|
|
--
|
|
|
|
-- 2008/12/31 * pay off
|
|
|
|
-- liabilities:debts $1
|
|
|
|
-- assets:bank:checking
|
|
|
|
--
|
|
|
|
Right samplejournal = journalBalanceTransactions $ Journal
|
|
|
|
[]
|
|
|
|
[]
|
|
|
|
[
|
|
|
|
txnTieKnot $ Transaction {
|
|
|
|
tdate=parsedate "2008/01/01",
|
|
|
|
teffectivedate=Nothing,
|
|
|
|
tstatus=False,
|
|
|
|
tcode="",
|
|
|
|
tdescription="income",
|
|
|
|
tcomment="",
|
2012-05-28 02:59:06 +04:00
|
|
|
ttags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
tpostings=[
|
|
|
|
Posting {
|
|
|
|
pstatus=False,
|
|
|
|
paccount="assets:bank:checking",
|
|
|
|
pamount=(Mixed [dollars 1]),
|
|
|
|
pcomment="",
|
|
|
|
ptype=RegularPosting,
|
2012-05-28 02:59:06 +04:00
|
|
|
ptags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
ptransaction=Nothing
|
|
|
|
},
|
|
|
|
Posting {
|
|
|
|
pstatus=False,
|
|
|
|
paccount="income:salary",
|
|
|
|
pamount=(missingmixedamt),
|
|
|
|
pcomment="",
|
|
|
|
ptype=RegularPosting,
|
2012-05-28 02:59:06 +04:00
|
|
|
ptags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
ptransaction=Nothing
|
|
|
|
}
|
|
|
|
],
|
|
|
|
tpreceding_comment_lines=""
|
|
|
|
}
|
|
|
|
,
|
|
|
|
txnTieKnot $ Transaction {
|
|
|
|
tdate=parsedate "2008/06/01",
|
|
|
|
teffectivedate=Nothing,
|
|
|
|
tstatus=False,
|
|
|
|
tcode="",
|
|
|
|
tdescription="gift",
|
|
|
|
tcomment="",
|
2012-05-28 02:59:06 +04:00
|
|
|
ttags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
tpostings=[
|
|
|
|
Posting {
|
|
|
|
pstatus=False,
|
|
|
|
paccount="assets:bank:checking",
|
|
|
|
pamount=(Mixed [dollars 1]),
|
|
|
|
pcomment="",
|
|
|
|
ptype=RegularPosting,
|
2012-05-28 02:59:06 +04:00
|
|
|
ptags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
ptransaction=Nothing
|
|
|
|
},
|
|
|
|
Posting {
|
|
|
|
pstatus=False,
|
|
|
|
paccount="income:gifts",
|
|
|
|
pamount=(missingmixedamt),
|
|
|
|
pcomment="",
|
|
|
|
ptype=RegularPosting,
|
2012-05-28 02:59:06 +04:00
|
|
|
ptags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
ptransaction=Nothing
|
|
|
|
}
|
|
|
|
],
|
|
|
|
tpreceding_comment_lines=""
|
|
|
|
}
|
|
|
|
,
|
|
|
|
txnTieKnot $ Transaction {
|
|
|
|
tdate=parsedate "2008/06/02",
|
|
|
|
teffectivedate=Nothing,
|
|
|
|
tstatus=False,
|
|
|
|
tcode="",
|
|
|
|
tdescription="save",
|
|
|
|
tcomment="",
|
2012-05-28 02:59:06 +04:00
|
|
|
ttags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
tpostings=[
|
|
|
|
Posting {
|
|
|
|
pstatus=False,
|
|
|
|
paccount="assets:bank:saving",
|
|
|
|
pamount=(Mixed [dollars 1]),
|
|
|
|
pcomment="",
|
|
|
|
ptype=RegularPosting,
|
2012-05-28 02:59:06 +04:00
|
|
|
ptags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
ptransaction=Nothing
|
|
|
|
},
|
|
|
|
Posting {
|
|
|
|
pstatus=False,
|
|
|
|
paccount="assets:bank:checking",
|
|
|
|
pamount=(Mixed [dollars (-1)]),
|
|
|
|
pcomment="",
|
|
|
|
ptype=RegularPosting,
|
2012-05-28 02:59:06 +04:00
|
|
|
ptags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
ptransaction=Nothing
|
|
|
|
}
|
|
|
|
],
|
|
|
|
tpreceding_comment_lines=""
|
|
|
|
}
|
|
|
|
,
|
|
|
|
txnTieKnot $ Transaction {
|
|
|
|
tdate=parsedate "2008/06/03",
|
|
|
|
teffectivedate=Nothing,
|
|
|
|
tstatus=True,
|
|
|
|
tcode="",
|
|
|
|
tdescription="eat & shop",
|
|
|
|
tcomment="",
|
2012-05-28 02:59:06 +04:00
|
|
|
ttags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
tpostings=[
|
|
|
|
Posting {
|
|
|
|
pstatus=False,
|
|
|
|
paccount="expenses:food",
|
|
|
|
pamount=(Mixed [dollars 1]),
|
|
|
|
pcomment="",
|
|
|
|
ptype=RegularPosting,
|
2012-05-28 02:59:06 +04:00
|
|
|
ptags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
ptransaction=Nothing
|
|
|
|
},
|
|
|
|
Posting {
|
|
|
|
pstatus=False,
|
|
|
|
paccount="expenses:supplies",
|
|
|
|
pamount=(Mixed [dollars 1]),
|
|
|
|
pcomment="",
|
|
|
|
ptype=RegularPosting,
|
2012-05-28 02:59:06 +04:00
|
|
|
ptags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
ptransaction=Nothing
|
|
|
|
},
|
|
|
|
Posting {
|
|
|
|
pstatus=False,
|
|
|
|
paccount="assets:cash",
|
|
|
|
pamount=(missingmixedamt),
|
|
|
|
pcomment="",
|
|
|
|
ptype=RegularPosting,
|
2012-05-28 02:59:06 +04:00
|
|
|
ptags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
ptransaction=Nothing
|
|
|
|
}
|
|
|
|
],
|
|
|
|
tpreceding_comment_lines=""
|
|
|
|
}
|
|
|
|
,
|
|
|
|
txnTieKnot $ Transaction {
|
|
|
|
tdate=parsedate "2008/12/31",
|
|
|
|
teffectivedate=Nothing,
|
|
|
|
tstatus=False,
|
|
|
|
tcode="",
|
|
|
|
tdescription="pay off",
|
|
|
|
tcomment="",
|
2012-05-28 02:59:06 +04:00
|
|
|
ttags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
tpostings=[
|
|
|
|
Posting {
|
|
|
|
pstatus=False,
|
|
|
|
paccount="liabilities:debts",
|
|
|
|
pamount=(Mixed [dollars 1]),
|
|
|
|
pcomment="",
|
|
|
|
ptype=RegularPosting,
|
2012-05-28 02:59:06 +04:00
|
|
|
ptags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
ptransaction=Nothing
|
|
|
|
},
|
|
|
|
Posting {
|
|
|
|
pstatus=False,
|
|
|
|
paccount="assets:bank:checking",
|
|
|
|
pamount=(Mixed [dollars (-1)]),
|
|
|
|
pcomment="",
|
|
|
|
ptype=RegularPosting,
|
2012-05-28 02:59:06 +04:00
|
|
|
ptags=[],
|
2012-05-27 22:14:20 +04:00
|
|
|
ptransaction=Nothing
|
|
|
|
}
|
|
|
|
],
|
|
|
|
tpreceding_comment_lines=""
|
|
|
|
}
|
|
|
|
]
|
|
|
|
[]
|
|
|
|
[]
|
|
|
|
""
|
|
|
|
nullctx
|
|
|
|
[]
|
|
|
|
(TOD 0 0)
|
|
|
|
|
|
|
|
tests_Hledger_Data_Journal = TestList $
|
|
|
|
tests_journalAccountInfo
|
|
|
|
-- [
|
2012-04-14 05:12:42 +04:00
|
|
|
-- "query standard account types" ~:
|
|
|
|
-- do
|
|
|
|
-- let j = journal1
|
|
|
|
-- journalBalanceSheetAccountNames j `is` ["assets","assets:a","equity","equity:q","equity:q:qq","liabilities","liabilities:l"]
|
|
|
|
-- journalProfitAndLossAccountNames j `is` ["expenses","expenses:e","income","income:i"]
|
2012-05-27 22:14:20 +04:00
|
|
|
-- ]
|