module Numeric.Units.Dimensional.Internal
(
KnownVariant(..),
Dimensional(..),
type Unit, type Quantity, type SQuantity,
siUnit, showIn,
liftD, liftD2,
liftQ, liftQ2
)
where
import Control.Applicative
import Control.DeepSeq
import Control.Monad (liftM)
import Data.AEq (AEq)
import Data.Coerce (coerce)
import Data.Data
import Data.ExactPi
#if MIN_VERSION_base(4,9,0)
import Data.Functor.Classes (Eq1(..), Ord1(..))
#endif
import qualified Data.ExactPi.TypeLevel as E
import Data.Monoid (Monoid(..))
import Data.Semigroup (Semigroup(..))
import Foreign.Ptr (Ptr, castPtr)
import Foreign.Storable (Storable(..))
import GHC.Generics
import Numeric.Units.Dimensional.Dimensions
import Numeric.Units.Dimensional.Variants
import Numeric.Units.Dimensional.UnitNames hiding ((*), (/), (^), weaken, strengthen)
import qualified Numeric.Units.Dimensional.UnitNames.Internal as Name
import Numeric.Units.Dimensional.UnitNames.InterchangeNames (HasInterchangeName(..))
import qualified Data.Vector.Generic.Mutable as M
import qualified Data.Vector.Generic as G
import qualified Data.Vector.Unboxed.Base as U
import Prelude
( Show, Eq(..), Ord, Bounded(..), Num, Fractional, Functor, Real(..)
, String, Maybe(..), Double
, (.), ($), (++), (+), (/)
, show, otherwise, undefined, error, fmap, realToFrac
)
import qualified Prelude as P
type Unit (m :: Metricality) = Dimensional ('DUnit m)
type Quantity = SQuantity E.One
type SQuantity s = Dimensional ('DQuantity s)
class KnownVariant (v :: Variant) where
data Dimensional v :: Dimension -> * -> *
type ScaleFactor v :: E.ExactPi'
extractValue :: Dimensional v d a -> (a, Maybe ExactPi)
extractName :: Dimensional v d a -> Maybe (UnitName 'NonMetric)
injectValue :: (Maybe (UnitName 'NonMetric)) -> (a, Maybe ExactPi) -> Dimensional v d a
dmap :: (a1 -> a2) -> Dimensional v d a1 -> Dimensional v d a2
deriving instance Typeable Dimensional
instance KnownVariant ('DQuantity s) where
newtype Dimensional ('DQuantity s) d a = Quantity a
deriving (Eq, Ord, AEq, Data, Generic, Generic1
#if MIN_VERSION_base(4,8,0)
, Typeable
#endif
)
type (ScaleFactor ('DQuantity s)) = s
extractValue (Quantity x) = (x, Nothing)
extractName _ = Nothing
injectValue _ (x, _) = Quantity x
dmap = coerce
instance (Typeable m) => KnownVariant ('DUnit m) where
data Dimensional ('DUnit m) d a = Unit !(UnitName m) !ExactPi !a
deriving (Generic, Generic1
#if MIN_VERSION_base(4,8,0)
, Typeable
#endif
)
type (ScaleFactor ('DUnit m)) = E.One
extractValue (Unit _ e x) = (x, Just e)
extractName (Unit n _ _) = Just . Name.weaken $ n
injectValue (Just n) (x, Just e) | Just n' <- relax n = Unit n' e x
| otherwise = error "Shouldn't be reachable. Needed a metric name but got a non-metric one."
injectValue _ _ = error "Shouldn't be reachable. Needed to name a quantity."
dmap f (Unit n e x) = Unit n e (f x)
instance (Bounded a) => Bounded (SQuantity s d a) where
minBound = Quantity minBound
maxBound = Quantity maxBound
#if MIN_VERSION_base(4,9,0)
instance Eq1 (SQuantity s d) where
liftEq = coerce
instance Ord1 (SQuantity s d) where
liftCompare = coerce
#endif
instance HasInterchangeName (Unit m d a) where
interchangeName (Unit n _ _) = interchangeName n
instance (Num a) => Semigroup (SQuantity s d a) where
(<>) = liftQ2 (+)
instance (Num a) => Monoid (SQuantity s d a) where
mempty = Quantity 0
mappend = liftQ2 (+)
instance Functor (SQuantity s DOne) where
fmap = dmap
instance (KnownDimension d) => HasDynamicDimension (Dimensional v d a) where
instance (KnownDimension d) => HasDimension (Dimensional v d a) where
dimension _ = dimension (Proxy :: Proxy d)
siUnit :: forall d a.(KnownDimension d, Num a) => Unit 'NonMetric d a
siUnit = Unit (baseUnitName $ dimension (Proxy :: Proxy d)) 1 1
instance NFData a => NFData (Quantity d a)
instance Storable a => Storable (SQuantity s d a) where
sizeOf _ = sizeOf (undefined::a)
alignment _ = alignment (undefined::a)
poke ptr = poke (castPtr ptr :: Ptr a) . coerce
peek ptr = liftM Quantity (peek (castPtr ptr :: Ptr a))
newtype instance U.Vector (SQuantity s d a) = V_Quantity {unVQ :: U.Vector a}
newtype instance U.MVector v (SQuantity s d a) = MV_Quantity {unMVQ :: U.MVector v a}
instance U.Unbox a => U.Unbox (SQuantity s d a)
instance (M.MVector U.MVector a) => M.MVector U.MVector (SQuantity s d a) where
basicLength = M.basicLength . unMVQ
basicUnsafeSlice m n = MV_Quantity . M.basicUnsafeSlice m n . unMVQ
basicOverlaps u v = M.basicOverlaps (unMVQ u) (unMVQ v)
basicUnsafeNew = liftM MV_Quantity . M.basicUnsafeNew
basicUnsafeRead v = liftM Quantity . M.basicUnsafeRead (unMVQ v)
basicUnsafeWrite v i = M.basicUnsafeWrite (unMVQ v) i . coerce
#if MIN_VERSION_vector(0,11,0)
basicInitialize = M.basicInitialize . unMVQ
#endif
instance (G.Vector U.Vector a) => G.Vector U.Vector (SQuantity s d a) where
basicUnsafeFreeze = liftM V_Quantity . G.basicUnsafeFreeze . unMVQ
basicUnsafeThaw = liftM MV_Quantity . G.basicUnsafeThaw . unVQ
basicLength = G.basicLength . unVQ
basicUnsafeSlice m n = V_Quantity . G.basicUnsafeSlice m n . unVQ
basicUnsafeIndexM v = liftM Quantity . G.basicUnsafeIndexM (unVQ v)
instance (KnownDimension d, E.KnownExactPi s, Show a, Real a) => Show (SQuantity s d a) where
show (Quantity x) | isExactOne s' = show x ++ showName n
| otherwise = "Quantity " ++ show x ++ " {- " ++ show q ++ " -}"
where
s' = E.exactPiVal (Proxy :: Proxy s)
s'' = approximateValue s' :: Double
q = Quantity (realToFrac x P.* s'') :: Quantity d Double
(Unit n _ _) = siUnit :: Unit 'NonMetric d a
showIn :: (Show a, Fractional a) => Unit m d a -> Quantity d a -> String
showIn (Unit n _ y) (Quantity x) = show (x / y) ++ (showName . Name.weaken $ n)
showName :: UnitName 'NonMetric -> String
showName n | n == nOne = ""
| otherwise = " " ++ show n
instance (Show a) => Show (Unit m d a) where
show (Unit n e x) = "The unit " ++ show n ++ ", with value " ++ show e ++ " (or " ++ show x ++ ")"
liftD :: (KnownVariant v1, KnownVariant v2) => (ExactPi -> ExactPi) -> (a -> b) -> UnitNameTransformer -> (Dimensional v1 d1 a) -> (Dimensional v2 d2 b)
liftD fe f nt x = let (x', e') = extractValue x
n = extractName x
n' = (liftA nt) n
in injectValue n' (f x', fmap fe e')
liftQ :: (a -> a) -> SQuantity s1 d1 a -> SQuantity s2 d2 a
liftQ = coerce
liftD2 :: (KnownVariant v1, KnownVariant v2, KnownVariant v3) => (ExactPi -> ExactPi -> ExactPi) -> (a -> a -> a) -> UnitNameTransformer2 -> Dimensional v1 d1 a -> Dimensional v2 d2 a -> Dimensional v3 d3 a
liftD2 fe f nt x1 x2 = let (x1', e1') = extractValue x1
(x2', e2') = extractValue x2
n1 = extractName x1
n2 = extractName x2
n' = (liftA2 nt) n1 n2
in injectValue n' (f x1' x2', fe <$> e1' <*> e2')
liftQ2 :: (a -> a -> a) -> SQuantity s1 d1 a -> SQuantity s2 d2 a -> SQuantity s3 d3 a
liftQ2 = coerce