{-# LINE 1 "Data/Text/ICU/Normalize/Internal.hsc" #-}
{-# LANGUAGE CPP, DeriveDataTypeable, ForeignFunctionInterface #-}
module Data.Text.ICU.Normalize.Internal
(
UNormalizationCheckResult
, toNCR
) where
import Foreign.C.Types (CInt)
type UNormalizationCheckResult = CInt
toNCR :: UNormalizationCheckResult -> Maybe Bool
toNCR :: UNormalizationCheckResult -> Maybe Bool
toNCR (UNormalizationCheckResult
0) = Bool -> Maybe Bool
forall a. a -> Maybe a
Just Bool
False
{-# LINE 25 "Data/Text/ICU/Normalize/Internal.hsc" #-}
toNCR (2) = Nothing
{-# LINE 26 "Data/Text/ICU/Normalize/Internal.hsc" #-}
toNCR (1) = Just True
{-# LINE 27 "Data/Text/ICU/Normalize/Internal.hsc" #-}
toNCR _ = error "toNormalizationCheckResult"