10898
|
1 |
module Main where
|
|
2 |
|
|
3 |
import Text.PrettyPrint.HughesPJ
|
10904
|
4 |
import qualified Data.MultiMap as MM
|
|
5 |
import Data.Maybe
|
|
6 |
import Data.List
|
10927
|
7 |
import Data.Char
|
11047
|
8 |
import qualified Data.Set as Set
|
10898
|
9 |
|
|
10 |
data HWProtocol = Command String [CmdParam]
|
11048
|
11 |
|
|
12 |
instance Ord HWProtocol where
|
|
13 |
(Command a _) `compare` (Command b _) = a `compare` b
|
|
14 |
instance Eq HWProtocol where
|
|
15 |
(Command a _) == (Command b _) = a == b
|
|
16 |
|
10898
|
17 |
data CmdParam = Skip
|
|
18 |
| SS
|
|
19 |
| LS
|
|
20 |
| IntP
|
|
21 |
| Many [CmdParam]
|
|
22 |
data ClientStates = NotConnected
|
|
23 |
| JustConnected
|
|
24 |
| ServerAuth
|
|
25 |
| Lobby
|
|
26 |
|
10906
|
27 |
data ParseTree = PTPrefix String [ParseTree]
|
10927
|
28 |
| PTCommand String HWProtocol
|
10902
|
29 |
|
10898
|
30 |
cmd = Command
|
|
31 |
cmd1 s p = Command s [p]
|
|
32 |
cmd2 s p1 p2 = Command s [p1, p2]
|
|
33 |
|
11047
|
34 |
cmdParams2str (Command _ p) = "TCmdParam" ++ concatMap f p
|
|
35 |
where
|
|
36 |
f Skip = ""
|
|
37 |
f SS = "S"
|
|
38 |
f LS = "L"
|
|
39 |
f IntP = "i"
|
|
40 |
f (Many p) = ""
|
11048
|
41 |
|
|
42 |
cmdParams2handlerType (Command _ p) = "handler_" ++ concatMap f p
|
|
43 |
where
|
|
44 |
f Skip = "_"
|
|
45 |
f SS = "S"
|
|
46 |
f LS = "L"
|
|
47 |
f IntP = "i"
|
|
48 |
f (Many p) = 'M' : concatMap f p
|
11050
|
49 |
|
11047
|
50 |
cmdParams2record cmd@(Command _ p) = renderStyle style{lineLength = 80} $
|
|
51 |
text "type " <> text (cmdParams2str cmd)
|
|
52 |
<> text " = record" $+$ nest 4 (
|
|
53 |
vcat (map (uncurry f) $ zip [1..] $ filter isRendered p)
|
|
54 |
$+$ text "end;")
|
|
55 |
where
|
|
56 |
isRendered Skip = False
|
|
57 |
isRendered (Many _) = False
|
|
58 |
isRendered _ = True
|
|
59 |
f n Skip = empty
|
|
60 |
f n SS = text "str" <> int n <> text ": shortstring;"
|
|
61 |
f n LS = text "str" <> int n <> text ": longstring;"
|
|
62 |
f n IntP = text "param" <> int n <> text ": LongInt;"
|
|
63 |
f _ (Many _) = empty
|
|
64 |
|
|
65 |
commandsDescription = [
|
10898
|
66 |
cmd "CONNECTED" [Skip, IntP]
|
|
67 |
, cmd1 "NICK" SS
|
|
68 |
, cmd1 "PROTO" IntP
|
|
69 |
, cmd1 "ASKPASSWORD" SS
|
|
70 |
, cmd1 "SERVER_AUTH" SS
|
10904
|
71 |
, cmd1 "JOINING" SS
|
10929
|
72 |
, cmd1 "TEAM_ACCEPTED" SS
|
|
73 |
, cmd1 "HH_NUM" $ Many [SS]
|
|
74 |
, cmd1 "TEAM_COLOR" $ Many [SS]
|
|
75 |
, cmd1 "TEAM_ACCEPTED" SS
|
10904
|
76 |
, cmd1 "BANLIST" $ Many [SS]
|
|
77 |
, cmd1 "JOINED" $ Many [SS]
|
10898
|
78 |
, cmd1 "LOBBY:JOINED" $ Many [SS]
|
10904
|
79 |
, cmd2 "LOBBY:LEFT" SS LS
|
|
80 |
, cmd2 "CLIENT_FLAGS" SS $ Many [SS]
|
|
81 |
, cmd2 "LEFT" SS $ Many [SS]
|
10902
|
82 |
, cmd1 "SERVER_MESSAGE" LS
|
11050
|
83 |
, cmd1 "ERROR" LS
|
10929
|
84 |
, cmd1 "NOTICE" LS
|
|
85 |
, cmd1 "WARNING" LS
|
10904
|
86 |
, cmd1 "EM" $ Many [LS]
|
|
87 |
, cmd1 "PING" $ Many [SS]
|
|
88 |
, cmd2 "CHAT" SS LS
|
|
89 |
, cmd2 "SERVER_VARS" SS LS
|
|
90 |
, cmd2 "BYE" SS LS
|
10908
|
91 |
, cmd1 "INFO" $ Many [SS]
|
10929
|
92 |
, cmd1 "ROOMS" $ Many [SS]
|
10904
|
93 |
, cmd "KICKED" []
|
10929
|
94 |
, cmd "RUN_GAME" []
|
|
95 |
, cmd "ROUND_FINISHED" []
|
10898
|
96 |
]
|
|
97 |
|
10929
|
98 |
unknowncmd = PTPrefix "$" [PTCommand "$" $ Command "__UNKNOWN__" [Many [SS]]]
|
|
99 |
|
10927
|
100 |
groupByFirstChar :: [ParseTree] -> [(Char, [ParseTree])]
|
10904
|
101 |
groupByFirstChar = MM.assocs . MM.fromList . map breakCmd
|
11050
|
102 |
where
|
|
103 |
breakCmd (PTCommand (c:cs) params) = (c, PTCommand cs params)
|
10902
|
104 |
|
10927
|
105 |
makePT cmd@(Command n p) = PTCommand n cmd
|
|
106 |
|
10929
|
107 |
buildParseTree cmds = [PTPrefix "!" $ (bpt $ map makePT cmds) ++ [unknowncmd]]
|
11050
|
108 |
bpt cmds = if not . null $ fst emptyNamed then cmdLeaf emptyNamed else subtree
|
10904
|
109 |
where
|
11050
|
110 |
emptyNamed = partition (\(_, (PTCommand n _:_)) -> null n) assocs
|
10904
|
111 |
assocs = groupByFirstChar cmds
|
10906
|
112 |
subtree = map buildsub assocs
|
10925
|
113 |
buildsub (c, cmds) = let st = bpt cmds in if null $ drop 1 st then maybeMerge c st else PTPrefix [c] st
|
10927
|
114 |
maybeMerge c cmd@[PTCommand {}] = PTPrefix [c] cmd
|
10906
|
115 |
maybeMerge c cmd@[PTPrefix s ss] = PTPrefix (c:s) ss
|
11050
|
116 |
cmdLeaf ([(c, (hwc:_))], assocs2) = (PTPrefix [c] [hwc]) : map buildsub assocs2
|
10906
|
117 |
|
|
118 |
dumpTree = vcat . map dt
|
|
119 |
where
|
|
120 |
dt (PTPrefix s st) = text s $$ (nest 1 $ vcat $ map dt st)
|
|
121 |
dt _ = empty
|
10904
|
122 |
|
11047
|
123 |
pas2 = buildSwitch $ buildParseTree commandsDescription
|
10906
|
124 |
where
|
|
125 |
buildSwitch cmds = text "case getNextChar of" $$ (nest 4 . vcat $ map buildCase cmds) $$ elsePart
|
10927
|
126 |
buildCase (PTCommand {}) = text "#10: <call cmd handler>;"
|
10906
|
127 |
buildCase (PTPrefix (s:ss) cmds) = quotes (char s) <> text ": " <> consumePrefix ss (buildSwitch cmds)
|
|
128 |
consumePrefix "" = id
|
|
129 |
consumePrefix str = (text "consume" <> (parens . quotes $ text str) <> semi $$)
|
|
130 |
zeroChar = text "#0: state:= pstDisconnected;"
|
|
131 |
elsePart = text "else <unknown cmd> end;"
|
10904
|
132 |
|
11047
|
133 |
renderArrays (letters, commands, handlers) = vcat $ punctuate (char '\n') [cmds, l, s, bodies, c, structs]
|
10908
|
134 |
where
|
11048
|
135 |
maybeQuotes "$" = text "#0"
|
10925
|
136 |
maybeQuotes s = if null $ tail s then quotes $ text s else text s
|
|
137 |
l = text "const letters: array[0.." <> (int $ length letters - 1) <> text "] of char = "
|
|
138 |
<> parens (hsep . punctuate comma $ map maybeQuotes letters) <> semi
|
|
139 |
s = text "const commands: array[0.." <> (int $ length commands - 1) <> text "] of integer = "
|
|
140 |
<> parens (hsep . punctuate comma $ map text commands) <> semi
|
10929
|
141 |
c = text "const handlers: array[0.." <> (int $ length fixedNames - 1) <> text "] of PHandler = "
|
11048
|
142 |
<> parens (hsep . punctuate comma $ map (text . (:) '@') handlerTypes) <> semi
|
|
143 |
handlerTypes = map cmdParams2handlerType . reverse $ sort commandsDescription
|
10929
|
144 |
fixedNames = map fixName handlers
|
10927
|
145 |
fixName = map fixChar
|
|
146 |
fixChar c | isLetter c = c
|
|
147 |
| otherwise = '_'
|
10929
|
148 |
bodies = vcat $ punctuate (char '\n') $ map handlerBody fixedNames
|
|
149 |
handlerBody n = text "procedure handler_" <> text n <> semi
|
|
150 |
$+$ text "begin"
|
|
151 |
$+$ text "end" <> semi
|
10933
|
152 |
cmds = text "type TCmdType = " <> parens (hsep $ punctuate comma $ map ((<>) (text "cmd_") . text) $ reverse fixedNames) <> semi
|
11047
|
153 |
structs = vcat (map text . Set.toList . Set.fromList $ map cmdParams2record commandsDescription)
|
10908
|
154 |
|
11047
|
155 |
pas = renderArrays $ buildTables $ buildParseTree commandsDescription
|
10925
|
156 |
where
|
10927
|
157 |
buildTables cmds = let (_, _, _, t1, t2, t3) = foldr walk (0, [0], -10, [], [], [[]]) cmds in (tail t1, tail t2, concat t3)
|
|
158 |
walk (PTCommand _ (Command n params)) (lc, s:sh, pc, tbl1, tbl2, (t3:tbl3)) =
|
10931
|
159 |
(lc, 1:sh, pc - 1, "#10":tbl1, show pc:tbl2, (n:t3):tbl3)
|
10925
|
160 |
walk (PTPrefix prefix cmds) l = lvldown $ foldr fpf (foldr walk (lvlup l) cmds) prefix
|
10927
|
161 |
lvlup (lc, sh, pc, tbl1, tbl2, tbl3) = (lc, 0:sh, pc, tbl1, tbl2, []:tbl3)
|
|
162 |
lvldown (lc, s1:s2:sh, pc, tbl1, t:tbl2, t31:t32:tbl3) = (lc, s1+s2:sh, pc, tbl1, (if null t32 then "0" else show s1):tbl2, (t31 ++ t32):tbl3)
|
|
163 |
fpf c (lc, s:sh, pc, tbl1, tbl2, tbl3) = (lc + 1, s+1:sh, pc, [c]:tbl1, "0":tbl2, tbl3)
|
10925
|
164 |
|
11050
|
165 |
main =
|
|
166 |
putStrLn $ renderStyle style{lineLength = 80} $ pas
|
|
167 |
--putStrLn $ renderStyle style{lineLength = 80} $ dumpTree $ buildParseTree commandsDescription
|