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