Compare commits
No commits in common. "281d67bfc95044d05c8e60aaabb553b98235a143" and "dae132c8b91b8f2550152edc3575a1d449269439" have entirely different histories.
281d67bfc9
...
dae132c8b9
|
@ -60,15 +60,15 @@ SplitR sql=splits
|
||||||
value Rational
|
value Rational
|
||||||
deriving Show Eq
|
deriving Show Eq
|
||||||
BudgetLabelR sql=budget_labels
|
BudgetLabelR sql=budget_labels
|
||||||
split SplitRId OnDeleteCascade
|
split SplitRId
|
||||||
budgetName T.Text
|
budgetName T.Text
|
||||||
deriving Show Eq
|
deriving Show Eq
|
||||||
ExpenseBucketR sql=expense_buckets
|
ExpenseBucketR sql=expense_buckets
|
||||||
budgetLabel BudgetLabelRId OnDeleteCascade
|
budgetLabel BudgetLabelRId
|
||||||
bucket ExpenseBucket
|
bucket ExpenseBucket
|
||||||
deriving Show Eq
|
deriving Show Eq
|
||||||
IncomeBucketR sql=income_buckets
|
IncomeBucketR sql=income_buckets
|
||||||
budgetLabel BudgetLabelRId OnDeleteCascade
|
budgetLabel BudgetLabelRId
|
||||||
bucket IncomeBucket
|
bucket IncomeBucket
|
||||||
deriving Show Eq
|
deriving Show Eq
|
||||||
|]
|
|]
|
||||||
|
|
|
@ -26,21 +26,19 @@ import qualified RIO.Vector as V
|
||||||
|
|
||||||
readImport :: MonadUnliftIO m => Import -> MappingT m (EitherErrs [BalTx])
|
readImport :: MonadUnliftIO m => Import -> MappingT m (EitherErrs [BalTx])
|
||||||
readImport Import {..} = do
|
readImport Import {..} = do
|
||||||
let ores = plural $ compileOptions impTxOpts
|
|
||||||
let cres = concatEithersL $ compileMatch <$> impMatches
|
let cres = concatEithersL $ compileMatch <$> impMatches
|
||||||
case concatEithers2 ores cres (,) of
|
ires <- mapM (readImport_ impSkipLines impDelim impTxOpts) impPaths
|
||||||
Right (compiledOptions, compiledMatches) -> do
|
let res = concatEithers2 cres (concatEitherL ires) (,)
|
||||||
ires <- mapM (readImport_ impSkipLines impDelim compiledOptions) impPaths
|
case res of
|
||||||
case concatEitherL ires of
|
|
||||||
Right records -> return $ matchRecords compiledMatches $ L.sort $ concat records
|
|
||||||
Left es -> return $ Left es
|
|
||||||
Left es -> return $ Left es
|
Left es -> return $ Left es
|
||||||
|
Right (compiled, records) ->
|
||||||
|
return $ matchRecords compiled $ L.sort $ concat records
|
||||||
|
|
||||||
readImport_
|
readImport_
|
||||||
:: MonadUnliftIO m
|
:: MonadUnliftIO m
|
||||||
=> Natural
|
=> Natural
|
||||||
-> Word
|
-> Word
|
||||||
-> TxOptsRe
|
-> TxOpts
|
||||||
-> FilePath
|
-> FilePath
|
||||||
-> MappingT m (EitherErr [TxRecord])
|
-> MappingT m (EitherErr [TxRecord])
|
||||||
readImport_ n delim tns p = do
|
readImport_ n delim tns p = do
|
||||||
|
@ -55,7 +53,7 @@ readImport_ n delim tns p = do
|
||||||
|
|
||||||
-- TODO handle this better, this maybe thing is a hack to skip lines with
|
-- TODO handle this better, this maybe thing is a hack to skip lines with
|
||||||
-- blank dates but will likely want to make this more flexible
|
-- blank dates but will likely want to make this more flexible
|
||||||
parseTxRecord :: FilePath -> TxOptsRe -> NamedRecord -> Parser (Maybe TxRecord)
|
parseTxRecord :: FilePath -> TxOpts -> NamedRecord -> Parser (Maybe TxRecord)
|
||||||
parseTxRecord p TxOpts {..} r = do
|
parseTxRecord p TxOpts {..} r = do
|
||||||
d <- r .: T.encodeUtf8 toDate
|
d <- r .: T.encodeUtf8 toDate
|
||||||
if d == ""
|
if d == ""
|
||||||
|
|
|
@ -54,6 +54,7 @@ makeHaskellTypesWith
|
||||||
, SingleConstructor "ModPat" "ModPat" "(./dhall/Types.dhall).ModPat.Type"
|
, SingleConstructor "ModPat" "ModPat" "(./dhall/Types.dhall).ModPat.Type"
|
||||||
, SingleConstructor "CronPat" "CronPat" "(./dhall/Types.dhall).CronPat.Type"
|
, SingleConstructor "CronPat" "CronPat" "(./dhall/Types.dhall).CronPat.Type"
|
||||||
, SingleConstructor "Decimal" "D" "(./dhall/Types.dhall).Decimal"
|
, SingleConstructor "Decimal" "D" "(./dhall/Types.dhall).Decimal"
|
||||||
|
, SingleConstructor "TxOpts" "TxOpts" "(./dhall/Types.dhall).TxOpts.Type"
|
||||||
, SingleConstructor "MatchVal" "MatchVal" "(./dhall/Types.dhall).MatchVal.Type"
|
, SingleConstructor "MatchVal" "MatchVal" "(./dhall/Types.dhall).MatchVal.Type"
|
||||||
, SingleConstructor "Manual" "Manual" "(./dhall/Types.dhall).Manual"
|
, SingleConstructor "Manual" "Manual" "(./dhall/Types.dhall).Manual"
|
||||||
, SingleConstructor "Tax" "Tax" "(./dhall/Types.dhall).Tax"
|
, SingleConstructor "Tax" "Tax" "(./dhall/Types.dhall).Tax"
|
||||||
|
@ -340,21 +341,11 @@ type ExpTx = Tx ExpSplit
|
||||||
|
|
||||||
instance FromDhall ExpTx
|
instance FromDhall ExpTx
|
||||||
|
|
||||||
data TxOpts re = TxOpts
|
|
||||||
{ toDate :: !T.Text
|
|
||||||
, toAmount :: !T.Text
|
|
||||||
, toDesc :: !T.Text
|
|
||||||
, toOther :: ![T.Text]
|
|
||||||
, toDateFmt :: !T.Text
|
|
||||||
, toAmountFmt :: !re
|
|
||||||
}
|
|
||||||
deriving (Eq, Generic, Hashable, Show, FromDhall)
|
|
||||||
|
|
||||||
data Import = Import
|
data Import = Import
|
||||||
{ impPaths :: ![FilePath]
|
{ impPaths :: ![FilePath]
|
||||||
, impMatches :: ![Match T.Text]
|
, impMatches :: ![Match T.Text]
|
||||||
, impDelim :: !Word
|
, impDelim :: !Word
|
||||||
, impTxOpts :: !(TxOpts T.Text)
|
, impTxOpts :: !TxOpts
|
||||||
, impSkipLines :: !Natural
|
, impSkipLines :: !Natural
|
||||||
}
|
}
|
||||||
deriving (Eq, Hashable, Generic, FromDhall)
|
deriving (Eq, Hashable, Generic, FromDhall)
|
||||||
|
@ -457,6 +448,12 @@ data Match re = Match
|
||||||
|
|
||||||
deriving instance Show (Match T.Text)
|
deriving instance Show (Match T.Text)
|
||||||
|
|
||||||
|
deriving instance Eq TxOpts
|
||||||
|
|
||||||
|
deriving instance Hashable TxOpts
|
||||||
|
|
||||||
|
deriving instance Show TxOpts
|
||||||
|
|
||||||
--------------------------------------------------------------------------------
|
--------------------------------------------------------------------------------
|
||||||
-- Specialized dhall types
|
-- Specialized dhall types
|
||||||
|
|
||||||
|
@ -612,8 +609,6 @@ data XGregorian = XGregorian
|
||||||
|
|
||||||
type MatchRe = Match (T.Text, Regex)
|
type MatchRe = Match (T.Text, Regex)
|
||||||
|
|
||||||
type TxOptsRe = TxOpts (T.Text, Regex)
|
|
||||||
|
|
||||||
type MatchOtherRe = MatchOther (T.Text, Regex)
|
type MatchOtherRe = MatchOther (T.Text, Regex)
|
||||||
|
|
||||||
instance Show (Match (T.Text, Regex)) where
|
instance Show (Match (T.Text, Regex)) where
|
||||||
|
|
|
@ -34,7 +34,6 @@ module Internal.Utils
|
||||||
, xGregToDay
|
, xGregToDay
|
||||||
, plural
|
, plural
|
||||||
, compileMatch
|
, compileMatch
|
||||||
, compileOptions
|
|
||||||
)
|
)
|
||||||
where
|
where
|
||||||
|
|
||||||
|
@ -242,8 +241,8 @@ lookupErr what k m = case M.lookup k m of
|
||||||
Just x -> Right x
|
Just x -> Right x
|
||||||
_ -> Left $ LookupError what $ showT k
|
_ -> Left $ LookupError what $ showT k
|
||||||
|
|
||||||
parseRational :: MonadFail m => (T.Text, Regex) -> T.Text -> m Rational
|
parseRational :: MonadFail m => T.Text -> T.Text -> m Rational
|
||||||
parseRational (pat, re) s = case matchGroupsMaybe s re of
|
parseRational pat s = case ms of
|
||||||
[sign, x, ""] -> uncurry (*) <$> readWhole sign x
|
[sign, x, ""] -> uncurry (*) <$> readWhole sign x
|
||||||
[sign, x, y] -> do
|
[sign, x, y] -> do
|
||||||
d <- readT "decimal" y
|
d <- readT "decimal" y
|
||||||
|
@ -252,6 +251,7 @@ parseRational (pat, re) s = case matchGroupsMaybe s re of
|
||||||
return $ k * (w + d % p)
|
return $ k * (w + d % p)
|
||||||
_ -> msg "malformed decimal"
|
_ -> msg "malformed decimal"
|
||||||
where
|
where
|
||||||
|
(_, _, _, ms) = (s =~ pat) :: (T.Text, T.Text, T.Text, [T.Text])
|
||||||
readT what t = case readMaybe $ T.unpack t of
|
readT what t = case readMaybe $ T.unpack t of
|
||||||
Just d -> return $ fromInteger d
|
Just d -> return $ fromInteger d
|
||||||
_ -> msg $ T.unwords ["could not parse", what, t]
|
_ -> msg $ T.unwords ["could not parse", what, t]
|
||||||
|
@ -568,38 +568,24 @@ uncurry3 f (a, b, c) = f a b c
|
||||||
-- -- these options barely do anything in terms of performance
|
-- -- these options barely do anything in terms of performance
|
||||||
-- compres = compile (blankCompOpt {newSyntax = True}) (blankExecOpt {captureGroups = False}) pat
|
-- compres = compile (blankCompOpt {newSyntax = True}) (blankExecOpt {captureGroups = False}) pat
|
||||||
|
|
||||||
compileOptions :: TxOpts T.Text -> EitherErr TxOptsRe
|
|
||||||
compileOptions o@TxOpts {toAmountFmt = pat} = do
|
|
||||||
re <- compileRegex True pat
|
|
||||||
return $ o {toAmountFmt = re}
|
|
||||||
|
|
||||||
compileMatch :: Match T.Text -> EitherErrs MatchRe
|
compileMatch :: Match T.Text -> EitherErrs MatchRe
|
||||||
compileMatch m@Match {mDesc = d, mOther = os} = do
|
compileMatch m@Match {mDesc = d, mOther = os} = do
|
||||||
let dres = plural $ mapM go d
|
let dres = plural $ mapM compileRegex d
|
||||||
let ores = concatEitherL $ fmap (mapM go) os
|
let ores = concatEitherL $ fmap (mapM compileRegex) os
|
||||||
concatEithers2 dres ores $ \d_ os_ -> m {mDesc = d_, mOther = os_}
|
concatEithers2 dres ores $ \d_ os_ -> m {mDesc = d_, mOther = os_}
|
||||||
where
|
|
||||||
go = compileRegex False
|
|
||||||
|
|
||||||
compileRegex :: Bool -> T.Text -> EitherErr (Text, Regex)
|
compileRegex :: T.Text -> EitherErr (Text, Regex)
|
||||||
compileRegex groups pat = case res of
|
compileRegex pat = case res of
|
||||||
Right re -> Right (pat, re)
|
Right re -> Right (pat, re)
|
||||||
Left _ -> Left $ RegexError pat
|
Left _ -> Left $ RegexError pat
|
||||||
where
|
where
|
||||||
res =
|
res =
|
||||||
compile
|
compile
|
||||||
(blankCompOpt {newSyntax = True})
|
(blankCompOpt {newSyntax = True})
|
||||||
(blankExecOpt {captureGroups = groups})
|
(blankExecOpt {captureGroups = False})
|
||||||
pat
|
pat
|
||||||
|
|
||||||
matchMaybe :: T.Text -> Regex -> EitherErr Bool
|
matchMaybe :: T.Text -> Regex -> EitherErr Bool
|
||||||
matchMaybe q re = case execute re q of
|
matchMaybe q re = case execute re q of
|
||||||
Right res -> Right $ isJust res
|
Right res -> Right $ isJust res
|
||||||
Left _ -> Left $ RegexError "this should not happen"
|
Left _ -> Left $ RegexError "this should not happen"
|
||||||
|
|
||||||
matchGroupsMaybe :: T.Text -> Regex -> [T.Text]
|
|
||||||
matchGroupsMaybe q re = case regexec re q of
|
|
||||||
Right Nothing -> []
|
|
||||||
Right (Just (_, _, _, xs)) -> xs
|
|
||||||
-- this should never fail as regexec always returns Right
|
|
||||||
Left _ -> []
|
|
||||||
|
|
Loading…
Reference in New Issue