{-# LANGUAGE DataKinds #-}
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE GADTs #-}
{-# LANGUAGE PolyKinds #-}
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE RoleAnnotations #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE TypeOperators #-}
{-# LANGUAGE UndecidableInstances #-}
module Data.UnitsOfMeasure
(
Unit
, type Base
, type One
, type (*:)
, type (/:)
, type (^:)
, Quantity
, unQuantity
, zero
, mk
, (+:)
, (*:)
, (-:)
, negate'
, abs'
, signum'
, fromInteger'
, (/:)
, recip'
, fromRational'
, toRational'
, sqrt'
, u
, declareBaseUnit
, declareDerivedUnit
, declareConvertibleUnit
, convert
, MkUnit
, Pack
, Unpack
, KnownUnit
) where
import Data.UnitsOfMeasure.Convert
import Data.UnitsOfMeasure.Internal
import Data.UnitsOfMeasure.Read ()
import Data.UnitsOfMeasure.Show ()
import Data.UnitsOfMeasure.Singleton
import Data.UnitsOfMeasure.TH