mirror of
https://github.com/simonmichael/hledger.git
synced 2024-11-08 07:09:28 +03:00
47 lines
1.4 KiB
Haskell
47 lines
1.4 KiB
Haskell
{-# LANGUAGE RecordWildCards, DeriveDataTypeable, FlexibleInstances #-}
|
|
{-|
|
|
|
|
Generate several common kinds of report from a journal, as \"*Report\" -
|
|
simple intermediate data structures intended to be easily rendered as
|
|
text, html, json, csv etc. by hledger commands, hamlet templates,
|
|
javascript, or whatever.
|
|
|
|
-}
|
|
|
|
module Hledger.Reports (
|
|
module Hledger.Reports.ReportOptions,
|
|
module Hledger.Reports.ReportTypes,
|
|
module Hledger.Reports.EntriesReport,
|
|
module Hledger.Reports.PostingsReport,
|
|
module Hledger.Reports.TransactionsReports,
|
|
module Hledger.Reports.BalanceReport,
|
|
module Hledger.Reports.MultiBalanceReports,
|
|
module Hledger.Reports.BudgetReport,
|
|
-- module Hledger.Reports.BalanceHistoryReport,
|
|
|
|
-- * Tests
|
|
tests_Hledger_Reports
|
|
)
|
|
where
|
|
|
|
import Hledger.Reports.ReportOptions
|
|
import Hledger.Reports.ReportTypes
|
|
import Hledger.Reports.EntriesReport
|
|
import Hledger.Reports.PostingsReport
|
|
import Hledger.Reports.TransactionsReports
|
|
import Hledger.Reports.BalanceReport
|
|
import Hledger.Reports.MultiBalanceReports
|
|
import Hledger.Reports.BudgetReport
|
|
-- import Hledger.Reports.BalanceHistoryReport
|
|
import Hledger.Utils.Test
|
|
|
|
tests_Hledger_Reports = TestList $
|
|
-- ++ tests_isInterestingIndented
|
|
[
|
|
tests_Hledger_Reports_ReportOptions,
|
|
tests_Hledger_Reports_EntriesReport,
|
|
tests_Hledger_Reports_PostingsReport,
|
|
tests_Hledger_Reports_BalanceReport,
|
|
tests_Hledger_Reports_MultiBalanceReport
|
|
]
|