File: Builder.hs

package info (click to toggle)
haskell-encoding 0.10.2-1
  • links: PTS, VCS
  • area: main
  • in suites: forky, sid
  • size: 3,392 kB
  • sloc: haskell: 4,372; ansic: 11; makefile: 4
file content (64 lines) | stat: -rw-r--r-- 3,294 bytes parent folder | download
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
64
module Data.CharMap.Builder where

import Data.Map.Static.Builder

import Data.List
import Data.Ord
import Data.Char
import Data.Bits
import Data.Word

data BuildingBlock
    = SingleMapping Char [Word8]
    | RangeMapping Char Char Int [(Word8,Word8)]

charRange :: BuildingBlock -> (Char,Char)
charRange (SingleMapping c _) = (c,c)
charRange (RangeMapping s e _ _) = (s,e)

mappingLength :: BuildingBlock -> Int
mappingLength (SingleMapping _ w) = length w
mappingLength (RangeMapping _ _ _ ws) = length ws

isRange :: BuildingBlock -> Bool
isRange (SingleMapping _ _) = False
isRange (RangeMapping _ _ _ _) = True

buildCharMap :: [BuildingBlock] -> String
buildCharMap lst = let slst = sortBy (comparing (fst.charRange)) lst
                       grps = groupBy (\x y -> (not (isRange x || isRange y))
                                              && mappingLength x == mappingLength y
                                      ) slst

                       split' xs = splitAt (length xs `div` 2) xs
                       
                       build' [] _ _ = "DeadEnd"
                       build' [[RangeMapping st end off (x:xs)]] bl br
                           = let e1 = if bl < st
                                      then "Node ("++show st++") DeadEnd ("++e2++")"
                                      else e2
                                 e2 = if br>end
                                      then "Node ("++show end++") ("++e3++") DeadEnd"
                                      else e3
                                 e3 = "LeafRange"++show (length xs+1)++" ("++show (ord st - off)++") "
                                      ++show (fst x)++concat (map (\(w,r) -> " "++show w++" "++show r) xs)
                             in e1
                       build' [mps@((SingleMapping _ w):_)] bl br
                           = "LeafMap"++show (length w)++" ("
                             ++(case length w of
                                  1 -> buildStaticMap (map (\(SingleMapping c [w]) -> (c,w)) mps)
                                  2 -> buildStaticMap $ map (\(SingleMapping c [w1,w2])
                                                               -> (c,((fromIntegral w1) `shiftL` 8) .|. (fromIntegral w2)::Word16)
                                                           ) mps
                                  4 -> buildStaticMap $ map (\(SingleMapping c [w1,w2,w3,w4])
                                                                -> (c,((fromIntegral w1) `shiftL` 24)
                                                                   .|. ((fromIntegral w2) `shiftL` 16)
                                                                   .|. ((fromIntegral w3) `shiftL` 8)
                                                                   .|. (fromIntegral w4)::Word32)
                                                           ) mps)++")"
                       build' mps bl br = let (l,r@((spl:_):_)) = split' mps
                                              (el,_) = charRange spl
                                          in "Node ("++show el++") ("++build' l bl (pred el)++") ("++
                                             build' r el br++")"
                                               
                   in build' grps minBound maxBound