{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE OverloadedStrings #-}
module Hledger.Reports (
  module Hledger.Reports.ReportOptions,
  module Hledger.Reports.ReportTypes,
  module Hledger.Reports.EntriesReport,
  module Hledger.Reports.PostingsReport,
  module Hledger.Reports.AccountTransactionsReport,
  module Hledger.Reports.BalanceReport,
  module Hledger.Reports.MultiBalanceReport,
  module Hledger.Reports.BudgetReport,
  
  tests_Reports
)
where
import Test.Tasty (testGroup)
import Hledger.Reports.ReportOptions
import Hledger.Reports.ReportTypes
import Hledger.Reports.AccountTransactionsReport
import Hledger.Reports.EntriesReport
import Hledger.Reports.PostingsReport
import Hledger.Reports.BalanceReport
import Hledger.Reports.MultiBalanceReport
import Hledger.Reports.BudgetReport
tests_Reports :: TestTree
tests_Reports = TestName -> [TestTree] -> TestTree
testGroup TestName
"Reports" [
   TestTree
tests_BalanceReport
  ,TestTree
tests_BudgetReport
  ,TestTree
tests_AccountTransactionsReport
  ,TestTree
tests_EntriesReport
  ,TestTree
tests_MultiBalanceReport
  ,TestTree
tests_PostingsReport
  ]