{-# LANGUAGE CPP #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE DeriveLift #-}
module Text.Collate.Collation
( Collation(..)
, CollationElement(..)
, unfoldCollation
, insertElements
, alterElements
, suppressContractions
, findLast
, findFirst
, matchLongestPrefix
, getCollationElements
, parseCollation
, parseCJKOverrides
)
where
import qualified Data.IntSet as IntSet
import qualified Data.Text as T
import qualified Data.Text.Read as TR
import Data.Text (Text)
import Data.Bits ( Bits((.|.), shiftR, (.&.)) )
import Data.List (foldl')
import Text.Collate.UnicodeData (readCodePoints)
import Data.Maybe
import Data.Foldable (minimumBy, maximumBy)
import Data.Word (Word16)
import Data.Binary (Binary(get, put))
import Language.Haskell.TH.Syntax (Lift(..))
import Instances.TH.Lift ()
import qualified Text.Collate.Trie as Trie
import Text.Collate.CanonicalCombiningClass (canonicalCombiningClass)
import Text.Printf
#if MIN_VERSION_base(4,11,0)
#else
import Data.Semigroup (Semigroup(..))
#endif
data CollationElement =
CollationElement
{ CollationElement -> Bool
collationVariable :: !Bool
, CollationElement -> Word16
collationL1 :: {-# UNPACK #-} !Word16
, CollationElement -> Word16
collationL2 :: {-# UNPACK #-} !Word16
, CollationElement -> Word16
collationL3 :: {-# UNPACK #-} !Word16
, CollationElement -> Word16
collationL4 :: {-# UNPACK #-} !Word16
} deriving (CollationElement -> CollationElement -> Bool
(CollationElement -> CollationElement -> Bool)
-> (CollationElement -> CollationElement -> Bool)
-> Eq CollationElement
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: CollationElement -> CollationElement -> Bool
== :: CollationElement -> CollationElement -> Bool
$c/= :: CollationElement -> CollationElement -> Bool
/= :: CollationElement -> CollationElement -> Bool
Eq, (forall (m :: * -> *). Quote m => CollationElement -> m Exp)
-> (forall (m :: * -> *).
Quote m =>
CollationElement -> Code m CollationElement)
-> Lift CollationElement
forall t.
(forall (m :: * -> *). Quote m => t -> m Exp)
-> (forall (m :: * -> *). Quote m => t -> Code m t) -> Lift t
forall (m :: * -> *). Quote m => CollationElement -> m Exp
forall (m :: * -> *).
Quote m =>
CollationElement -> Code m CollationElement
$clift :: forall (m :: * -> *). Quote m => CollationElement -> m Exp
lift :: forall (m :: * -> *). Quote m => CollationElement -> m Exp
$cliftTyped :: forall (m :: * -> *).
Quote m =>
CollationElement -> Code m CollationElement
liftTyped :: forall (m :: * -> *).
Quote m =>
CollationElement -> Code m CollationElement
Lift)
instance Ord CollationElement where
compare :: CollationElement -> CollationElement -> Ordering
compare (CollationElement Bool
_ Word16
p1 Word16
s1 Word16
t1 Word16
q1) (CollationElement Bool
_ Word16
p2 Word16
s2 Word16
t2 Word16
q2) =
Word16 -> Word16 -> Ordering
forall a. Ord a => a -> a -> Ordering
compare Word16
p1 Word16
p2 Ordering -> Ordering -> Ordering
forall a. Semigroup a => a -> a -> a
<> Word16 -> Word16 -> Ordering
forall a. Ord a => a -> a -> Ordering
compare Word16
s1 Word16
s2 Ordering -> Ordering -> Ordering
forall a. Semigroup a => a -> a -> a
<> Word16 -> Word16 -> Ordering
forall a. Ord a => a -> a -> Ordering
compare Word16
t1 Word16
t2 Ordering -> Ordering -> Ordering
forall a. Semigroup a => a -> a -> a
<> Word16 -> Word16 -> Ordering
forall a. Ord a => a -> a -> Ordering
compare Word16
q1 Word16
q2
instance Show CollationElement where
show :: CollationElement -> String
show (CollationElement Bool
v Word16
l1 Word16
l2 Word16
l3 Word16
l4) =
String -> String -> Word16 -> Word16 -> Word16 -> Word16 -> String
forall r. PrintfType r => String -> r
printf String
"CollationElement %s 0x%04X 0x%04X 0x%04X 0x%04X" (Bool -> String
forall a. Show a => a -> String
show Bool
v) Word16
l1 Word16
l2 Word16
l3 Word16
l4
instance Binary CollationElement where
put :: CollationElement -> Put
put (CollationElement Bool
v Word16
w Word16
x Word16
y Word16
z) = (Bool, Word16, Word16, Word16, Word16) -> Put
forall t. Binary t => t -> Put
put (Bool
v,Word16
w,Word16
x,Word16
y,Word16
z)
get :: Get CollationElement
get = do
(Bool
v,Word16
w,Word16
x,Word16
y,Word16
z) <- Get (Bool, Word16, Word16, Word16, Word16)
forall t. Binary t => Get t
get
CollationElement -> Get CollationElement
forall a. a -> Get a
forall (m :: * -> *) a. Monad m => a -> m a
return (CollationElement -> Get CollationElement)
-> CollationElement -> Get CollationElement
forall a b. (a -> b) -> a -> b
$ Bool -> Word16 -> Word16 -> Word16 -> Word16 -> CollationElement
CollationElement Bool
v Word16
w Word16
x Word16
y Word16
z
newtype Collation = Collation { Collation -> Trie [CollationElement]
unCollation :: Trie.Trie [CollationElement] }
deriving (Int -> Collation -> ShowS
[Collation] -> ShowS
Collation -> String
(Int -> Collation -> ShowS)
-> (Collation -> String)
-> ([Collation] -> ShowS)
-> Show Collation
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> Collation -> ShowS
showsPrec :: Int -> Collation -> ShowS
$cshow :: Collation -> String
show :: Collation -> String
$cshowList :: [Collation] -> ShowS
showList :: [Collation] -> ShowS
Show, Collation -> Collation -> Bool
(Collation -> Collation -> Bool)
-> (Collation -> Collation -> Bool) -> Eq Collation
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: Collation -> Collation -> Bool
== :: Collation -> Collation -> Bool
$c/= :: Collation -> Collation -> Bool
/= :: Collation -> Collation -> Bool
Eq, Eq Collation
Eq Collation =>
(Collation -> Collation -> Ordering)
-> (Collation -> Collation -> Bool)
-> (Collation -> Collation -> Bool)
-> (Collation -> Collation -> Bool)
-> (Collation -> Collation -> Bool)
-> (Collation -> Collation -> Collation)
-> (Collation -> Collation -> Collation)
-> Ord Collation
Collation -> Collation -> Bool
Collation -> Collation -> Ordering
Collation -> Collation -> Collation
forall a.
Eq a =>
(a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
$ccompare :: Collation -> Collation -> Ordering
compare :: Collation -> Collation -> Ordering
$c< :: Collation -> Collation -> Bool
< :: Collation -> Collation -> Bool
$c<= :: Collation -> Collation -> Bool
<= :: Collation -> Collation -> Bool
$c> :: Collation -> Collation -> Bool
> :: Collation -> Collation -> Bool
$c>= :: Collation -> Collation -> Bool
>= :: Collation -> Collation -> Bool
$cmax :: Collation -> Collation -> Collation
max :: Collation -> Collation -> Collation
$cmin :: Collation -> Collation -> Collation
min :: Collation -> Collation -> Collation
Ord, (forall (m :: * -> *). Quote m => Collation -> m Exp)
-> (forall (m :: * -> *). Quote m => Collation -> Code m Collation)
-> Lift Collation
forall t.
(forall (m :: * -> *). Quote m => t -> m Exp)
-> (forall (m :: * -> *). Quote m => t -> Code m t) -> Lift t
forall (m :: * -> *). Quote m => Collation -> m Exp
forall (m :: * -> *). Quote m => Collation -> Code m Collation
$clift :: forall (m :: * -> *). Quote m => Collation -> m Exp
lift :: forall (m :: * -> *). Quote m => Collation -> m Exp
$cliftTyped :: forall (m :: * -> *). Quote m => Collation -> Code m Collation
liftTyped :: forall (m :: * -> *). Quote m => Collation -> Code m Collation
Lift, NonEmpty Collation -> Collation
Collation -> Collation -> Collation
(Collation -> Collation -> Collation)
-> (NonEmpty Collation -> Collation)
-> (forall b. Integral b => b -> Collation -> Collation)
-> Semigroup Collation
forall b. Integral b => b -> Collation -> Collation
forall a.
(a -> a -> a)
-> (NonEmpty a -> a)
-> (forall b. Integral b => b -> a -> a)
-> Semigroup a
$c<> :: Collation -> Collation -> Collation
<> :: Collation -> Collation -> Collation
$csconcat :: NonEmpty Collation -> Collation
sconcat :: NonEmpty Collation -> Collation
$cstimes :: forall b. Integral b => b -> Collation -> Collation
stimes :: forall b. Integral b => b -> Collation -> Collation
Semigroup, Semigroup Collation
Collation
Semigroup Collation =>
Collation
-> (Collation -> Collation -> Collation)
-> ([Collation] -> Collation)
-> Monoid Collation
[Collation] -> Collation
Collation -> Collation -> Collation
forall a.
Semigroup a =>
a -> (a -> a -> a) -> ([a] -> a) -> Monoid a
$cmempty :: Collation
mempty :: Collation
$cmappend :: Collation -> Collation -> Collation
mappend :: Collation -> Collation -> Collation
$cmconcat :: [Collation] -> Collation
mconcat :: [Collation] -> Collation
Monoid)
instance Binary Collation where
put :: Collation -> Put
put (Collation Trie [CollationElement]
m) = Trie [CollationElement] -> Put
forall t. Binary t => t -> Put
put Trie [CollationElement]
m
get :: Get Collation
get = Trie [CollationElement] -> Collation
Collation (Trie [CollationElement] -> Collation)
-> Get (Trie [CollationElement]) -> Get Collation
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Get (Trie [CollationElement])
forall t. Binary t => Get t
get
unfoldCollation :: Collation -> [([Int], [CollationElement])]
unfoldCollation :: Collation -> [([Int], [CollationElement])]
unfoldCollation (Collation Trie [CollationElement]
trie) = Trie [CollationElement] -> [([Int], [CollationElement])]
forall a. Trie a -> [([Int], a)]
Trie.unfoldTrie Trie [CollationElement]
trie
insertElements :: [Int] -> [CollationElement] -> Collation -> Collation
insertElements :: [Int] -> [CollationElement] -> Collation -> Collation
insertElements [Int]
codepoints [CollationElement]
els (Collation Trie [CollationElement]
trie) =
Trie [CollationElement] -> Collation
Collation (Trie [CollationElement] -> Collation)
-> Trie [CollationElement] -> Collation
forall a b. (a -> b) -> a -> b
$ [Int]
-> [CollationElement]
-> Trie [CollationElement]
-> Trie [CollationElement]
forall a. [Int] -> a -> Trie a -> Trie a
Trie.insert [Int]
codepoints [CollationElement]
els Trie [CollationElement]
trie
suppressContractions :: [Int] -> Collation -> Collation
suppressContractions :: [Int] -> Collation -> Collation
suppressContractions [Int]
cps Collation
coll =
([Int] -> Collation -> Collation)
-> Collation -> [[Int]] -> Collation
forall a b. (a -> b -> b) -> b -> [a] -> b
forall (t :: * -> *) a b.
Foldable t =>
(a -> b -> b) -> b -> t a -> b
foldr ((Maybe [CollationElement] -> Maybe [CollationElement])
-> [Int] -> Collation -> Collation
alterElements (Maybe [CollationElement]
-> Maybe [CollationElement] -> Maybe [CollationElement]
forall a b. a -> b -> a
const Maybe [CollationElement]
forall a. Maybe a
Nothing)) Collation
coll
[[Int]
is | is :: [Int]
is@(Int
i:Int
_:[Int]
_) <- [[Int]]
collationKeys, Int
i Int -> [Int] -> Bool
forall a. Eq a => a -> [a] -> Bool
forall (t :: * -> *) a. (Foldable t, Eq a) => a -> t a -> Bool
`elem` [Int]
cps]
where
collationKeys :: [[Int]]
collationKeys = (([Int], [CollationElement]) -> [Int])
-> [([Int], [CollationElement])] -> [[Int]]
forall a b. (a -> b) -> [a] -> [b]
map ([Int], [CollationElement]) -> [Int]
forall a b. (a, b) -> a
fst ([([Int], [CollationElement])] -> [[Int]])
-> [([Int], [CollationElement])] -> [[Int]]
forall a b. (a -> b) -> a -> b
$ Collation -> [([Int], [CollationElement])]
unfoldCollation Collation
coll
alterElements :: (Maybe [CollationElement] -> Maybe [CollationElement])
-> [Int] -> Collation -> Collation
alterElements :: (Maybe [CollationElement] -> Maybe [CollationElement])
-> [Int] -> Collation -> Collation
alterElements Maybe [CollationElement] -> Maybe [CollationElement]
f [Int]
codepoints (Collation Trie [CollationElement]
trie) =
Trie [CollationElement] -> Collation
Collation (Trie [CollationElement] -> Collation)
-> Trie [CollationElement] -> Collation
forall a b. (a -> b) -> a -> b
$ (Maybe [CollationElement] -> Maybe [CollationElement])
-> [Int] -> Trie [CollationElement] -> Trie [CollationElement]
forall a. (Maybe a -> Maybe a) -> [Int] -> Trie a -> Trie a
Trie.alter Maybe [CollationElement] -> Maybe [CollationElement]
f [Int]
codepoints Trie [CollationElement]
trie
{-# SPECIALIZE matchLongestPrefix
:: Collation -> [Int] -> Maybe ([CollationElement], Int, Collation) #-}
matchLongestPrefix :: Foldable t
=> Collation
-> t Int
-> Maybe ([CollationElement], Int, Collation)
matchLongestPrefix :: forall (t :: * -> *).
Foldable t =>
Collation -> t Int -> Maybe ([CollationElement], Int, Collation)
matchLongestPrefix (Collation Trie [CollationElement]
trie) t Int
codepoints =
case Trie [CollationElement]
-> t Int
-> Maybe ([CollationElement], Int, Trie [CollationElement])
forall (t :: * -> *) a.
Foldable t =>
Trie a -> t Int -> Maybe (a, Int, Trie a)
Trie.matchLongestPrefix Trie [CollationElement]
trie t Int
codepoints of
Maybe ([CollationElement], Int, Trie [CollationElement])
Nothing -> Maybe ([CollationElement], Int, Collation)
forall a. Maybe a
Nothing
Just ([CollationElement]
els, Int
consumed, Trie [CollationElement]
trie') -> ([CollationElement], Int, Collation)
-> Maybe ([CollationElement], Int, Collation)
forall a. a -> Maybe a
Just ([CollationElement]
els, Int
consumed, Trie [CollationElement] -> Collation
Collation Trie [CollationElement]
trie')
lookupNonEmptyChild :: Collation
-> Int
-> Maybe ([CollationElement], Collation)
lookupNonEmptyChild :: Collation -> Int -> Maybe ([CollationElement], Collation)
lookupNonEmptyChild (Collation Trie [CollationElement]
trie) Int
point =
case Trie [CollationElement]
-> Int -> Maybe ([CollationElement], Trie [CollationElement])
forall a. Trie a -> Int -> Maybe (a, Trie a)
Trie.lookupNonEmptyChild Trie [CollationElement]
trie Int
point of
Maybe ([CollationElement], Trie [CollationElement])
Nothing -> Maybe ([CollationElement], Collation)
forall a. Maybe a
Nothing
Just ([CollationElement]
els, Trie [CollationElement]
trie') -> ([CollationElement], Collation)
-> Maybe ([CollationElement], Collation)
forall a. a -> Maybe a
Just ([CollationElement]
els, Trie [CollationElement] -> Collation
Collation Trie [CollationElement]
trie')
findFirst :: ([CollationElement] -> Bool)
-> Collation
-> Maybe ([Int], [CollationElement])
findFirst :: ([CollationElement] -> Bool)
-> Collation -> Maybe ([Int], [CollationElement])
findFirst [CollationElement] -> Bool
f (Collation Trie [CollationElement]
trie) =
case (([Int], [CollationElement])
-> ([Int], [CollationElement]) -> Ordering)
-> [([Int], [CollationElement])] -> ([Int], [CollationElement])
forall (t :: * -> *) a.
Foldable t =>
(a -> a -> Ordering) -> t a -> a
minimumBy ([Int], [CollationElement])
-> ([Int], [CollationElement]) -> Ordering
forall {a} {a}.
(a, [CollationElement]) -> (a, [CollationElement]) -> Ordering
comp ([([Int], [CollationElement])] -> ([Int], [CollationElement]))
-> [([Int], [CollationElement])] -> ([Int], [CollationElement])
forall a b. (a -> b) -> a -> b
$ Trie [CollationElement] -> [([Int], [CollationElement])]
forall a. Trie a -> [([Int], a)]
Trie.unfoldTrie Trie [CollationElement]
trie of
([Int]
is,[CollationElement]
elts) | [CollationElement] -> Bool
f [CollationElement]
elts -> ([Int], [CollationElement]) -> Maybe ([Int], [CollationElement])
forall a. a -> Maybe a
Just ([Int]
is,[CollationElement]
elts)
([Int], [CollationElement])
_ -> Maybe ([Int], [CollationElement])
forall a. Maybe a
Nothing
where
comp :: (a, [CollationElement]) -> (a, [CollationElement]) -> Ordering
comp (a
_,[CollationElement]
x) (a
_,[CollationElement]
y) =
Either [CollationElement] [CollationElement]
-> Either [CollationElement] [CollationElement] -> Ordering
forall a. Ord a => a -> a -> Ordering
compare (if [CollationElement] -> Bool
f [CollationElement]
x then [CollationElement] -> Either [CollationElement] [CollationElement]
forall a b. a -> Either a b
Left [CollationElement]
x else [CollationElement] -> Either [CollationElement] [CollationElement]
forall a b. b -> Either a b
Right [CollationElement]
x)
(if [CollationElement] -> Bool
f [CollationElement]
y then [CollationElement] -> Either [CollationElement] [CollationElement]
forall a b. a -> Either a b
Left [CollationElement]
y else [CollationElement] -> Either [CollationElement] [CollationElement]
forall a b. b -> Either a b
Right [CollationElement]
y)
findLast :: ([CollationElement] -> Bool)
-> Collation
-> Maybe ([Int], [CollationElement])
findLast :: ([CollationElement] -> Bool)
-> Collation -> Maybe ([Int], [CollationElement])
findLast [CollationElement] -> Bool
f (Collation Trie [CollationElement]
trie) =
case (([Int], [CollationElement])
-> ([Int], [CollationElement]) -> Ordering)
-> [([Int], [CollationElement])] -> ([Int], [CollationElement])
forall (t :: * -> *) a.
Foldable t =>
(a -> a -> Ordering) -> t a -> a
maximumBy ([Int], [CollationElement])
-> ([Int], [CollationElement]) -> Ordering
forall {a} {a}.
(a, [CollationElement]) -> (a, [CollationElement]) -> Ordering
comp ([([Int], [CollationElement])] -> ([Int], [CollationElement]))
-> [([Int], [CollationElement])] -> ([Int], [CollationElement])
forall a b. (a -> b) -> a -> b
$ Trie [CollationElement] -> [([Int], [CollationElement])]
forall a. Trie a -> [([Int], a)]
Trie.unfoldTrie Trie [CollationElement]
trie of
([Int]
is,[CollationElement]
elts) | [CollationElement] -> Bool
f [CollationElement]
elts -> ([Int], [CollationElement]) -> Maybe ([Int], [CollationElement])
forall a. a -> Maybe a
Just ([Int]
is,[CollationElement]
elts)
([Int], [CollationElement])
_ -> Maybe ([Int], [CollationElement])
forall a. Maybe a
Nothing
where
comp :: (a, [CollationElement]) -> (a, [CollationElement]) -> Ordering
comp (a
_,[CollationElement]
x) (a
_,[CollationElement]
y) =
Either [CollationElement] [CollationElement]
-> Either [CollationElement] [CollationElement] -> Ordering
forall a. Ord a => a -> a -> Ordering
compare (if [CollationElement] -> Bool
f [CollationElement]
x then [CollationElement] -> Either [CollationElement] [CollationElement]
forall a b. b -> Either a b
Right [CollationElement]
x else [CollationElement] -> Either [CollationElement] [CollationElement]
forall a b. a -> Either a b
Left [CollationElement]
x)
(if [CollationElement] -> Bool
f [CollationElement]
y then [CollationElement] -> Either [CollationElement] [CollationElement]
forall a b. b -> Either a b
Right [CollationElement]
y else [CollationElement] -> Either [CollationElement] [CollationElement]
forall a b. a -> Either a b
Left [CollationElement]
y)
getCollationElements :: Collation -> [Int] -> [CollationElement]
getCollationElements :: Collation -> [Int] -> [CollationElement]
getCollationElements Collation
collation = [Int] -> [CollationElement]
go
where
go :: [Int] -> [CollationElement]
go [] = []
go (Int
c:[Int]
cs) =
case Collation -> [Int] -> Maybe ([CollationElement], Int, Collation)
forall (t :: * -> *).
Foldable t =>
Collation -> t Int -> Maybe ([CollationElement], Int, Collation)
matchLongestPrefix Collation
collation (Int
cInt -> [Int] -> [Int]
forall a. a -> [a] -> [a]
:[Int]
cs) of
Maybe ([CollationElement], Int, Collation)
Nothing -> Int -> [CollationElement]
calculateImplicitWeight Int
c [CollationElement] -> [CollationElement] -> [CollationElement]
forall a. [a] -> [a] -> [a]
++ [Int] -> [CollationElement]
go [Int]
cs
Just ([CollationElement]
elts, Int
consumed, Collation
subcollation)
-> [CollationElement]
elts' [CollationElement] -> [CollationElement] -> [CollationElement]
forall a. [a] -> [a] -> [a]
++ [Int] -> [CollationElement]
go ([Int]
unblockedNonStarters' [Int] -> [Int] -> [Int]
forall a. [a] -> [a] -> [a]
++ [Int]
is')
where
getUnblockedNonStarters :: Int -> [Int] -> ([Int], [Int])
getUnblockedNonStarters Int
_ [] = ([], [])
getUnblockedNonStarters Int
n (Int
x:[Int]
xs)
= case Int -> Int
canonicalCombiningClass Int
x of
Int
ccc
| Int
ccc Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
> Int
n,
([Int]
xs', [Int]
rest) <- Int -> [Int] -> ([Int], [Int])
getUnblockedNonStarters Int
ccc [Int]
xs
-> (Int
x Int -> [Int] -> [Int]
forall a. a -> [a] -> [a]
: [Int]
xs', [Int]
rest)
| Bool
otherwise -> ([], Int
x Int -> [Int] -> [Int]
forall a. a -> [a] -> [a]
: [Int]
xs)
([Int]
unblockedNonStarters, [Int]
is') = Int -> [Int] -> ([Int], [Int])
getUnblockedNonStarters Int
0
(Int -> [Int] -> [Int]
forall a. Int -> [a] -> [a]
drop Int
consumed (Int
cInt -> [Int] -> [Int]
forall a. a -> [a] -> [a]
:[Int]
cs))
([CollationElement]
elts', [Int]
unblockedNonStarters') =
[CollationElement]
-> [Int] -> Collation -> ([CollationElement], [Int])
extendMatch [CollationElement]
elts [Int]
unblockedNonStarters Collation
subcollation
popExtender :: [Int] -> Collation -> Maybe ([CollationElement], [Int], Collation)
popExtender = ([Int] -> [Int])
-> [Int]
-> Collation
-> Maybe ([CollationElement], [Int], Collation)
forall {c}.
([Int] -> c)
-> [Int] -> Collation -> Maybe ([CollationElement], c, Collation)
popExtender' [Int] -> [Int]
forall a. a -> a
id
popExtender' :: ([Int] -> c)
-> [Int] -> Collation -> Maybe ([CollationElement], c, Collation)
popExtender' [Int] -> c
_ [] Collation
_ = Maybe ([CollationElement], c, Collation)
forall a. Maybe a
Nothing
popExtender' [Int] -> c
acc (Int
x:[Int]
xs) Collation
subc
= case Collation -> Int -> Maybe ([CollationElement], Collation)
lookupNonEmptyChild Collation
subc Int
x of
Just ([CollationElement]
es', Collation
subc') -> ([CollationElement], c, Collation)
-> Maybe ([CollationElement], c, Collation)
forall a. a -> Maybe a
Just ([CollationElement]
es', [Int] -> c
acc [Int]
xs, Collation
subc')
Maybe ([CollationElement], Collation)
Nothing -> ([Int] -> c)
-> [Int] -> Collation -> Maybe ([CollationElement], c, Collation)
popExtender' ([Int] -> c
acc ([Int] -> c) -> ([Int] -> [Int]) -> [Int] -> c
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (Int
x Int -> [Int] -> [Int]
forall a. a -> [a] -> [a]
:)) [Int]
xs Collation
subc
extendMatch :: [CollationElement]
-> [Int] -> Collation -> ([CollationElement], [Int])
extendMatch [CollationElement]
es [Int]
ubs Collation
subc = case [Int] -> Collation -> Maybe ([CollationElement], [Int], Collation)
popExtender [Int]
ubs Collation
subc of
Just ([CollationElement]
es', [Int]
ubs', Collation
subc') -> [CollationElement]
-> [Int] -> Collation -> ([CollationElement], [Int])
extendMatch [CollationElement]
es' [Int]
ubs' Collation
subc'
Maybe ([CollationElement], [Int], Collation)
Nothing -> ([CollationElement]
es, [Int]
ubs)
calculateImplicitWeight :: Int -> [CollationElement]
calculateImplicitWeight :: Int -> [CollationElement]
calculateImplicitWeight Int
cp =
[Bool -> Word16 -> Word16 -> Word16 -> Word16 -> CollationElement
CollationElement Bool
False (Int -> Word16
forall a b. (Integral a, Num b) => a -> b
fromIntegral Int
aaaa) Word16
0x0020 Word16
0x0002 Word16
0xFFFF,
Bool -> Word16 -> Word16 -> Word16 -> Word16 -> CollationElement
CollationElement Bool
False (Int -> Word16
forall a b. (Integral a, Num b) => a -> b
fromIntegral Int
bbbb) Word16
0 Word16
0 Word16
0xFFFF]
where
range :: Int -> Int -> IntSet
range Int
x Int
y = [Int] -> IntSet
IntSet.fromList [Int
x..Int
y]
singleton :: Int -> IntSet
singleton = Int -> IntSet
IntSet.singleton
union :: IntSet -> IntSet -> IntSet
union = IntSet -> IntSet -> IntSet
IntSet.union
unifiedIdeographs :: IntSet
unifiedIdeographs = Int -> Int -> IntSet
range Int
0x3400 Int
0x4DBF IntSet -> IntSet -> IntSet
`union`
Int -> Int -> IntSet
range Int
0x4E00 Int
0x9FFC IntSet -> IntSet -> IntSet
`union`
Int -> Int -> IntSet
range Int
0xFA0E Int
0xFA0F IntSet -> IntSet -> IntSet
`union`
Int -> IntSet
singleton Int
0xFA11 IntSet -> IntSet -> IntSet
`union`
Int -> Int -> IntSet
range Int
0xFA13 Int
0xFA14 IntSet -> IntSet -> IntSet
`union`
Int -> IntSet
singleton Int
0xFA1F IntSet -> IntSet -> IntSet
`union`
Int -> IntSet
singleton Int
0xFA21 IntSet -> IntSet -> IntSet
`union`
Int -> Int -> IntSet
range Int
0xFA23 Int
0xFA24 IntSet -> IntSet -> IntSet
`union`
Int -> Int -> IntSet
range Int
0xFA27 Int
0xFA29 IntSet -> IntSet -> IntSet
`union`
Int -> Int -> IntSet
range Int
0x20000 Int
0x2A6DD IntSet -> IntSet -> IntSet
`union`
Int -> Int -> IntSet
range Int
0x2A700 Int
0x2B734 IntSet -> IntSet -> IntSet
`union`
Int -> Int -> IntSet
range Int
0x2B740 Int
0x2B81D IntSet -> IntSet -> IntSet
`union`
Int -> Int -> IntSet
range Int
0x2B820 Int
0x2CEA1 IntSet -> IntSet -> IntSet
`union`
Int -> Int -> IntSet
range Int
0x2CEB0 Int
0x2EBE0 IntSet -> IntSet -> IntSet
`union`
Int -> Int -> IntSet
range Int
0x2CEB0 Int
0x2EBE0 IntSet -> IntSet -> IntSet
`union`
Int -> Int -> IntSet
range Int
0x30000 Int
0x3134A
cjkCompatibilityIdeographs :: IntSet
cjkCompatibilityIdeographs = Int -> Int -> IntSet
range Int
0xF900 Int
0xFAFF
cjkUnifiedIdeographs :: IntSet
cjkUnifiedIdeographs = Int -> Int -> IntSet
range Int
0x4E00 Int
0x9FFF
(Int
aaaa, Int
bbbb) =
case Int
cp of
Int
_ | Int
cp Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
>= Int
0x17000 , Int
cp Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
<= Int
0x18AFF
-> (Int
0xFB00, (Int
cp Int -> Int -> Int
forall a. Num a => a -> a -> a
- Int
0x17000) Int -> Int -> Int
forall a. Bits a => a -> a -> a
.|. Int
0x8000)
| Int
cp Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
>= Int
0x18D00 , Int
cp Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
<= Int
0x18D8F
-> (Int
0xFB00, (Int
cp Int -> Int -> Int
forall a. Num a => a -> a -> a
- Int
0x17000) Int -> Int -> Int
forall a. Bits a => a -> a -> a
.|. Int
0x8000)
| Int
cp Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
>= Int
0x1B170 , Int
cp Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
<= Int
0x1B2FF
-> (Int
0xFB01, (Int
cp Int -> Int -> Int
forall a. Num a => a -> a -> a
- Int
0x1B170) Int -> Int -> Int
forall a. Bits a => a -> a -> a
.|. Int
0x8000)
| Int
cp Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
>= Int
0x18B00 , Int
cp Int -> Int -> Bool
forall a. Ord a => a -> a -> Bool
<= Int
0x18CFF
-> (Int
0xFB02, (Int
cp Int -> Int -> Int
forall a. Num a => a -> a -> a
- Int
0x18B00) Int -> Int -> Int
forall a. Bits a => a -> a -> a
.|. Int
0x8000)
| Int
cp Int -> IntSet -> Bool
`IntSet.member` IntSet
unifiedIdeographs Bool -> Bool -> Bool
&&
(Int
cp Int -> IntSet -> Bool
`IntSet.member` IntSet
cjkUnifiedIdeographs Bool -> Bool -> Bool
||
Int
cp Int -> IntSet -> Bool
`IntSet.member` IntSet
cjkCompatibilityIdeographs)
-> (Int
0xFB40 Int -> Int -> Int
forall a. Num a => a -> a -> a
+ (Int
cp Int -> Int -> Int
forall a. Bits a => a -> Int -> a
`shiftR` Int
15), (Int
cp Int -> Int -> Int
forall a. Bits a => a -> a -> a
.&. Int
0x7FFF) Int -> Int -> Int
forall a. Bits a => a -> a -> a
.|. Int
0x8000)
| Int
cp Int -> IntSet -> Bool
`IntSet.member` IntSet
unifiedIdeographs
-> (Int
0xFB80 Int -> Int -> Int
forall a. Num a => a -> a -> a
+ (Int
cp Int -> Int -> Int
forall a. Bits a => a -> Int -> a
`shiftR` Int
15), (Int
cp Int -> Int -> Int
forall a. Bits a => a -> a -> a
.&. Int
0x7FFF) Int -> Int -> Int
forall a. Bits a => a -> a -> a
.|. Int
0x8000)
| Bool
otherwise
-> (Int
0xFBC0 Int -> Int -> Int
forall a. Num a => a -> a -> a
+ (Int
cp Int -> Int -> Int
forall a. Bits a => a -> Int -> a
`shiftR` Int
15), (Int
cp Int -> Int -> Int
forall a. Bits a => a -> a -> a
.&. Int
0x7FFFF) Int -> Int -> Int
forall a. Bits a => a -> a -> a
.|. Int
0x8000)
parseCollation :: Text -> Collation
parseCollation :: Text -> Collation
parseCollation = (Collation -> Text -> Collation)
-> Collation -> [Text] -> Collation
forall b a. (b -> a -> b) -> b -> [a] -> b
forall (t :: * -> *) b a.
Foldable t =>
(b -> a -> b) -> b -> t a -> b
foldl' Collation -> Text -> Collation
processLine Collation
forall a. Monoid a => a
mempty ([Text] -> Collation) -> (Text -> [Text]) -> Text -> Collation
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> [Text]
T.lines
where
processLine :: Collation -> Text -> Collation
processLine Collation
trie Text
t =
case Text -> ([Int], Text)
readCodePoints Text
t of
([],Text
_) -> Collation
trie
(Int
c:[Int]
cs, Text
rest) -> [Int] -> [CollationElement] -> Collation -> Collation
insertElements (Int
cInt -> [Int] -> [Int]
forall a. a -> [a] -> [a]
:[Int]
cs) (Text -> [CollationElement]
go Text
rest) Collation
trie
go :: Text -> [CollationElement]
go Text
t =
case (Char -> Bool) -> Text -> (Text, Text)
T.break (Char -> Char -> Bool
forall a. Eq a => a -> a -> Bool
== Char
']') (Int -> Text -> Text
T.drop Int
1 (Text -> Text) -> Text -> Text
forall a b. (a -> b) -> a -> b
$ (Char -> Bool) -> Text -> Text
T.dropWhile (Char -> Char -> Bool
forall a. Eq a => a -> a -> Bool
/= Char
'[') Text
t) of
(Text
contents, Text
rest)
| Text -> Bool
T.null Text
rest -> []
| Bool
otherwise -> Text -> CollationElement
parseContents Text
contents CollationElement -> [CollationElement] -> [CollationElement]
forall a. a -> [a] -> [a]
: Text -> [CollationElement]
go Text
rest
parseContents :: Text -> CollationElement
parseContents Text
t =
let isVariable :: Bool
isVariable = Bool -> Bool
not (Text -> Bool
T.null Text
t) Bool -> Bool -> Bool
&& HasCallStack => Text -> Char
Text -> Char
T.head Text
t Char -> Char -> Bool
forall a. Eq a => a -> a -> Bool
== Char
'*'
isIgnorable :: (a, a, a) -> Bool
isIgnorable (a
0,a
0,a
0) = Bool
True
isIgnorable (a, a, a)
_ = Bool
False
in case (Text -> Either String (Word16, Text))
-> [Text] -> [Either String (Word16, Text)]
forall a b. (a -> b) -> [a] -> [b]
map Text -> Either String (Word16, Text)
forall a. Integral a => Reader a
TR.hexadecimal ([Text] -> [Either String (Word16, Text)])
-> [Text] -> [Either String (Word16, Text)]
forall a b. (a -> b) -> a -> b
$ (Text -> Bool) -> [Text] -> [Text]
forall a. (a -> Bool) -> [a] -> [a]
filter (Bool -> Bool
not (Bool -> Bool) -> (Text -> Bool) -> Text -> Bool
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> Bool
T.null)
((Char -> Bool) -> Text -> [Text]
T.split Char -> Bool
isSep Text
t) of
[Right (Word16
x,Text
_), Right (Word16
y,Text
_), Right (Word16
z,Text
_)]
-> Bool -> Word16 -> Word16 -> Word16 -> Word16 -> CollationElement
CollationElement Bool
isVariable Word16
x Word16
y Word16
z
(if Bool
isVariable Bool -> Bool -> Bool
|| (Word16, Word16, Word16) -> Bool
forall {a} {a} {a}.
(Eq a, Eq a, Eq a, Num a, Num a, Num a) =>
(a, a, a) -> Bool
isIgnorable (Word16
x,Word16
y,Word16
z)
then Word16
0
else Word16
0xFFFF)
[Either String (Word16, Text)]
_ -> Bool -> Word16 -> Word16 -> Word16 -> Word16 -> CollationElement
CollationElement Bool
isVariable Word16
0 Word16
0 Word16
0 Word16
0
isSep :: Char -> Bool
isSep Char
'*' = Bool
True
isSep Char
'.' = Bool
True
isSep Char
_ = Bool
False
parseCJKOverrides :: Text -> [Int]
parseCJKOverrides :: Text -> [Int]
parseCJKOverrides = (Text -> Maybe Int) -> [Text] -> [Int]
forall a b. (a -> Maybe b) -> [a] -> [b]
mapMaybe Text -> Maybe Int
forall {a}. Integral a => Text -> Maybe a
chunkToCp ([Text] -> [Int]) -> (Text -> [Text]) -> Text -> [Int]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> [Text]
T.words
where
chunkToCp :: Text -> Maybe a
chunkToCp Text
t =
case Reader a
forall a. Integral a => Reader a
TR.hexadecimal Text
t of
Right (a
x,Text
rest)
| Text -> Bool
T.null Text
rest -> a -> Maybe a
forall a. a -> Maybe a
Just a
x
Either String (a, Text)
_ -> Maybe a
forall a. Maybe a
Nothing