| Safe Haskell | Safe-Inferred | 
|---|---|
| Language | Haskell2010 | 
Data.Type.Witness.General.Order
Documentation
wOrderingToOrdering :: WOrdering a b -> Ordering Source #
class TestEquality w => TestOrder (w :: k -> Type) where Source #
Methods
testCompare :: forall (a :: k) (b :: k). w a -> w b -> WOrdering a b Source #
Instances
| TestOrder NaturalType Source # | |
| Defined in Data.Type.Witness.Specific.Natural Methods testCompare :: forall (a :: k) (b :: k). NaturalType a -> NaturalType b -> WOrdering a b Source # | |
| TestOrder PeanoNatType Source # | |
| Defined in Data.Type.Witness.Specific.PeanoNat Methods testCompare :: forall (a :: k) (b :: k). PeanoNatType a -> PeanoNatType b -> WOrdering a b Source # | |
| TestOrder SymbolType Source # | |
| Defined in Data.Type.Witness.Specific.Symbol Methods testCompare :: forall (a :: k) (b :: k). SymbolType a -> SymbolType b -> WOrdering a b Source # | |
| TestOrder (EmptyType :: k -> Type) Source # | |
| Defined in Data.Type.Witness.Specific.Empty | |
| TestOrder (ListElementType tt :: k -> Type) Source # | |
| Defined in Data.Type.Witness.Specific.List.Element Methods testCompare :: forall (a :: k0) (b :: k0). ListElementType tt a -> ListElementType tt b -> WOrdering a b Source # | |
| TestOrder w1 => TestOrder (PairType w1 w2 :: k -> Type) Source # | left-biased | 
| Defined in Data.Type.Witness.Specific.Pair | |