module CabalGild.Unstable.Type.DiscoverTarget where data DiscoverTarget = Files | Modules deriving (DiscoverTarget -> DiscoverTarget -> Bool (DiscoverTarget -> DiscoverTarget -> Bool) -> (DiscoverTarget -> DiscoverTarget -> Bool) -> Eq DiscoverTarget forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a $c== :: DiscoverTarget -> DiscoverTarget -> Bool == :: DiscoverTarget -> DiscoverTarget -> Bool $c/= :: DiscoverTarget -> DiscoverTarget -> Bool /= :: DiscoverTarget -> DiscoverTarget -> Bool Eq, Int -> DiscoverTarget -> ShowS [DiscoverTarget] -> ShowS DiscoverTarget -> String (Int -> DiscoverTarget -> ShowS) -> (DiscoverTarget -> String) -> ([DiscoverTarget] -> ShowS) -> Show DiscoverTarget forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a $cshowsPrec :: Int -> DiscoverTarget -> ShowS showsPrec :: Int -> DiscoverTarget -> ShowS $cshow :: DiscoverTarget -> String show :: DiscoverTarget -> String $cshowList :: [DiscoverTarget] -> ShowS showList :: [DiscoverTarget] -> ShowS Show)