module Proteome.Data.FileScanItem where import Path (Abs, Dir, File, Path) data FileScanItem = FileScanItem { FileScanItem -> Path Abs Dir _base :: Path Abs Dir, FileScanItem -> Maybe Text _baseIndicator :: Maybe Text, FileScanItem -> Path Abs File _path :: Path Abs File } deriving stock (FileScanItem -> FileScanItem -> Bool (FileScanItem -> FileScanItem -> Bool) -> (FileScanItem -> FileScanItem -> Bool) -> Eq FileScanItem forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a /= :: FileScanItem -> FileScanItem -> Bool $c/= :: FileScanItem -> FileScanItem -> Bool == :: FileScanItem -> FileScanItem -> Bool $c== :: FileScanItem -> FileScanItem -> Bool Eq, Int -> FileScanItem -> ShowS [FileScanItem] -> ShowS FileScanItem -> String (Int -> FileScanItem -> ShowS) -> (FileScanItem -> String) -> ([FileScanItem] -> ShowS) -> Show FileScanItem forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [FileScanItem] -> ShowS $cshowList :: [FileScanItem] -> ShowS show :: FileScanItem -> String $cshow :: FileScanItem -> String showsPrec :: Int -> FileScanItem -> ShowS $cshowsPrec :: Int -> FileScanItem -> ShowS Show)