{-# LANGUAGE FlexibleInstances, UndecidableInstances #-}
module Numeric.Domain.Class (Domain) where

import Numeric.Domain.Internal(Domain)