| (IShow f, IShow g) => IShow (f :+: g :: (k1 -> Type) -> k2 -> Type) Source # | |
Instance detailsDefined in Data.Expression.Utils.Indexed.Sum |
| (IFunctor f, IFunctor g, IFunctor h, f :<<: g) => (f :: (k -> Type) -> k -> Type) :<<: (h :+: g :: (k -> Type) -> k -> Type) Source # | |
Instance detailsDefined in Data.Expression.Utils.Indexed.Sum |
| (IFunctor f, IFunctor g) => (f :: (k -> Type) -> k -> Type) :<<: (g :+: f :: (k -> Type) -> k -> Type) Source # | |
Instance detailsDefined in Data.Expression.Utils.Indexed.Sum |
| (IFunctor f, IFunctor g, IFunctor h, f :<: g) => (f :: (k -> Type) -> k -> Type) :<: (h :+: g :: (k -> Type) -> k -> Type) Source # | |
Instance detailsDefined in Data.Expression.Utils.Indexed.Sum |
| (IFunctor f, IFunctor g) => (f :: (k -> Type) -> k -> Type) :<: (f :+: g :: (k -> Type) -> k -> Type) Source # | |
Instance detailsDefined in Data.Expression.Utils.Indexed.Sum |
| (IEq1 f, IEq1 g) => IEq1 (f :+: g :: (i -> Type) -> i -> Type) Source # | |
Instance detailsDefined in Data.Expression.Utils.Indexed.Sum |
| (IFoldable f, IFoldable g) => IFoldable (f :+: g :: (i -> Type) -> i -> Type) Source # | |
Instance detailsDefined in Data.Expression.Utils.Indexed.Sum |
| (IFunctor f, IFunctor g) => IFunctor (f :+: g :: (i -> Type) -> i -> Type) Source # | |
Instance detailsDefined in Data.Expression.Utils.Indexed.Sum |
| (ITraversable f, ITraversable g) => ITraversable (f :+: g :: (i -> Type) -> i -> Type) Source # | |
Instance detailsDefined in Data.Expression.Utils.Indexed.Sum |
| (MaybeQuantified f, MaybeQuantified g) => MaybeQuantified (f :+: g :: (k -> Type) -> k -> Type) Source # | |
Instance detailsDefined in Data.Expression |
| Heyting (ALia BooleanSort) Source # | |
Instance detailsDefined in Data.Expression |
| Heyting (QFALia BooleanSort) Source # | |
Instance detailsDefined in Data.Expression |
| Heyting (Lia BooleanSort) Source # | |
Instance detailsDefined in Data.Expression |
| Heyting (QFLia BooleanSort) Source # | |
Instance detailsDefined in Data.Expression |
| Heyting (QFLogic BooleanSort) Source # | |
Instance detailsDefined in Data.Expression |
| Lattice (ALia BooleanSort) Source # | |
Instance detailsDefined in Data.Expression |
| Lattice (QFALia BooleanSort) Source # | |
Instance detailsDefined in Data.Expression |
| Lattice (Lia BooleanSort) Source # | |
Instance detailsDefined in Data.Expression |
| Lattice (QFLia BooleanSort) Source # | |
Instance detailsDefined in Data.Expression |
| Lattice (QFLogic BooleanSort) Source # | |
Instance detailsDefined in Data.Expression |
| BoundedJoinSemiLattice (ALia BooleanSort) Source # | |
Instance detailsDefined in Data.Expression |
| BoundedJoinSemiLattice (QFALia BooleanSort) Source # | |
Instance detailsDefined in Data.Expression |
| BoundedJoinSemiLattice (Lia BooleanSort) Source # | |
Instance detailsDefined in Data.Expression |
| BoundedJoinSemiLattice (QFLia BooleanSort) Source # | |
Instance detailsDefined in Data.Expression |
| BoundedJoinSemiLattice (QFLogic BooleanSort) Source # | |
Instance detailsDefined in Data.Expression |
| BoundedMeetSemiLattice (ALia BooleanSort) Source # | |
Instance detailsDefined in Data.Expression |
| BoundedMeetSemiLattice (QFALia BooleanSort) Source # | |
Instance detailsDefined in Data.Expression |
| BoundedMeetSemiLattice (Lia BooleanSort) Source # | |
Instance detailsDefined in Data.Expression |
| BoundedMeetSemiLattice (QFLia BooleanSort) Source # | |
Instance detailsDefined in Data.Expression |
| BoundedMeetSemiLattice (QFLogic BooleanSort) Source # | |
Instance detailsDefined in Data.Expression |
| (Parseable f h, Parseable g h) => Parseable (f :+: g :: k1 -> k2 -> Type) h Source # | |
Instance detailsDefined in Data.Expression.Parser |