module Ribosome.App.Data.TemplateTree where

import Path (Dir, File, Path, Rel)

data TemplateTree =
  TDir (Path Rel Dir) [TemplateTree]
  |
  TFile (Path Rel File) Text
  deriving stock (TemplateTree -> TemplateTree -> Bool
(TemplateTree -> TemplateTree -> Bool)
-> (TemplateTree -> TemplateTree -> Bool) -> Eq TemplateTree
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: TemplateTree -> TemplateTree -> Bool
$c/= :: TemplateTree -> TemplateTree -> Bool
== :: TemplateTree -> TemplateTree -> Bool
$c== :: TemplateTree -> TemplateTree -> Bool
Eq, Int -> TemplateTree -> ShowS
[TemplateTree] -> ShowS
TemplateTree -> String
(Int -> TemplateTree -> ShowS)
-> (TemplateTree -> String)
-> ([TemplateTree] -> ShowS)
-> Show TemplateTree
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [TemplateTree] -> ShowS
$cshowList :: [TemplateTree] -> ShowS
show :: TemplateTree -> String
$cshow :: TemplateTree -> String
showsPrec :: Int -> TemplateTree -> ShowS
$cshowsPrec :: Int -> TemplateTree -> ShowS
Show)