Ajout : CLI.Command.Balance : --format {open,close}.
authorJulien Moutinho <julm+hcompta@autogeree.net>
Mon, 3 Aug 2015 01:29:18 +0000 (03:29 +0200)
committerJulien Moutinho <julm+hcompta@autogeree.net>
Mon, 3 Aug 2015 18:53:29 +0000 (20:53 +0200)
15 files changed:
cli/Hcompta/CLI/Command/Balance.hs
cli/Hcompta/CLI/Lang.hs
cli/hcompta-cli.cabal
lib/Hcompta/Amount.hs
lib/Hcompta/Date.hs
lib/Hcompta/Date/Read.hs
lib/Hcompta/Date/Write.hs
lib/Hcompta/Filter/Read.hs
lib/Hcompta/Format/Ledger.hs
lib/Hcompta/Format/Ledger/Read.hs
lib/Hcompta/Format/Ledger/Write.hs
lib/Hcompta/GL.hs
lib/Hcompta/Journal.hs
lib/Hcompta/Lib/TreeMap.hs
lib/Test/Main.hs

index 0f2fb88823e20ab75c426c5d995fa9c241e374bf..1b36a01553a2d3972ad0067c991305c7df93704f 100644 (file)
@@ -18,6 +18,7 @@ import qualified Data.Map.Strict as Data.Map
 import           Data.Monoid ((<>))
 import qualified Data.Strict.Maybe as Strict
 import qualified Data.Text.Lazy as TL
+import qualified Data.Time.Clock as Time
 import           System.Console.GetOpt
                  ( ArgDescr(..)
                  , OptDescr(..)
@@ -26,19 +27,23 @@ import           System.Console.GetOpt
 import           System.Environment as Env (getProgName)
 import           System.Exit (exitSuccess)
 import qualified System.IO as IO
+import qualified Text.Parsec
 
 import           Hcompta.Account (Account)
+import qualified Hcompta.Account as Account
 import           Hcompta.Amount (Amount)
 import qualified Hcompta.Amount as Amount
 import qualified Hcompta.Amount.Write as Amount.Write
 import           Hcompta.Amount.Unit (Unit)
 import qualified Hcompta.Balance as Balance
 import qualified Hcompta.CLI.Args as Args
+import           Hcompta.CLI.Context (Context)
 import qualified Hcompta.CLI.Context as Context
 import qualified Hcompta.CLI.Format.Ledger as CLI.Ledger
 import qualified Hcompta.CLI.Lang as Lang
 import qualified Hcompta.CLI.Lib.Leijen.Table as Table
 import qualified Hcompta.CLI.Write as Write
+import qualified Hcompta.Date as Date
 import qualified Hcompta.Filter as Filter
 import qualified Hcompta.Filter.Read as Filter.Read
 import qualified Hcompta.Format.Ledger as Ledger
@@ -47,36 +52,53 @@ import qualified Hcompta.Format.Ledger.Read as Ledger.Read
 import qualified Hcompta.Format.Ledger.Write as Ledger.Write
 import           Hcompta.Lib.Leijen (toDoc, ToDoc(..))
 import qualified Hcompta.Lib.Leijen as W
-import qualified Hcompta.Lib.TreeMap as Lib.TreeMap
+import           Hcompta.Lib.TreeMap (TreeMap)
+import qualified Hcompta.Lib.TreeMap as TreeMap
 
 data Ctx
  =   Ctx
- { ctx_filter_balance     :: Filter.Simplified
-                             (Filter.Filter_Bool
-                             (Filter.Filter_Balance
-                             (Account, Amount.Sum Amount)))
- , ctx_filter_posting     :: Filter.Simplified
-                             (Filter.Filter_Bool
-                             (Filter.Filter_Posting
-                             Ledger.Posting))
- , ctx_filter_transaction :: Filter.Simplified
-                             (Filter.Filter_Bool
-                             (Filter.Filter_Transaction
-                             Ledger.Transaction))
- , ctx_input              :: [FilePath]
- , ctx_reduce_date        :: Bool
- , ctx_redundant          :: Bool
+ { ctx_filter_balance      :: Filter.Simplified
+                              (Filter.Filter_Bool
+                              (Filter.Filter_Balance
+                              (Account, Amount.Sum Amount)))
+ , ctx_filter_posting      :: Filter.Simplified
+                              (Filter.Filter_Bool
+                              (Filter.Filter_Posting
+                              Ledger.Posting))
+ , ctx_filter_transaction  :: Filter.Simplified
+                              (Filter.Filter_Bool
+                              (Filter.Filter_Transaction
+                              Ledger.Transaction))
+ , ctx_heritage            :: Bool
+ , ctx_input               :: [FilePath]
+ , ctx_reduce_date         :: Bool
+ , ctx_redundant           :: Bool
+ , ctx_total_by_unit       :: Bool
+ , ctx_format_output       :: Format_Output
+ , ctx_account_equilibrium :: Account
  } deriving (Show)
 
-nil :: Ctx
-nil =
+data Format_Output
+ =   Format_Output_Table
+ |   Format_Output_Transaction { negate_transaction :: Bool }
+ deriving (Eq, Show)
+
+nil :: Context -> Ctx
+nil context =
        Ctx
-        { ctx_filter_balance     = mempty
-        , ctx_filter_posting     = mempty
-        , ctx_filter_transaction = mempty
-        , ctx_input              = []
-        , ctx_reduce_date        = True
-        , ctx_redundant          = False
+        { ctx_filter_balance      = mempty
+        , ctx_filter_posting      = mempty
+        , ctx_filter_transaction  = mempty
+        , ctx_heritage            = True
+        , ctx_input               = []
+        , ctx_reduce_date         = True
+        , ctx_redundant           = False
+        , ctx_total_by_unit       = True
+        , ctx_format_output       = Format_Output_Table
+        , ctx_account_equilibrium = Account.account
+                (TL.toStrict $ W.displayT $ W.renderOneLine False $
+                       toDoc (Context.lang context) Lang.Message_Equilibrium)
+                []
         }
 
 usage :: IO String
@@ -159,11 +181,56 @@ options =
                return $ ctx{ctx_redundant})
          "[yes|no]")
         "also print accounts with zero amount or the same amounts than its ascending account"
+       , Option "" ["heritage"]
+        (OptArg (\arg context ctx -> do
+               ctx_heritage <- case arg of
+                Nothing    -> return $ True
+                Just "yes" -> return $ True
+                Just "no"  -> return $ False
+                Just _     -> Write.fatal context $
+                       W.text "--heritage option expects \"yes\", or \"no\" as value"
+               return $ ctx{ctx_heritage})
+         "[yes|no]")
+        "propagate amounts to ascending accounts"
+       , Option "" ["total"]
+        (OptArg (\arg context ctx -> do
+               ctx_total_by_unit <- case arg of
+                Nothing    -> return $ True
+                Just "yes" -> return $ True
+                Just "no"  -> return $ False
+                Just _     -> Write.fatal context $
+                       W.text "--total option expects \"yes\", or \"no\" as value"
+               return $ ctx{ctx_total_by_unit})
+         "[yes|no]")
+        "calculate totals by unit"
+       , Option "f" ["format"]
+        (ReqArg (\arg context ctx -> do
+               ctx_format_output <- case arg of
+                "table" -> return $ Format_Output_Table
+                "open"  -> return $ Format_Output_Transaction False
+                "close" -> return $ Format_Output_Transaction True
+                _       -> Write.fatal context $
+                       W.text "--format option expects \"close\", \"open\", or \"table\" as value"
+               return $ ctx{ctx_format_output})
+         "[close|open|table]")
+        "select output format"
+       , Option "" ["equilibrium"]
+        (ReqArg (\arg context ctx -> do
+               ctx_account_equilibrium <-
+                       case Text.Parsec.runParser
+                                (Ledger.Read.account <* Text.Parsec.eof)
+                                () "" arg of
+                        Right acct -> return acct
+                        _          -> Write.fatal context $
+                               W.text "--equilibrium option expects a valid account name"
+               return $ ctx{ctx_account_equilibrium})
+         "ACCOUNT")
+        "specify account equilibrating a close or open balance"
        ]
 
 run :: Context.Context -> [String] -> IO ()
 run context args = do
-       (ctx, inputs) <- Args.parse context usage options (nil, args)
+       (ctx, inputs) <- Args.parse context usage options (nil context, args)
        read_journals <-
                liftM Data.Either.partitionEithers $ do
                CLI.Ledger.paths context $ ctx_input ctx ++ inputs
@@ -185,51 +252,141 @@ run context args = do
                Write.debug context $ "filter: transaction: " ++ show (ctx_filter_transaction ctx)
                Write.debug context $ "filter: posting: " ++ show (ctx_filter_posting ctx)
                Write.debug context $ "filter: balance: " ++ show (ctx_filter_balance ctx)
-               let (balance_by_account, Balance.Balance_by_Unit balance_by_unit) =
-                       ledger_balances ctx journals
                style_color <- Write.with_color context IO.stdout
-               W.displayIO IO.stdout $
-                W.renderPretty style_color 1.0 maxBound $ do
-                       toDoc () $
-                               let title =
-                                       TL.toStrict . W.displayT .
-                                       W.renderCompact False .
-                                       toDoc (Context.lang context) in
-                               zipWith id
-                               [ Table.column (title Lang.Message_Debit)   Table.Align_Right
-                               , Table.column (title Lang.Message_Credit)  Table.Align_Right
-                               , Table.column (title Lang.Message_Balance) Table.Align_Right
-                               , Table.column (title Lang.Message_Account) Table.Align_Left
-                               ] $
-                               write_by_accounts ctx balance_by_account $
-                               zipWith (:)
-                                       [ Table.Cell_Line '=' 0
-                                       , Table.Cell_Line '=' 0
-                                       , Table.Cell_Line '=' 0
-                                       , Table.Cell_Line ' ' 0
-                                       ] $
-                               flip write_by_amounts (repeat []) $
-                                       Data.Map.map
-                                        Balance.unit_sum_amount
-                                        balance_by_unit
+               case ctx_format_output ctx of
+                Format_Output_Transaction nt -> do
+                       let balance_by_account =
+                               ledger_balance_by_account_filter ctx $
+                               ledger_balance_by_account ctx journals
+                       let Balance.Balance_by_Unit balance_by_unit =
+                               ledger_balance_by_unit ctx $
+                               ledger_balance_by_account_filter ctx balance_by_account
+                       let posting_equilibrium =
+                               (Ledger.posting $ ctx_account_equilibrium ctx)
+                                { Ledger.posting_amounts =
+                                       flip Data.Map.map balance_by_unit $
+                                               (if nt then id else negate)
+                                               . Amount.sum_balance
+                                               . Balance.unit_sum_amount
+                                , Ledger.posting_comments=
+                                        [ TL.toStrict $ W.displayT $ W.renderOneLine False $
+                                               toDoc (Context.lang context) $
+                                               Lang.Message_Equilibrium_posting
+                                        ]
+                                }
+                       now <- liftM (\d -> d{Time.utctDayTime=0}) $ Date.now
+                       let transaction =
+                               Ledger.transaction
+                                { Ledger.transaction_description=
+                                       TL.toStrict $ W.displayT $ W.renderOneLine False $
+                                       toDoc (Context.lang context) $
+                                       Lang.Message_Balance_Description nt
+                                , Ledger.transaction_dates=(now, [])
+                                , Ledger.transaction_postings=
+                                       (if null $ Ledger.posting_amounts posting_equilibrium
+                                       then id
+                                       else
+                                               Data.Map.insertWith (++)
+                                                (ctx_account_equilibrium ctx)
+                                                [posting_equilibrium]) $
+                                       TreeMap.flatten_with_Path
+                                        (\posting_account (Balance.Account_Sum amount_by_unit) ->
+                                               [(Ledger.posting posting_account)
+                                                { Ledger.posting_amounts =
+                                                       flip fmap amount_by_unit $
+                                                               (if nt then negate else id)
+                                                               . Amount.sum_balance
+                                                }
+                                               ]
+                                        )
+                                        balance_by_account
+                                }
+                       let sty = Ledger.Write.Style
+                                { Ledger.Write.style_align = True -- ctx_align ctx
+                                , Ledger.Write.style_color
+                                }
+                       Ledger.Write.put sty IO.stdout $ do
+                       Ledger.Write.transaction transaction
+                Format_Output_Table -> do
+                       let ( table_balance_by_account
+                                 , Balance.Balance_by_Unit balance_by_unit
+                                 ) =
+                               case ledger_balance_by_account ctx journals of
+                                b | ctx_heritage ctx ->
+                                       let bb = ledger_balance_by_account_expanded ctx b in
+                                       ( table_by_account ctx Balance.inclusive bb
+                                       , ledger_balance_by_unit_expanded ctx bb
+                                       )
+                                b ->
+                                       let bb = ledger_balance_by_account_filter ctx b in
+                                       ( table_by_account ctx id bb
+                                       , ledger_balance_by_unit ctx bb
+                                       )
+                       W.displayIO IO.stdout $ do
+                       W.renderPretty style_color 1.0 maxBound $ do
+                       toDoc () $ do
+                       let title =
+                               TL.toStrict . W.displayT .
+                               W.renderCompact False .
+                               toDoc (Context.lang context)
+                       zipWith id
+                        [ Table.column (title Lang.Message_Debit)   Table.Align_Right
+                        , Table.column (title Lang.Message_Credit)  Table.Align_Right
+                        , Table.column (title Lang.Message_Balance) Table.Align_Right
+                        , Table.column (title Lang.Message_Account) Table.Align_Left
+                        ] $ do
+                               table_balance_by_account $ do
+                               case ctx_total_by_unit ctx of
+                                False -> repeat []
+                                True -> do
+                                       zipWith (:)
+                                        [ Table.Cell_Line '=' 0
+                                        , Table.Cell_Line '=' 0
+                                        , Table.Cell_Line '=' 0
+                                        , Table.Cell_Line ' ' 0
+                                        ] $ do
+                                       flip table_by_unit (repeat []) $
+                                               Data.Map.map
+                                                Balance.unit_sum_amount
+                                                balance_by_unit
 
-ledger_balances
+ledger_balance_by_account
  :: Ctx
  -> [ Ledger.Journal (Const (Balance.Balance_by_Account (Amount.Sum Amount)) Ledger.Transaction) ]
- -> ( Balance.Expanded        (Amount.Sum Amount)
-    , Balance.Balance_by_Unit (Amount.Sum Amount) )
-ledger_balances ctx journals =
-       let balance_by_account =
-               Data.Foldable.foldl'
-                (flip $ Ledger.Journal.fold
-                        (\Ledger.Journal{Ledger.journal_transactions=Const b} ->
-                               mappend b))
-                mempty journals in
-       let balance_expanded =
-               Lib.TreeMap.filter_with_Path_and_Node
+ -> Balance.Balance_by_Account (Amount.Sum Amount)
+ledger_balance_by_account _ctx =
+       Data.Foldable.foldl'
+        (flip $ Ledger.Journal.fold
+                (\Ledger.Journal{Ledger.journal_transactions=Const b} ->
+                       mappend b))
+        mempty
+
+ledger_balance_by_account_filter
+ :: Ctx
+ -> Balance.Balance_by_Account (Amount.Sum Amount)
+ -> Balance.Balance_by_Account (Amount.Sum Amount)
+ledger_balance_by_account_filter ctx =
+       case Filter.simplified $ ctx_filter_balance ctx of
+        Right True -> id
+        Right False -> const mempty
+        Left flt ->
+               TreeMap.filter_with_Path $ \acct ->
+                       Data.Foldable.any (Filter.test flt . (acct,)) .
+                       Balance.get_Account_Sum
+
+ledger_balance_by_account_expanded
+ :: Ctx
+ -> Balance.Balance_by_Account (Amount.Sum Amount)
+ -> Balance.Expanded           (Amount.Sum Amount)
+ledger_balance_by_account_expanded ctx =
+       case Filter.simplified $ ctx_filter_balance ctx of
+        Right True  -> id
+        Right False -> const mempty
+        Left flt ->
+               TreeMap.filter_with_Path_and_Node
                 (\node acct balance ->
-                       let descendants = Lib.TreeMap.nodes
-                                (Lib.TreeMap.node_descendants node) in
+                       let descendants = TreeMap.nodes
+                                (TreeMap.node_descendants node) in
                        let is_worth =
                                ctx_redundant ctx
                                -- NOTE: worth if no descendant
@@ -257,32 +414,39 @@ ledger_balances ctx journals =
                                                                 . Amount.sum_balance )
                                                         . Balance.get_Account_Sum
                                                         . Balance.inclusive )
-                                                . Lib.TreeMap.node_value )
+                                                . TreeMap.node_value )
                                                 descendants) > 1
                        in
                        (&&) is_worth $
-                       Data.Foldable.any
-                                (Filter.test (ctx_filter_balance ctx) . (acct,)) $
+                       Data.Foldable.any (Filter.test flt . (acct,)) $
                                Balance.get_Account_Sum $
                                Balance.inclusive balance
-                ) $
-               Balance.expanded balance_by_account in
-       let balance_by_unit =
-               Balance.by_unit_of_expanded
-                balance_expanded
-                mempty in
-       ( balance_expanded
-       , balance_by_unit
-       )
+                )
+       . Balance.expanded
+
+ledger_balance_by_unit
+ :: Ctx
+ -> Balance.Balance_by_Account (Amount.Sum Amount)
+ -> Balance.Balance_by_Unit    (Amount.Sum Amount)
+ledger_balance_by_unit _ctx =
+       flip Balance.by_unit_of_by_account mempty
+
+ledger_balance_by_unit_expanded
+ :: Ctx
+ -> Balance.Expanded        (Amount.Sum Amount)
+ -> Balance.Balance_by_Unit (Amount.Sum Amount)
+ledger_balance_by_unit_expanded _ctx =
+       flip Balance.by_unit_of_expanded mempty
 
-write_by_accounts
+table_by_account
  :: Ctx
- -> Balance.Expanded (Amount.Sum Amount)
+ -> (amount -> Balance.Account_Sum (Amount.Sum Amount))
+ -> TreeMap Account.Name amount
  -> [[Table.Cell]]
  -> [[Table.Cell]]
-write_by_accounts _ctx =
+table_by_account _ctx get_Account_Sum =
        let posting_type = Ledger.Posting_Type_Regular in
-       flip $ Lib.TreeMap.foldr_with_Path
+       flip $ TreeMap.foldr_with_Path
         (\account balance rows ->
                foldr
                 (\(amount_positive, amount_negative, amount) ->
@@ -306,7 +470,7 @@ write_by_accounts _ctx =
                                ]
                 )
                 rows $
-               let bal = Balance.get_Account_Sum $ Balance.inclusive balance in
+               let bal = Balance.get_Account_Sum $ get_Account_Sum balance in
                Data.Map.foldrWithKey
                 (\unit amount acc ->
                        ( maybe Nothing Amount.sum_positive $ Data.Map.lookup unit $ bal
@@ -316,11 +480,11 @@ write_by_accounts _ctx =
                 ) [] $ bal
         )
 
-write_by_amounts
+table_by_unit
  :: Data.Map.Map Unit (Amount.Sum Amount)
  -> [[Table.Cell]]
  -> [[Table.Cell]]
-write_by_amounts =
+table_by_unit =
        flip $ foldr
         (\amount_sum ->
                zipWith (:)
index ee77f1658485d785757990a8dd6c4d68e2bc2e86..b9e973b2fb213758cc4829806add1201bb568c86 100644 (file)
@@ -223,6 +223,9 @@ data Message
  | Message_Account {}
  | Message_Date {}
  | Message_Description {}
+ | Message_Equilibrium {}
+ | Message_Equilibrium_posting {}
+ | Message_Balance_Description Bool
 instance ToDoc Lang Message where
        toDoc EN msg =
                case msg of
@@ -280,6 +283,14 @@ instance ToDoc Lang Message where
                        "Date"
                 Message_Description ->
                        "Description"
+                Message_Equilibrium ->
+                       "Equilibrium"
+                Message_Equilibrium_posting ->
+                       "Equilibrium posting"
+                Message_Balance_Description negate_transaction ->
+                       case negate_transaction of
+                        True  -> "Closing balance"
+                        False -> "Opening balance"
        toDoc FR msg =
                case msg of
                 Message_ERROR ->
@@ -336,3 +347,11 @@ instance ToDoc Lang Message where
                        "Date"
                 Message_Description ->
                        "Libellé"
+                Message_Equilibrium ->
+                       "Équilibre"
+                Message_Equilibrium_posting ->
+                       "Mouvement d’équilibre"
+                Message_Balance_Description negate_transaction ->
+                       case negate_transaction of
+                        True  -> "Solde de clôture"
+                        False -> "Solde d’ouverture"
index dc0788847a654aa52d55770183b950c6ba3ace87..14a8bf18dbadad80b3b545698927c6f0a263d120 100644 (file)
@@ -85,6 +85,7 @@ Library
     , strict
     -- , template-haskell
     , text
+    , time
     , transformers >= 0.4 && < 0.5
                    -- NOTE: needed for Control.Monad.Trans.Except
 
@@ -120,6 +121,7 @@ Executable hcompta-cli
     , strict
     -- , template-haskell
     , text
+    , time
     , transformers >= 0.4 && < 0.5
                    -- NOTE: needed for Control.Monad.Trans.Except
 
index 5a8c1422c006cd014c5416d11354ef3a0eb89b69..bf12fec5085a0b4ccfc91ea8dde618925ec30aca 100644 (file)
@@ -290,7 +290,7 @@ instance Num Amount_by_Unit where
 type Signs = (Int, Int)
 
 signs :: Amount_by_Unit -> Signs
-signs = Data.Map.foldl
+signs = Data.Map.foldl'
  (\(nega, plus) amt ->
        case flip compare 0 $ quantity amt of
         LT -> (nega - 1, plus)
index c9aa8632d3c36e0eaad7aee4713efe70b1584a91..fa0307044bb05226ec31e8f7975c45706ad670a7 100644 (file)
@@ -1,4 +1,3 @@
-{-# LANGUAGE TypeSynonymInstances #-}
 {-# OPTIONS_GHC -fno-warn-orphans #-}
 module Hcompta.Date where
 
index 258b082f359e9355f3356c21127ed238db536a8c..76493857486d5095200107ed64a1d8162dc6e9be 100644 (file)
@@ -29,7 +29,7 @@ data Error
  |   Error_invalid_time_of_day (Int, Int, Integer)
  deriving (Eq, Show)
 
--- | Read a 'Date' in @[YYYY\/]MM\/DD [HH:MM[:SS][TZ]]@ format.
+-- | Read a 'Date' in @[YYYY\/]MM\/DD[_HH:MM[:SS][TZ]]@ format.
 date
  :: (Stream s (R.Error_State e m) Char, Monad m)
  => (Error -> e) -> Maybe Integer -> ParsecT s u (R.Error_State e m) Date
@@ -53,7 +53,7 @@ date err def_year = (do
         Just day -> return day
        (hour, minu, sec, tz) <-
                R.option (0, 0, 0, Time.utc) $ R.try $ do
-                       R.skipMany1 $ R.space_horizontal
+                       _ <- R.char '_'
                        hour <- read_2_or_1_digits
                        sep <- hour_separator
                        minu <- read_2_or_1_digits
@@ -61,7 +61,7 @@ date err def_year = (do
                                _ <- R.char sep
                                Just <$> read_2_or_1_digits
                        tz <- R.option Time.utc $ R.try $ do
-                               R.skipMany $ R.space_horizontal
+                               -- R.skipMany $ R.space_horizontal
                                time_zone
                        return
                         ( fromInteger $ R.integer_of_digits 10 hour
index 5ff4c2262b4a450264aa33c1884b327bd852482e..10ce68ec7f1093ceb5c353f4f22ca9187410177e 100644 (file)
@@ -1,7 +1,6 @@
 {-# LANGUAGE MagicHash #-}
 module Hcompta.Date.Write where
 
-import           Data.Fixed (showFixed)
 import qualified Data.Text as Text
 import qualified Data.Time.LocalTime as Time
 import           GHC.Exts (Int(..))
@@ -23,13 +22,13 @@ date dat = do
        (case Date.tod dat of
         Time.TimeOfDay 0 0 0 -> W.empty
         Time.TimeOfDay h m s ->
-               W.space <> int2 h <> do
+               sep '_' <> int2 h <> do
                sep ':' <> int2 m <> do
                (case s of
                 0 -> W.empty
                 _ -> sep ':' <> do
                        (if s < 10 then W.char '0' else W.empty) <> do
-                       W.strict_text $ Text.pack $ showFixed True s))
+                       W.strict_text $ Text.pack $ show $ (truncate s::Integer)))
        -- (case tz_min of
        --  0 -> W.empty
        --  _ | tz_name /= "" -> W.space <> do W.strict_text $ Text.pack tz_name
index ab3a86fa40b00fe747b145ca87d7d14999ba932d..8f7604f5aca21566e48ccb51b30dd0262087a649 100644 (file)
@@ -395,7 +395,7 @@ filter_date = do
                                        , d2 )
                        (hour, minute, second) <-
                                R.option (Interval.unlimited, Interval.unlimited, Interval.unlimited) $ R.try $ do
-                                       R.skipMany1 $ R.space_horizontal
+                                       _ <- R.char '_'
                                        hour   <- read_interval Error_Filter_Date_Interval read2
                                        sep    <- Date.Read.hour_separator
                                        minute <- read_interval Error_Filter_Date_Interval read2
@@ -403,7 +403,7 @@ filter_date = do
                                                _    <- R.char sep
                                                read_interval Error_Filter_Date_Interval $ of_digits <$> R.many1 R.digit
                                        -- tz <- R.option Time.utc $ R.try $ do
-                                       --      R.skipMany $ R.space_horizontal
+                                       --      -- R.skipMany $ R.space_horizontal
                                        --      Date.Read.time_zone
                                        return
                                         ( hour
index 11fe86c49886e73f58cab85ee11d12b7db08f2c1..30a01737856ff1a08d2f0d330cec4063cf895b4e 100644 (file)
@@ -169,12 +169,12 @@ posting :: Account -> Posting
 posting acct =
        Posting
         { posting_account = acct
-        , posting_amounts = Data.Map.empty
-        , posting_comments = []
-        , posting_dates = []
+        , posting_amounts = mempty
+        , posting_comments = mempty
+        , posting_dates = mempty
         , posting_status = False
         , posting_sourcepos = initialPos ""
-        , posting_tags = Data.Map.empty
+        , posting_tags = mempty
         }
 
 instance
@@ -217,25 +217,25 @@ posting_by_Amount_and_Account :: Posting_by_Account -> Posting_by_Amount_and_Acc
 posting_by_Amount_and_Account =
        Data.Map.foldlWithKey
         (flip (\acct ->
-               Data.List.foldl
+               Data.List.foldl'
                 (flip (\p ->
                        Data.Map.insertWith
                         (Data.Map.unionWith (++))
                         (posting_amounts p)
                         (Data.Map.singleton acct [p])))))
-        Data.Map.empty
+        mempty
 
 posting_by_Signs_and_Account :: Posting_by_Account -> Posting_by_Signs_and_Account
 posting_by_Signs_and_Account =
        Data.Map.foldlWithKey
         (flip (\acct ->
-               Data.List.foldl
+               Data.List.foldl'
                 (flip (\p ->
                        Data.Map.insertWith
                         (Data.Map.unionWith (++))
                         (Amount.signs $ posting_amounts p)
                         (Data.Map.singleton acct [p])))))
-        Data.Map.empty
+        mempty
 
 -- * The 'Tag' type
 
index 268e8fd30a5b71165cab13097500817d0832fa90..ad9a9571d2cba0c86cdc1612822c2127ccebc191 100644 (file)
@@ -34,6 +34,7 @@ import qualified Text.Parsec as R hiding
                   , space
                   , spaces
                   , string
+                  , tab
                   )
 import           Text.Parsec (Stream, ParsecT, (<|>), (<?>))
 import qualified Text.Parsec.Pos as R
@@ -126,7 +127,7 @@ account_name = do
                        case c of
                         _ | c == comment_begin -> R.parserZero
                         _ | c == account_name_sep -> R.parserZero
-                        _ | R.is_space_horizontal c -> do
+                        _ | c /= '\t' && R.is_space_horizontal c -> do
                                _ <- R.notFollowedBy $ R.space_horizontal
                                return c <* (R.lookAhead $ R.try $
                                 ( R.try (R.char account_name_sep)
@@ -270,7 +271,7 @@ posting = (do
        amounts_ <-
                R.choice_try
                 [ do
-                       _ <- R.count 2 R.space_horizontal
+                       (void R.tab <|> void (R.count 2 R.space_horizontal))
                        R.skipMany $ R.space_horizontal
                        maybe id (\(u, s) ->
                                if u == Unit.nil then id
index 35f20d61eb783a8618161581fc0eb646e1c8a577..b1ff19ae42b356e5e81ef7a691328b6bc3b6ecd5 100644 (file)
@@ -210,7 +210,7 @@ transactions ts = do
                Data.Foldable.foldr transaction_lengths 0 ts
        Data.Foldable.foldr
         (\t doc ->
-               transaction_with_lengths transaction_lengths_ t <> W.line <>
+               transaction_with_lengths transaction_lengths_ t <>
                (if W.is_empty doc then W.empty else W.line <> doc)
         )
         W.empty
@@ -249,17 +249,19 @@ transaction_with_lengths
        (case transaction_comments_after of
         [] -> W.empty
         _  -> comments W.space transaction_comments_after <> W.line) <> do
-       W.vsep $ Data.List.map
-        (\(type_, ps) ->
-               W.intercalate W.line
-                (W.intercalate W.line
-                        (W.vsep . Data.List.map
-                                (posting posting_lengths_ type_)))
-                (Ledger.posting_by_Signs_and_Account ps))
-        [ (Posting_Type_Regular, transaction_postings)
-        , (Posting_Type_Virtual, transaction_virtual_postings)
-        , (Posting_Type_Virtual_Balanced, transaction_balanced_virtual_postings)
-        ]
+       W.vsep
+        (fmap
+                (\(type_, ps) ->
+                        (W.intercalate W.line
+                                (W.vsep . fmap (posting posting_lengths_ type_))
+                        )
+                        (ps)
+                )
+                [ (Posting_Type_Regular         , transaction_postings)
+                , (Posting_Type_Virtual         , transaction_virtual_postings)
+                , (Posting_Type_Virtual_Balanced, transaction_balanced_virtual_postings)
+                ]
+        ) <> W.line
 
 code :: Ledger.Code -> Doc
 code = \x -> case x of
index 5366cc9b6648d9dd64e87c49fd89e7e23f349ed5..d0d15373a337d389bb5ff0b8b15e25039aadf75d 100644 (file)
@@ -174,8 +174,8 @@ cons
  -> GL transaction
 cons t (GL !gl) =
        GL $
-       Data.Foldable.foldr
-        ((\p ->
+       Data.Foldable.foldl'
+        (flip $ \p ->
                let first_line =
                        GL_Line
                         { gl_line_transaction = t
@@ -207,13 +207,14 @@ cons t (GL !gl) =
                        in
                        Data.Map.union nlt $
                        Data.Map.insert (transaction_date t) neq $
-                       Data.Map.map (fmap (\l -> l{gl_line_sum =
-                               amount_add (gl_line_sum leq) $
-                               gl_line_sum l})) ngt
+                       Data.Map.map
+                        (fmap (\l -> l{gl_line_sum =
+                               amount_add (gl_line_sum leq) $ gl_line_sum l}))
+                        ngt
                 )
                 (posting_account p)
                 single
-        ))
+        )
         gl
         (transaction_postings t)
 
@@ -285,7 +286,7 @@ expanded (GL gl) =
                         ) Nothing $
                        Compose $
                        Data.Map.foldr
-                        (Data.Map.unionWith (><) . inclusive . from_value)
+                        (Data.Map.unionWith (flip (><)) . inclusive . from_value)
                         exclusive nodes
                 })
         gl
index a3f1a054076548905dbb3ccabffc2e8a7d07fe1a..da49cbfb7a627e3a9add16b69be79bad95ccf996 100644 (file)
@@ -23,7 +23,7 @@ instance Foldable Journal where
 instance Transaction t => Monoid (Journal t) where
        mempty = Journal mempty
        mappend (Journal x) (Journal y) =
-               Journal $ Data.Map.unionWith mappend x y
+               Journal $ Data.Map.unionWith (flip mappend) x y
 
 instance Transaction t
  => Consable () (Journal) t where
@@ -39,7 +39,7 @@ instance Consable () [] transaction where
 cons :: Transaction t => t -> Journal t -> Journal t
 cons t (Journal !ts) =
        Journal $
-       Data.Map.insertWith mappend
+       Data.Map.insertWith (flip mappend)
         (transaction_date t) [t] ts
 
 transactions :: Transaction t => Journal t -> Map Date [t]
index f543f7f554a3a7d1d41fcee9e355d92fa270460f..08940639f3d11010256dc73530dd16a866f0722a 100644 (file)
@@ -393,21 +393,25 @@ foldr_path fct =
 -- leading to a non-'Strict.Nothing' 'node_value' in the given 'TreeMap',
 -- with its value mapped by the given function.
 flatten :: Ord k => (x -> y) -> TreeMap k x -> Map (Path k) y
-flatten =
+flatten = flatten_with_Path . const
+
+-- | Like 'flatten' but with also the current 'Path' given to the mapping function.
+flatten_with_Path :: Ord k => (Path k -> x -> y) -> TreeMap k x -> Map (Path k) y
+flatten_with_Path =
        flat_map []
        where
                flat_map :: Ord k
-                => [k] -> (x -> y)
+                => [k] -> (Path k -> x -> y)
                 -> TreeMap k x
                 -> Map (Path k) y
                flat_map p f (TreeMap m) =
                        Data.Map.unions $
                        (
                        Data.Map.mapKeysMonotonic (reverse . flip path p) $
-                       Data.Map.mapMaybe (\Node{node_value} ->
+                       Data.Map.mapMaybeWithKey (\k Node{node_value} ->
                                case node_value of
                                 Strict.Nothing -> Nothing
-                                Strict.Just x  -> Just $ f x) m
+                                Strict.Just x  -> Just $ f (reverse $ path k p) x) m
                        ) :
                        Data.Map.foldrWithKey
                         (\k -> (:) . flat_map (k:p) f . node_descendants)
@@ -439,11 +443,11 @@ filter_with_Path_and_Node f =
 --   mapping its non-'Strict.Nothing' 'node_value's
 --   and keeping only the non-'Strict.Nothing' results.
 map_Maybe :: Ord k => (x -> Strict.Maybe y) -> TreeMap k x -> TreeMap k y
-map_Maybe f = map_Maybe_with_Path (const f)
+map_Maybe = map_Maybe_with_Path . const
 
 -- | Like 'map_Maybe' but with also the current 'Path' given to the predicate.
 map_Maybe_with_Path :: Ord k => (Path k -> x -> Strict.Maybe y) -> TreeMap k x -> TreeMap k y
-map_Maybe_with_Path f = map_Maybe_with_Path_and_Node (const f)
+map_Maybe_with_Path = map_Maybe_with_Path_and_Node . const
 
 -- | Like 'map_Maybe_with_Path' but with also the current 'Node' given to the predicate.
 map_Maybe_with_Path_and_Node :: Ord k => (Node k x -> Path k -> x -> Strict.Maybe y) -> TreeMap k x -> TreeMap k y
index ef520a72544bf8d3e5fb27f7354ae87bf9bca6b9..00672485cee95e27d80fc7b88c360ea4e1bbc3e7 100644 (file)
@@ -1619,11 +1619,11 @@ test_Hcompta =
                                                         (Time.fromGregorian 2000 01 01)
                                                         (Time.TimeOfDay 0 0 0))
                                                 (Time.utc)]
-                                , "2000/01/01 12:34" ~:
+                                , "2000/01/01_12:34" ~:
                                         (Data.Either.rights $
                                                [P.runParser_with_Error
                                                 (Date.Read.date id Nothing <* P.eof)
-                                                () "" ("2000/01/01 12:34"::Text)])
+                                                () "" ("2000/01/01_12:34"::Text)])
                                         ~?=
                                         [ Time.zonedTimeToUTC $
                                                Time.ZonedTime
@@ -1631,11 +1631,11 @@ test_Hcompta =
                                                         (Time.fromGregorian 2000 01 01)
                                                         (Time.TimeOfDay 12 34 0))
                                                 (Time.utc)]
-                                , "2000/01/01 12:34:56" ~:
+                                , "2000/01/01_12:34:56" ~:
                                         (Data.Either.rights $
                                                [P.runParser_with_Error
                                                 (Date.Read.date id Nothing <* P.eof)
-                                                () "" ("2000/01/01 12:34:56"::Text)])
+                                                () "" ("2000/01/01_12:34:56"::Text)])
                                         ~?=
                                         [ Time.zonedTimeToUTC $
                                                Time.ZonedTime
@@ -1643,11 +1643,11 @@ test_Hcompta =
                                                         (Time.fromGregorian 2000 01 01)
                                                         (Time.TimeOfDay 12 34 56))
                                                 (Time.utc)]
-                                , "2000/01/01 12:34 CET" ~:
+                                , "2000/01/01_12:34CET" ~:
                                         (Data.Either.rights $
                                                [P.runParser_with_Error
                                                 (Date.Read.date id Nothing <* P.eof)
-                                                () "" ("2000/01/01 12:34 CET"::Text)])
+                                                () "" ("2000/01/01_12:34CET"::Text)])
                                         ~?=
                                         [ Time.zonedTimeToUTC $
                                                Time.ZonedTime
@@ -1655,11 +1655,11 @@ test_Hcompta =
                                                         (Time.fromGregorian 2000 01 01)
                                                         (Time.TimeOfDay 12 34 0))
                                                 (Time.TimeZone 60 True "CET")]
-                                , "2000/01/01 12:34 +0130" ~:
+                                , "2000/01/01_12:34+0130" ~:
                                         (Data.Either.rights $
                                                [P.runParser_with_Error
                                                 (Date.Read.date id Nothing <* P.eof)
-                                                () "" ("2000/01/01 12:34 +0130"::Text)])
+                                                () "" ("2000/01/01_12:34+0130"::Text)])
                                         ~?=
                                         [ Time.zonedTimeToUTC $
                                                Time.ZonedTime
@@ -1667,11 +1667,11 @@ test_Hcompta =
                                                         (Time.fromGregorian 2000 01 01)
                                                         (Time.TimeOfDay 12 34 0))
                                                 (Time.TimeZone 90 False "+0130")]
-                                , "2000/01/01 12:34:56 CET" ~:
+                                , "2000/01/01_12:34:56CET" ~:
                                         (Data.Either.rights $
                                                [P.runParser_with_Error
                                                 (Date.Read.date id Nothing <* P.eof)
-                                                () "" ("2000/01/01 12:34:56 CET"::Text)])
+                                                () "" ("2000/01/01_12:34:56CET"::Text)])
                                         ~?=
                                         [ Time.zonedTimeToUTC $
                                                Time.ZonedTime
@@ -1712,7 +1712,7 @@ test_Hcompta =
                                        Date.nil)
                                        ~?=
                                        "1970/01/01")
-                                , "2000/01/01 12:34:51 CET" ~:
+                                , "2000/01/01_12:34:51CET" ~:
                                        (Format.Ledger.Write.show
                                        Format.Ledger.Write.Style
                                         { Format.Ledger.Write.style_color=False
@@ -1726,8 +1726,8 @@ test_Hcompta =
                                                 (Time.TimeOfDay 12 34 51))
                                         (Time.TimeZone 60 False "CET"))
                                        ~?=
-                                       "2000/01/01 11:34:51"
-                                , "2000/01/01 12:34:51 +0100" ~:
+                                       "2000/01/01_11:34:51"
+                                , "2000/01/01_12:34:51+0100" ~:
                                        (Format.Ledger.Write.show
                                        Format.Ledger.Write.Style
                                         { Format.Ledger.Write.style_color=False
@@ -1741,8 +1741,8 @@ test_Hcompta =
                                                 (Time.TimeOfDay 12 34 51))
                                         (Time.TimeZone 60 False ""))
                                        ~?=
-                                       "2000/01/01 11:34:51"
-                                , "2000/01/01 01:02:03" ~:
+                                       "2000/01/01_11:34:51"
+                                , "2000/01/01_01:02:03" ~:
                                        (Format.Ledger.Write.show
                                        Format.Ledger.Write.Style
                                         { Format.Ledger.Write.style_color=False
@@ -1756,8 +1756,8 @@ test_Hcompta =
                                                 (Time.TimeOfDay 1 2 3))
                                         (Time.utc))
                                        ~?=
-                                       "2000/01/01 01:02:03"
-                                , "01/01 01:02" ~:
+                                       "2000/01/01_01:02:03"
+                                , "01/01_01:02" ~:
                                        (Format.Ledger.Write.show
                                        Format.Ledger.Write.Style
                                         { Format.Ledger.Write.style_color=False
@@ -1771,8 +1771,8 @@ test_Hcompta =
                                                 (Time.TimeOfDay 1 2 0))
                                         (Time.utc))
                                        ~?=
-                                       "01/01 01:02"
-                                , "01/01 01:00" ~:
+                                       "01/01_01:02"
+                                , "01/01_01:00" ~:
                                        (Format.Ledger.Write.show
                                        Format.Ledger.Write.Style
                                         { Format.Ledger.Write.style_color=False
@@ -1786,8 +1786,8 @@ test_Hcompta =
                                                 (Time.TimeOfDay 1 0 0))
                                         (Time.utc))
                                        ~?=
-                                       "01/01 01:00"
-                                , "01/01 00:01" ~:
+                                       "01/01_01:00"
+                                , "01/01_00:01" ~:
                                        (Format.Ledger.Write.show
                                        Format.Ledger.Write.Style
                                         { Format.Ledger.Write.style_color=False
@@ -1801,7 +1801,7 @@ test_Hcompta =
                                                 (Time.TimeOfDay 0 1 0))
                                         (Time.utc))
                                        ~?=
-                                       "01/01 00:01"
+                                       "01/01_00:01"
                                 , "01/01" ~:
                                        (Format.Ledger.Write.show
                                        Format.Ledger.Write.Style
@@ -3312,6 +3312,13 @@ test_Hcompta =
                                                         () "" ("A "::Text)])
                                                 ~?=
                                                 []
+                                        , "\"A\t\"" ~:
+                                                (Data.Either.rights $
+                                                       [P.runParser
+                                                        (Format.Ledger.Read.account_name <* P.eof)
+                                                        () "" ("A\t"::Text)])
+                                                ~?=
+                                                []
                                         , "\"A \\n\"" ~:
                                                 (Data.Either.rights $
                                                        [P.runParser
@@ -4467,8 +4474,8 @@ test_Hcompta =
                                                Format.Ledger.Write.transaction
                                                Format.Ledger.transaction)
                                                ~?=
-                                               "1970/01/01\n")
-                                        , "2000/01/01 some description\\n\\ta:b:c\\n\\t ; first comment\\n\\t ; second comment\\n\\t ; third comment\\n\\tA:B:C  $1" ~:
+                                               "1970/01/01\n\n")
+                                        , "2000/01/01 some description\\n\\tA:B:C  $1\\n\\ta:b:c\\n\\t ; first comment\\n\\t ; second comment\\n\\t ; third comment\\n" ~:
                                                ((Format.Ledger.Write.show
                                                Format.Ledger.Write.Style
                                                 { Format.Ledger.Write.style_color=False
@@ -4504,7 +4511,7 @@ test_Hcompta =
                                                         ]
                                                 })
                                                ~?=
-                                               "2000/01/01 some description\n\ta:b:c\n\t ; first comment\n\t ; second comment\n\t ; third comment\n\tA:B:C  $1")
+                                               "2000/01/01 some description\n\tA:B:C  $1\n\ta:b:c\n\t ; first comment\n\t ; second comment\n\t ; third comment\n")
                                         , "2000/01/01 some description\\n\\tA:B:C       $1\\n\\tAA:BB:CC  $123" ~:
                                                ((Format.Ledger.Write.show
                                                Format.Ledger.Write.Style
@@ -4550,7 +4557,7 @@ test_Hcompta =
                                                         ]
                                                 })
                                                ~?=
-                                               "2000/01/01 some description\n\tA:B:C       $1\n\tAA:BB:CC  $123")
+                                               "2000/01/01 some description\n\tA:B:C       $1\n\tAA:BB:CC  $123\n")
                                         ]
                                 ]
                         ]