{-# language DataKinds #-}
{-# language StandaloneKindSignatures #-}
module Rel8.Schema.HTable.Pair
( HPair(..)
)
where
import Prelude ()
import qualified Rel8.Schema.Kind as K
type HPair :: K.HTable -> K.HTable -> K.HTable
data HPair fst snd context = HPair
{ forall (fst :: HTable) (snd :: HTable) (context :: HContext).
HPair fst snd context -> fst context
hfst :: fst context
, forall (fst :: HTable) (snd :: HTable) (context :: HContext).
HPair fst snd context -> snd context
hsnd :: snd context
}