| Representational (Proxy :: k1 -> Type) Source # | |
Instance detailsDefined in Data.Roles |
| Representational (Coercion a :: k1 -> Type) Source # | |
Instance detailsDefined in Data.Roles |
| Representational (Const a :: k1 -> Type) Source # | |
Instance detailsDefined in Data.Roles |
| Representational (Coercion :: k1 -> k1 -> Type) Source # | |
Instance detailsDefined in Data.Roles |
| Representational [] Source # | |
Instance detailsDefined in Data.Roles |
| Representational Maybe Source # | |
Instance detailsDefined in Data.Roles |
| Representational IO Source # | |
Instance detailsDefined in Data.Roles |
| Representational Complex Source # | |
Instance detailsDefined in Data.Roles |
| Representational First Source # | |
Instance detailsDefined in Data.Roles |
| Representational Last Source # | |
Instance detailsDefined in Data.Roles |
| Representational Dual Source # | |
Instance detailsDefined in Data.Roles |
| Representational Endo Source # | |
Instance detailsDefined in Data.Roles |
| Representational Sum Source # | |
Instance detailsDefined in Data.Roles |
| Representational Product Source # | |
Instance detailsDefined in Data.Roles |
| Representational IntMap Source # | |
Instance detailsDefined in Data.Roles |
| Representational (Either a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Roles |
| Representational ((,) a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Roles |
| Representational (ST s :: Type -> Type) Source # | |
Instance detailsDefined in Data.Roles |
| Representational (Map k :: Type -> Type) Source # | |
Instance detailsDefined in Data.Roles |
| Representational ((,,) a b :: Type -> Type) Source # | |
Instance detailsDefined in Data.Roles |
| Representational ((->) a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Roles |
| Representational ((,,,) a b c :: Type -> Type) Source # | |
Instance detailsDefined in Data.Roles |
| Representational ((,,,,) a b c d :: Type -> Type) Source # | |
Instance detailsDefined in Data.Roles |
| Representational ((,,,,,) a b c d e :: Type -> Type) Source # | |
Instance detailsDefined in Data.Roles Methods rep :: forall (a0 :: k1) (b0 :: k1). Coercion a0 b0 -> Coercion (a, b, c, d, e, a0) (a, b, c, d, e, b0) Source # |
| Representational (,,,,,) Source # | |
Instance detailsDefined in Data.Roles Methods rep :: forall (a :: k1) (b :: k1). Coercion a b -> Coercion ((,,,,,) a) ((,,,,,) b) Source # |
| Representational (,,,,) Source # | |
Instance detailsDefined in Data.Roles |
| Representational (,,,) Source # | |
Instance detailsDefined in Data.Roles |
| Representational (,,) Source # | |
Instance detailsDefined in Data.Roles |
| Representational Either Source # | |
Instance detailsDefined in Data.Roles |
| Representational (,) Source # | |
Instance detailsDefined in Data.Roles |
| Representational ((,,,,,) a :: Type -> Type -> Type -> Type -> Type -> Type) Source # | |
Instance detailsDefined in Data.Roles Methods rep :: forall (a0 :: k1) (b :: k1). Coercion a0 b -> Coercion ((,,,,,) a a0) ((,,,,,) a b) Source # |
| Representational ((,,,,) a :: Type -> Type -> Type -> Type -> Type) Source # | |
Instance detailsDefined in Data.Roles |
| Representational ((,,,) a :: Type -> Type -> Type -> Type) Source # | |
Instance detailsDefined in Data.Roles |
| Representational ((,,) a :: Type -> Type -> Type) Source # | |
Instance detailsDefined in Data.Roles |
| Representational (Const :: Type -> k -> Type) Source # | |
Instance detailsDefined in Data.Roles |
| Representational ((,,,,,) a b :: Type -> Type -> Type -> Type -> Type) Source # | |
Instance detailsDefined in Data.Roles Methods rep :: forall (a0 :: k1) (b0 :: k1). Coercion a0 b0 -> Coercion ((,,,,,) a b a0) ((,,,,,) a b b0) Source # |
| Representational ((,,,,) a b :: Type -> Type -> Type -> Type) Source # | |
Instance detailsDefined in Data.Roles |
| Representational ((->) :: Type -> Type -> Type) Source # | |
Instance detailsDefined in Data.Roles |
| Representational ((,,,) a b :: Type -> Type -> Type) Source # | |
Instance detailsDefined in Data.Roles |
| Representational ((,,,,,) a b c :: Type -> Type -> Type -> Type) Source # | |
Instance detailsDefined in Data.Roles Methods rep :: forall (a0 :: k1) (b0 :: k1). Coercion a0 b0 -> Coercion ((,,,,,) a b c a0) ((,,,,,) a b c b0) Source # |
| Representational ((,,,,) a b c :: Type -> Type -> Type) Source # | |
Instance detailsDefined in Data.Roles |
| Representational ((,,,,,) a b c d :: Type -> Type -> Type) Source # | |
Instance detailsDefined in Data.Roles Methods rep :: forall (a0 :: k1) (b0 :: k1). Coercion a0 b0 -> Coercion ((,,,,,) a b c d a0) ((,,,,,) a b c d b0) Source # |