-
Notifications
You must be signed in to change notification settings - Fork 0
/
Copy pathClassFile.hs
289 lines (257 loc) · 7.92 KB
/
ClassFile.hs
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
65
66
67
68
69
70
71
72
73
74
75
76
77
78
79
80
81
82
83
84
85
86
87
88
89
90
91
92
93
94
95
96
97
98
99
100
101
102
103
104
105
106
107
108
109
110
111
112
113
114
115
116
117
118
119
120
121
122
123
124
125
126
127
128
129
130
131
132
133
134
135
136
137
138
139
140
141
142
143
144
145
146
147
148
149
150
151
152
153
154
155
156
157
158
159
160
161
162
163
164
165
166
167
168
169
170
171
172
173
174
175
176
177
178
179
180
181
182
183
184
185
186
187
188
189
190
191
192
193
194
195
196
197
198
199
200
201
202
203
204
205
206
207
208
209
210
211
212
213
214
215
216
217
218
219
220
221
222
223
224
225
226
227
228
229
230
231
232
233
234
235
236
237
238
239
240
241
242
243
244
245
246
247
248
249
250
251
252
253
254
255
256
257
258
259
260
261
262
263
264
265
266
267
268
269
270
271
272
273
274
275
276
277
278
279
280
281
282
283
284
285
286
287
288
289
{-# LANGUAGE RecordWildCards #-}
module ClassFile
( ClassFile(..)
, ClassName
, parse
, Method_Info(..)
, ConstantPool_Info(..)
, Attribute_Info(..)
, (!!!)
, getStringCP
, getClassCP
) where
import qualified Data.ByteString.Lazy as B
import Data.ByteString.Lazy.UTF8
import Data.Binary.Get
import Data.Word
import Control.Monad
import Control.Monad.Error
import JError
{- Specifications
http://java.sun.com/docs/books/vmspec/2nd-edition/html/ClassFile.doc.html#20080
-}
type ClassName = String
(!!!) :: Num a => [b] -> a -> b
(!!!) a b = help a (b-1)
where
help [] n = error $"!!! out of bounds (" ++ show n ++ ")"
help (x:xs) 0 = x
help (x:xs) n = xs `help` (n-1)
getTimes :: Num b => b -> Get a -> Get [a]
getTimes 0 f = return []
getTimes n f = liftM2 (:) f (getTimes (n-1) f)
{-
cp_info {
u1 tag;
u1 info[];
}
-}
data ConstantPool_Info
= C_Class_Info { name_index :: Word16 }
| C_Fieldref_Info { class_index :: Word16, name_and_type_index :: Word16 }
| C_Methodref_Info { class_index :: Word16, name_and_type_index :: Word16 }
| C_InterfaceMethodref_Info {class_index :: Word16, name_and_type_index :: Word16}
| C_String_Info { string_index :: Word16 }
| C_Integer_Info { bytes :: Word32 }
| C_Float_Info { bytes :: Word32 }
| C_Long_Info { high_bytes :: Word32, low_bytes :: Word32 }
| C_Double_Info { high_bytes :: Word32, low_bytes :: Word32 }
| C_NameAndType_Info { name_index :: Word16, descriptor_index :: Word16 }
| C_Utf8_Info { len :: Word16, ubytes :: [Word8], ustring :: String }
deriving Show
parseCP = do
tag <- getWord8
case tag of
1 -> do -- utf8
len <- getWord16be
ubytes <- read len
let ustring = toString $ B.pack ubytes
return $ C_Utf8_Info { .. }
3 -> do -- integer
bytes <- getWord32be
return $ C_Integer_Info { .. }
4 -> do -- float
bytes <- getWord32be
return $ C_Float_Info { .. }
5 -> do -- long
high_bytes <- getWord32be
low_bytes <- getWord32be
return $ C_Long_Info { .. }
6 -> do -- double
high_bytes <- getWord32be
low_bytes <- getWord32be
return $ C_Double_Info { .. }
7 -> do -- class
name_index <- getWord16be
return $ C_Class_Info { .. }
8 -> do -- string
string_index <- getWord16be
return $ C_String_Info { .. }
9 -> do -- fieldref
class_index <- getWord16be
name_and_type_index <- getWord16be
return C_Fieldref_Info { .. }
10 -> do -- methodref
class_index <- getWord16be
name_and_type_index <- getWord16be
return C_Methodref_Info { .. }
11 -> do -- interfacemethodref
class_index <- getWord16be
name_and_type_index <- getWord16be
return C_InterfaceMethodref_Info { .. }
12 -> do -- nameandtype
name_index <- getWord16be
descriptor_index <- getWord16be
return $ C_NameAndType_Info { .. }
n -> error $ "Unknown tag: " ++ show n
where
read :: Word16 -> Get [Word8]
read 0 = return []
read n = liftM2 (:) getWord8 (read (n-1))
{-
field_info {
u2 access_flags;
u2 name_index;
u2 descriptor_index;
u2 attributes_count;
attribute_info attributes[attributes_count];
}
-}
data Field_Info = FI
{ f_access_flags :: Word16
, f_name_index :: Word16
, f_descriptor_index :: Word16
, f_attribute_count :: Word16
, f_attribute_info :: [Attribute_Info]
}
deriving Show
parseField :: [ConstantPool_Info] -> Get Field_Info
parseField cpi = do
f_access_flags <- getWord16be
f_name_index <- getWord16be
f_descriptor_index <- getWord16be
f_attribute_count <- getWord16be
f_attribute_info <- getTimes f_attribute_count (parseAttribute cpi)
return FI {..}
{-
method_info {
u2 access_flags;
u2 name_index;
u2 descriptor_index;
u2 attributes_count;
attribute_info attributes[attributes_count];
}
-}
data Method_Info = MI
{ m_access_flags :: Word16
, m_name_index :: Word16
, m_descriptor_index :: Word16
, m_attributes_count :: Word16
, m_attributes_info :: [Attribute_Info]
}
deriving Show
parseMethod :: [ConstantPool_Info] -> Get Method_Info
parseMethod cpi = do
m_access_flags <- getWord16be
m_name_index <- getWord16be
m_descriptor_index <- getWord16be
m_attributes_count <- getWord16be
m_attributes_info <- getTimes m_attributes_count (parseAttribute cpi)
return MI {..}
{-
attribute_info {
u2 attribute_name_index;
u4 attribute_length;
u1 info[attribute_length];
}
-}
data Attribute_Info =
AI { attribute_name_index :: Word16
, attribute_length :: Word32
, attribute_data :: [Word8]
}
| CAI { max_stack :: Word16
, max_locals :: Word16
, code_length :: Word32
, code :: [Word8]
, exception_table_length :: Word16
, exception_table :: [ExceptionTable]
, c_attributes_count :: Word16
, c_attributes_info :: [Attribute_Info]
}
deriving Show
data ExceptionTable = ET
{ start_pc :: Word16
, end_pc :: Word16
, handler_pc :: Word16
, catch_type :: Word16
}
deriving Show
parseExceptionTable :: Get ExceptionTable
parseExceptionTable = do
start_pc <- getWord16be
end_pc <- getWord16be
handler_pc <- getWord16be
catch_type <- getWord16be
return ET {..}
parseAttribute :: [ConstantPool_Info] -> Get Attribute_Info
parseAttribute cpi = do
attribute_name_index <- getWord16be
attribute_length <- getWord32be
case cpi !!! attribute_name_index of
C_Utf8_Info _ _ a | a == "Code" -> do
max_stack <- getWord16be
max_locals <- getWord16be
code_length <- getWord32be
code <- getTimes code_length getWord8
exception_table_length <- getWord16be
exception_table <- getTimes exception_table_length parseExceptionTable
c_attributes_count <- getWord16be
c_attributes_info <- getTimes c_attributes_count (parseAttribute cpi)
return CAI {..}
_ -> do
attribute_data <- getTimes attribute_length getWord8
return AI {..}
data ClassFile = CF
{ magic :: Word32
, minor_version :: Word16
, major_version :: Word16
, constant_pool_count :: Word16
, cp_info :: [ConstantPool_Info]
, access_flags :: Word16
, this_class :: Word16
, super_class :: Word16
, interfaces_count :: Word16
, interfaces :: [Word16]
, fields_count :: Word16
, fields :: [Field_Info]
, methods_count :: Word16
, methods :: [Method_Info]
, attributes_count :: Word16
, attributes :: [Attribute_Info]
}
deriving Show
parseCF :: Get ClassFile
parseCF = do
magic <- getWord32be
minor_version <- getWord16be
major_version <- getWord16be
constant_pool_count <- getWord16be
cp_info <- getTimes (constant_pool_count-1) parseCP
access_flags <- getWord16be
this_class <- getWord16be
super_class <- getWord16be
interfaces_count <- getWord16be
interfaces <- getTimes interfaces_count getWord16be
fields_count <- getWord16be
fields <- getTimes fields_count (parseField cp_info)
methods_count <- getWord16be
methods <- getTimes methods_count (parseMethod cp_info)
attributes_count <- getWord16be
attributes <- getTimes attributes_count (parseAttribute cp_info)
return CF {..}
parse :: FilePath -> IO (Either JError ClassFile)
parse classFile = flip catch (\_ -> return $ throwError ErrorLoadClass) $ do
input <- B.readFile classFile
return . Right $ runGet parseCF input
getStringCP :: ClassFile -> Int -> String
getStringCP cf i = case (cp_info cf) !!! i of
C_String_Info i -> getString cf i
getClassCP :: ClassFile -> Int -> ClassName
getClassCP cf i = case cp_info cf !!! i of
C_Class_Info n -> getString cf n ++ ".class"
x -> error $ "getClassCP: " ++ show x
getString :: ClassFile -> Word16 -> String
getString cf i = case cp_info cf !!! i of
C_Class_Info n -> getString cf n
x -> ustring x