{-# LANGUAGE ViewPatterns #-}
module Summoner.Tree
( TreeFs (..)
, traverseTree
, showTree
) where
import System.Directory (createDirectoryIfMissing, withCurrentDirectory)
import Summoner.Ansi (boldCode, resetCode)
data TreeFs
= Dir FilePath [TreeFs]
| File FilePath Text
traverseTree :: TreeFs -> IO ()
traverseTree (Dir name children) = do
createDirectoryIfMissing False name
withCurrentDirectory name $ for_ children traverseTree
traverseTree (File name content) = writeFileText name content
showTree :: TreeFs -> Text
showTree = unlines . showOne " " "" ""
showOne :: Text -> Text -> Text -> TreeFs -> [Text]
showOne leader tie arm (File fp _) = [leader <> arm <> tie <> toText fp]
showOne leader tie arm (Dir fp (sortWith treeFp -> trees)) =
nodeRep : showChildren trees (leader <> extension)
where
nodeRep :: Text
nodeRep = leader <> arm <> tie <> boldDir (fp <> "/")
where
boldDir str = toText
$ boldCode
<> str
<> resetCode
extension :: Text
extension = case arm of "" -> ""; "└" -> " "; _ -> "│ "
showChildren :: [TreeFs] -> Text -> [Text]
showChildren children leader =
let arms = replicate (length children - 1) "│" <> ["└"]
in concat (zipWith (showOne leader "── ") arms children)
treeFp :: TreeFs -> FilePath
treeFp (Dir fp _) = fp
treeFp (File fp _) = fp