polysemy-keyed-state-0.1.1: Effect for a set of stateful values indexed by a type of keys
Safe HaskellNone
LanguageHaskell2010

Polysemy.State.Keyed.Law

Documentation

prop_lawfulKeyedState :: forall k r. MakeLaw (KeyedState k) r => (forall a. Eq a => Eq (k a), GEq k, GShow k) => (Has Show k, Has Eq k, Has Arbitrary k, Arbitrary (Some k)) => InterpreterFor (KeyedState k) r -> Property Source #

newtype KeyValuePair k a Source #

Constructors

KeyValuePair (k a, a) 

Instances

Instances details
(Has Show k, GShow k) => GShow (KeyValuePair k :: Type -> Type) Source # 
Instance details

Defined in Polysemy.State.Keyed.Law

Methods

gshowsPrec :: forall (a :: k0). Int -> KeyValuePair k a -> ShowS #

GEq k => GEq (KeyValuePair k :: Type -> Type) Source # 
Instance details

Defined in Polysemy.State.Keyed.Law

Methods

geq :: forall (a :: k0) (b :: k0). KeyValuePair k a -> KeyValuePair k b -> Maybe (a :~: b) #

(Has Arbitrary k, Arbitrary (Some k)) => Arbitrary (Some (KeyValuePair k)) Source # 
Instance details

Defined in Polysemy.State.Keyed.Law

law_consistency :: forall k r. MakeLaw (KeyedState k) r => (forall a. Eq a => Eq (k a), GEq k, GShow k) => (Has Show k, Has Eq k, Has Arbitrary k, Arbitrary (Some k)) => Law (KeyedState k) r Source #