witness-0.6.1: values that witness types
Safe HaskellSafe-Inferred
LanguageHaskell2010

Data.Type.Witness.Specific.Pair

Synopsis

Documentation

data PairType w1 w2 t Source #

a witness for pairs of witnesses

Constructors

MkPairType (w1 t) (w2 t) 

Instances

Instances details
WitnessConstraint c w2 => WitnessConstraint (c :: k -> Constraint) (PairType w1 w2 :: k -> Type) Source #

right-biased

Instance details

Defined in Data.Type.Witness.Specific.Pair

Methods

witnessConstraint :: forall (t :: k0). PairType w1 w2 t -> Dict (c t) Source #

TestEquality w1 => TestEquality (PairType w1 w2 :: k -> Type) Source #

left-biased

Instance details

Defined in Data.Type.Witness.Specific.Pair

Methods

testEquality :: forall (a :: k0) (b :: k0). PairType w1 w2 a -> PairType w1 w2 b -> Maybe (a :~: b) #

TestOrder w1 => TestOrder (PairType w1 w2 :: k -> Type) Source #

left-biased

Instance details

Defined in Data.Type.Witness.Specific.Pair

Methods

testCompare :: forall (a :: k0) (b :: k0). PairType w1 w2 a -> PairType w1 w2 b -> WOrdering a b Source #

(Representative w1, Representative w2) => Representative (PairType w1 w2 :: k -> Type) Source # 
Instance details

Defined in Data.Type.Witness.Specific.Pair

(Is w1 t, Is w2 t) => Is (PairType w1 w2 :: k -> Type) (t :: k) Source # 
Instance details

Defined in Data.Type.Witness.Specific.Pair

Methods

representative :: PairType w1 w2 t Source #