{-# LANGUAGE Trustworthy #-}
{-# LANGUAGE NoImplicitPrelude, MagicHash #-}
module GHC.Char
    ( 
      chr
      
      
    , eqChar, neChar
    ) where
import GHC.Base
import GHC.Show
chr :: Int -> Char
chr :: Int -> Char
chr i :: Int
i@(I# Int#
i#)
 | Int# -> Bool
isTrue# (Int# -> Word#
int2Word# Int#
i# Word# -> Word# -> Int#
`leWord#` Word#
0x10FFFF##) = Char# -> Char
C# (Int# -> Char#
chr# Int#
i#)
 | Bool
otherwise
    = forall a. [Char] -> a
errorWithoutStackTrace ([Char]
"Prelude.chr: bad argument: " forall a. [a] -> [a] -> [a]
++ Int -> Int -> ShowS
showSignedInt (Int# -> Int
I# Int#
9#) Int
i [Char]
"")