module Hix.Data.OutputFormat where data OutputFormat = OutputNone | OutputJson | OutputCommitMsg | OutputGaPr deriving stock (OutputFormat -> OutputFormat -> Bool (OutputFormat -> OutputFormat -> Bool) -> (OutputFormat -> OutputFormat -> Bool) -> Eq OutputFormat forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a $c== :: OutputFormat -> OutputFormat -> Bool == :: OutputFormat -> OutputFormat -> Bool $c/= :: OutputFormat -> OutputFormat -> Bool /= :: OutputFormat -> OutputFormat -> Bool Eq, Int -> OutputFormat -> ShowS [OutputFormat] -> ShowS OutputFormat -> String (Int -> OutputFormat -> ShowS) -> (OutputFormat -> String) -> ([OutputFormat] -> ShowS) -> Show OutputFormat forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a $cshowsPrec :: Int -> OutputFormat -> ShowS showsPrec :: Int -> OutputFormat -> ShowS $cshow :: OutputFormat -> String show :: OutputFormat -> String $cshowList :: [OutputFormat] -> ShowS showList :: [OutputFormat] -> ShowS Show, (forall x. OutputFormat -> Rep OutputFormat x) -> (forall x. Rep OutputFormat x -> OutputFormat) -> Generic OutputFormat forall x. Rep OutputFormat x -> OutputFormat forall x. OutputFormat -> Rep OutputFormat x forall a. (forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a $cfrom :: forall x. OutputFormat -> Rep OutputFormat x from :: forall x. OutputFormat -> Rep OutputFormat x $cto :: forall x. Rep OutputFormat x -> OutputFormat to :: forall x. Rep OutputFormat x -> OutputFormat Generic)