module Hix.Managed.Data.ProjectResult where import Hix.Managed.Data.EnvResult (EnvResult) import Hix.Managed.Data.ProjectState (ProjectState) data ProjectResult = ProjectResult { ProjectResult -> NonEmpty EnvResult envs :: NonEmpty EnvResult, ProjectResult -> ProjectState state :: ProjectState } deriving stock (ProjectResult -> ProjectResult -> Bool (ProjectResult -> ProjectResult -> Bool) -> (ProjectResult -> ProjectResult -> Bool) -> Eq ProjectResult forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a $c== :: ProjectResult -> ProjectResult -> Bool == :: ProjectResult -> ProjectResult -> Bool $c/= :: ProjectResult -> ProjectResult -> Bool /= :: ProjectResult -> ProjectResult -> Bool Eq, Int -> ProjectResult -> ShowS [ProjectResult] -> ShowS ProjectResult -> String (Int -> ProjectResult -> ShowS) -> (ProjectResult -> String) -> ([ProjectResult] -> ShowS) -> Show ProjectResult forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a $cshowsPrec :: Int -> ProjectResult -> ShowS showsPrec :: Int -> ProjectResult -> ShowS $cshow :: ProjectResult -> String show :: ProjectResult -> String $cshowList :: [ProjectResult] -> ShowS showList :: [ProjectResult] -> ShowS Show, (forall x. ProjectResult -> Rep ProjectResult x) -> (forall x. Rep ProjectResult x -> ProjectResult) -> Generic ProjectResult forall x. Rep ProjectResult x -> ProjectResult forall x. ProjectResult -> Rep ProjectResult x forall a. (forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a $cfrom :: forall x. ProjectResult -> Rep ProjectResult x from :: forall x. ProjectResult -> Rep ProjectResult x $cto :: forall x. Rep ProjectResult x -> ProjectResult to :: forall x. Rep ProjectResult x -> ProjectResult Generic)