{-# LANGUAGE CPP                #-}
{-# LANGUAGE DeriveDataTypeable #-}
#if __GLASGOW_HASKELL__ < 710
{-# LANGUAGE DataKinds          #-}
{-# LANGUAGE StandaloneDeriving #-}
#endif
module Data.Nat (
    
    Nat(..),
    toNatural,
    fromNatural,
    cata,
    
    explicitShow,
    explicitShowsPrec,
    
    nat0, nat1, nat2, nat3, nat4, nat5, nat6, nat7, nat8, nat9,
    ) where
import Control.DeepSeq (NFData (..))
import Data.Data       (Data)
import Data.Hashable   (Hashable (..))
import Data.Typeable   (Typeable)
import GHC.Exception   (ArithException (..), throw)
import Numeric.Natural (Natural)
import qualified Test.QuickCheck as QC
data Nat = Z | S Nat deriving (Eq, Ord, Typeable, Data)
#if __GLASGOW_HASKELL__ < 710
deriving instance Typeable 'Z
deriving instance Typeable 'S
#endif
instance Show Nat where
    showsPrec d = showsPrec d . toNatural
instance Num Nat where
    fromInteger = fromNatural . fromInteger
    Z   + m = m
    S n + m = S (n + m)
    Z   * _ = Z
    S n * m = (n * m) + m
    abs = id
    signum Z     = Z
    signum (S _) = S Z
    negate _ = error "negate @Nat"
instance Real Nat where
    toRational = toRational . toInteger
instance Integral Nat where
    toInteger = cata 0 succ
    quotRem _ Z = throw DivideByZero
    quotRem _ _ = error "quotRam @Nat un-implemented"
instance Enum Nat where
    toEnum n
        | n < 0     = throw Underflow
        | otherwise = iterate S Z !! n
    fromEnum = cata 0 succ
    succ       = S
    pred Z     = throw Underflow
    pred (S n) = n
instance NFData Nat where
    rnf Z     = ()
    rnf (S n) = rnf n
instance Hashable Nat where
    hashWithSalt salt = hashWithSalt salt . toInteger
instance QC.Arbitrary Nat where
    arbitrary = fmap fromNatural QC.arbitrarySizedNatural
    shrink Z     = []
    shrink (S n) = n : QC.shrink n
instance QC.CoArbitrary Nat where
    coarbitrary Z     = QC.variant (0 :: Int)
    coarbitrary (S n) = QC.variant (1 :: Int) . QC.coarbitrary n
instance QC.Function Nat where
    function = QC.functionIntegral
explicitShow :: Nat -> String
explicitShow n = explicitShowsPrec 0 n ""
explicitShowsPrec :: Int -> Nat -> ShowS
explicitShowsPrec _ Z     = showString "Z"
explicitShowsPrec d (S n) = showParen (d > 10)
    $ showString "S "
    . explicitShowsPrec 11 n
cata :: a -> (a -> a) -> Nat -> a
cata z f = go where
    go Z     = z
    go (S n) = f (go n)
toNatural :: Nat -> Natural
toNatural Z = 0
toNatural (S n) = succ (toNatural n)
fromNatural :: Natural -> Nat
fromNatural 0 = Z
fromNatural n = S (fromNatural (pred n))
nat0, nat1, nat2, nat3, nat4, nat5, nat6, nat7, nat8, nat9 :: Nat
nat0 = Z
nat1 = S nat0
nat2 = S nat1
nat3 = S nat2
nat4 = S nat3
nat5 = S nat4
nat6 = S nat5
nat7 = S nat6
nat8 = S nat7
nat9 = S nat8