module Wire.API.Team.HardTruncationLimit where

import Data.Proxy
import GHC.TypeLits
import Imports

type HardTruncationLimit = (2000 :: Nat)

hardTruncationLimit :: (Integral a) => a
hardTruncationLimit :: forall a. Integral a => a
hardTruncationLimit = Integer -> a
forall a b. (Integral a, Num b) => a -> b
fromIntegral (Integer -> a) -> Integer -> a
forall a b. (a -> b) -> a -> b
$ Proxy HardTruncationLimit -> Integer
forall (n :: Nat) (proxy :: Nat -> *).
KnownNat n =>
proxy n -> Integer
natVal (forall (t :: Nat). Proxy t
forall {k} (t :: k). Proxy t
Proxy @HardTruncationLimit)