Safe Haskell | None |
---|---|
Language | Haskell2010 |
Servant.Util.Common.HList
Documentation
data HList (f :: k -> Type) (l :: [k]) where Source #
Servant package defines their own HList
, so we also can (to avoid a large dependency).
Instances
(.*.) :: forall k (f :: k -> Type) (a :: k) (as :: [k]). f a -> HList f as -> HList f (a ': as) infixr 3 Source #
class HListFromTuple a where Source #
Associated Types
type HListTuple a :: Type Source #
Methods
htuple :: HListTuple a -> a Source #
Instances
HListFromTuple (HList f '[a, b, c, d, e, g, h, i]) Source # | |
Defined in Servant.Util.Common.HList Associated Types type HListTuple (HList f '[a, b, c, d, e, g, h, i]) Source # | |
HListFromTuple (HList f '[a, b, c, d, e, g, h]) Source # | |
Defined in Servant.Util.Common.HList Associated Types type HListTuple (HList f '[a, b, c, d, e, g, h]) Source # | |
HListFromTuple (HList f '[a, b, c, d, e, g]) Source # | |
Defined in Servant.Util.Common.HList Associated Types type HListTuple (HList f '[a, b, c, d, e, g]) Source # | |
HListFromTuple (HList f '[a, b, c, d, e]) Source # | |
Defined in Servant.Util.Common.HList Associated Types type HListTuple (HList f '[a, b, c, d, e]) Source # | |
HListFromTuple (HList f '[a, b, c, d]) Source # | |
Defined in Servant.Util.Common.HList Associated Types type HListTuple (HList f '[a, b, c, d]) Source # | |
HListFromTuple (HList f '[a, b, c]) Source # | |
Defined in Servant.Util.Common.HList Associated Types type HListTuple (HList f '[a, b, c]) Source # | |
HListFromTuple (HList f '[a, b]) Source # | |
Defined in Servant.Util.Common.HList Associated Types type HListTuple (HList f '[a, b]) Source # | |
HListFromTuple (HList f '[a]) Source # | |
Defined in Servant.Util.Common.HList Associated Types type HListTuple (HList f '[a]) Source # | |
HListFromTuple (HList f ('[] :: [k])) Source # | |
Defined in Servant.Util.Common.HList Associated Types type HListTuple (HList f '[]) Source # |