module Hledger.MakeItSo.Import.Types
where

import Turtle
import Prelude hiding (FilePath, putStrLn)
import Hledger.MakeItSo.Types

data ImportOptions = ImportOptions { baseDir :: FilePath, verbose :: Bool }
  deriving (Show)

instance HasVerbosity ImportOptions where
  verbose (ImportOptions _ v) = v

instance HasBaseDir ImportOptions where
  baseDir (ImportOptions bd _) = bd

data ImportDirs = ImportDirs { importDir  :: FilePath
                             , ownerDir   :: FilePath
                             , bankDir    :: FilePath
                             , accountDir :: FilePath
                             , stateDir   :: FilePath
                             , yearDir    :: FilePath
                             } deriving (Show)