Copyright | (C) 2018 Ryan Scott |
---|---|
License | BSD-style (see LICENSE) |
Maintainer | Richard Eisenberg (rae@cs.brynmawr.edu) |
Stability | experimental |
Portability | non-portable |
Safe Haskell | None |
Language | Haskell2010 |
Exports the promoted and singled versions of the Identity
data type.
Synopsis
- type family Sing
- data SIdentity z where
- type family RunIdentity a where ...
- sRunIdentity :: forall (a :: Type) (t :: Identity (a :: Type)). Sing t -> Sing (Apply RunIdentitySym0 t :: a)
- data IdentitySym0 a6989586621679304610
- type IdentitySym1 (a6989586621679304610 :: a) = 'Identity a6989586621679304610 :: Identity (a :: Type)
- data RunIdentitySym0 a6989586621679304613
- type RunIdentitySym1 (a6989586621679304613 :: Identity (a :: Type)) = RunIdentity a6989586621679304613 :: a
The Identity
singleton
The singleton kind-indexed type family.
Instances
data SIdentity z where Source #
SIdentity :: forall (a :: Type) (n :: a). (Sing n) -> SIdentity ('Identity n :: Identity (a :: Type)) |
type family RunIdentity a where ... Source #
RunIdentity ('Identity field) = field |
sRunIdentity :: forall (a :: Type) (t :: Identity (a :: Type)). Sing t -> Sing (Apply RunIdentitySym0 t :: a) Source #
Defunctionalization symbols
data IdentitySym0 a6989586621679304610 Source #
Instances
SingI (IdentitySym0 :: TyFun a (Identity a) -> Type) Source # | |
Defined in Data.Singletons.Prelude.Instances sing :: Sing IdentitySym0 Source # | |
SuppressUnusedWarnings (IdentitySym0 :: TyFun a (Identity a) -> Type) Source # | |
Defined in Data.Singletons.Prelude.Instances suppressUnusedWarnings :: () Source # | |
type Apply (IdentitySym0 :: TyFun a (Identity a) -> Type) (a6989586621679304610 :: a) Source # | |
Defined in Data.Singletons.Prelude.Instances type Apply (IdentitySym0 :: TyFun a (Identity a) -> Type) (a6989586621679304610 :: a) = IdentitySym1 a6989586621679304610 |
type IdentitySym1 (a6989586621679304610 :: a) = 'Identity a6989586621679304610 :: Identity (a :: Type) Source #
data RunIdentitySym0 a6989586621679304613 Source #
Instances
SingI (RunIdentitySym0 :: TyFun (Identity a) a -> Type) Source # | |
Defined in Data.Singletons.Prelude.Instances | |
SuppressUnusedWarnings (RunIdentitySym0 :: TyFun (Identity a) a -> Type) Source # | |
Defined in Data.Singletons.Prelude.Instances suppressUnusedWarnings :: () Source # | |
type Apply (RunIdentitySym0 :: TyFun (Identity a) a -> Type) (a6989586621679304613 :: Identity a) Source # | |
Defined in Data.Singletons.Prelude.Instances type Apply (RunIdentitySym0 :: TyFun (Identity a) a -> Type) (a6989586621679304613 :: Identity a) = RunIdentitySym1 a6989586621679304613 |
type RunIdentitySym1 (a6989586621679304613 :: Identity (a :: Type)) = RunIdentity a6989586621679304613 :: a Source #