module Proteome.Data.FilesConfig where

import Text.Regex.PCRE.Light (Regex)

data FilesConfig =
  FilesConfig {
    FilesConfig -> Bool
useRg :: Bool,
    FilesConfig -> Bool
ignoreHidden :: Bool,
    FilesConfig -> [Regex]
ignoreFiles :: [Regex],
    FilesConfig -> [Regex]
ignoreDirs :: [Regex],
    FilesConfig -> [Text]
wildignore :: [Text]
  }
  deriving stock (FilesConfig -> FilesConfig -> Bool
(FilesConfig -> FilesConfig -> Bool)
-> (FilesConfig -> FilesConfig -> Bool) -> Eq FilesConfig
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: FilesConfig -> FilesConfig -> Bool
$c/= :: FilesConfig -> FilesConfig -> Bool
== :: FilesConfig -> FilesConfig -> Bool
$c== :: FilesConfig -> FilesConfig -> Bool
Eq, Int -> FilesConfig -> ShowS
[FilesConfig] -> ShowS
FilesConfig -> String
(Int -> FilesConfig -> ShowS)
-> (FilesConfig -> String)
-> ([FilesConfig] -> ShowS)
-> Show FilesConfig
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [FilesConfig] -> ShowS
$cshowList :: [FilesConfig] -> ShowS
show :: FilesConfig -> String
$cshow :: FilesConfig -> String
showsPrec :: Int -> FilesConfig -> ShowS
$cshowsPrec :: Int -> FilesConfig -> ShowS
Show, (forall x. FilesConfig -> Rep FilesConfig x)
-> (forall x. Rep FilesConfig x -> FilesConfig)
-> Generic FilesConfig
forall x. Rep FilesConfig x -> FilesConfig
forall x. FilesConfig -> Rep FilesConfig x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep FilesConfig x -> FilesConfig
$cfrom :: forall x. FilesConfig -> Rep FilesConfig x
Generic)