{-# LANGUAGE CPP #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE UndecidableInstances #-}
{-# OPTIONS_GHC -fplugin GHC.TypeLits.KnownNat.Solver #-}
module Clash.Class.Exp (Exp, ExpResult, (^)) where
import qualified Prelude as P
import Prelude hiding ((^))
import Clash.Annotations.Primitive (hasBlackBox)
import Clash.Promoted.Nat (SNat(..), snatToInteger)
import Clash.Sized.Internal.Index (Index)
import Clash.Sized.Internal.Signed (Signed)
import Clash.Sized.Internal.Unsigned (Unsigned)
import GHC.TypeLits
(KnownNat, Nat, type (^), type (*))
import GHC.TypeLits.Extra (Max)
class Exp a where
type ExpResult a (n :: Nat)
(^)
:: a
-> SNat n
-> ExpResult a n
instance KnownNat m => Exp (Index m) where
type ExpResult (Index m) n = Index (Max 2 (m ^ n))
(^) = expIndex#
{-# INLINE (^) #-}
instance KnownNat m => Exp (Signed m) where
type ExpResult (Signed m) n = Signed (Max 2 (m * n))
(^) = expSigned#
{-# INLINE (^) #-}
instance KnownNat m => Exp (Unsigned m) where
type ExpResult (Unsigned m) n = Unsigned (Max 1 (m * n))
(^) = expUnsigned#
{-# INLINE (^) #-}
expIndex#
:: KnownNat m
=> Index m
-> SNat n
-> Index (Max 2 (m ^ n))
expIndex# b e@SNat =
fromInteger (toInteger b P.^ snatToInteger e)
{-# NOINLINE expIndex# #-}
{-# ANN expIndex# hasBlackBox #-}
expSigned#
:: KnownNat m
=> Signed m
-> SNat n
-> Signed (Max 2 (m * n))
expSigned# b e@SNat =
fromInteger (toInteger b P.^ snatToInteger e)
{-# NOINLINE expSigned# #-}
{-# ANN expSigned# hasBlackBox #-}
expUnsigned#
:: KnownNat m
=> Unsigned m
-> SNat n
-> Unsigned (Max 1 (m * n))
expUnsigned# b e@SNat =
fromInteger (toInteger b P.^ snatToInteger e)
{-# NOINLINE expUnsigned# #-}
{-# ANN expUnsigned# hasBlackBox #-}