{-# language DataKinds #-}
module Mu.Schema (
Schema, Schema'
, KnownName(..)
, TypeDef, TypeDefB(..)
, ChoiceDef(..)
, FieldDef, FieldDefB(..)
, FieldType, FieldTypeB(..)
, (:/:)
, Term(..), Field(..), FieldValue(..)
, NS(..), NP(..), Proxy(..)
, WithSchema(..), unWithSchema
, FromSchema(..), fromSchema'
, ToSchema(..), toSchema'
, CustomFieldMapping(..)
, Underlying(..), UnderlyingConversion(..)
, Mapping(..), Mappings, MappingRight, MappingLeft
, AnnotatedSchema, AnnotationDomain, Annotation(..)
) where
import Mu.Schema.Annotations
import Mu.Schema.Class
import Mu.Schema.Definition
import Mu.Schema.Interpretation