{-# language DataKinds #-}
{-# language TypeOperators #-}
{-# language KindSignatures #-}
{-# language ExplicitForAll #-}
{-# language AllowAmbiguousTypes #-}
module Arithmetic.Plus
( zeroL
, zeroR
, commutative
, associative
) where
import Arithmetic.Unsafe (type (:=:)(Eq))
import GHC.TypeNats (type (+))
zeroR :: m :=: (m + 0)
zeroR = Eq
zeroL :: m :=: (0 + m)
zeroL = Eq
commutative :: forall a b. a + b :=: b + a
commutative = Eq
associative :: forall a b c. (a + b) + c :=: a + (b + c)
associative = Eq