-- | -- Module : Streamly.Internal.Unicode.Char -- Copyright : (c) 2018 Composewell Technologies -- -- License : BSD-3-Clause -- Maintainer : streamly@composewell.com -- Stability : experimental -- Portability : GHC -- module Streamly.Internal.Unicode.Char ( -- * Predicates isAsciiAlpha -- * Unicode aware operations {- toCaseFold , toLower , toUpper , toTitle -} ) where import Data.Char (isAsciiUpper, isAsciiLower) -- import Streamly.Prelude (IsStream) ------------------------------------------------------------------------------- -- Unicode aware operations on strings ------------------------------------------------------------------------------- -- | Select alphabetic characters in the ascii character set. -- -- /Pre-release/ -- {-# INLINE isAsciiAlpha #-} isAsciiAlpha :: Char -> Bool isAsciiAlpha :: Char -> Bool isAsciiAlpha Char c = Char -> Bool isAsciiUpper Char c Bool -> Bool -> Bool || Char -> Bool isAsciiLower Char c ------------------------------------------------------------------------------- -- Unicode aware operations on strings ------------------------------------------------------------------------------- {- -- | -- /undefined/ toCaseFold :: IsStream t => Char -> t m Char toCaseFold = undefined -- | -- /undefined/ toLower :: IsStream t => Char -> t m Char toLower = undefined -- | -- /undefined/ toUpper :: IsStream t => Char -> t m Char toUpper = undefined -- | -- /undefined/ toTitle :: IsStream t => Char -> t m Char toTitle = undefined -}