X-Git-Url: http://wien.tomnetworks.com/gitweb/?a=blobdiff_plain;f=JVM%2FConverter.hs;h=0c26dd156c0e91afcf6c638106fc651ea9a53933;hb=368ce628bdf8a7fa772a6860aed12f00baea3906;hp=4fb0ec309f6608bf12494c3c4f7559bc31a73ddc;hpb=8876aca404b4c111461b7582bb772d219babd3aa;p=hs-java.git diff --git a/JVM/Converter.hs b/JVM/Converter.hs index 4fb0ec3..0c26dd1 100644 --- a/JVM/Converter.hs +++ b/JVM/Converter.hs @@ -3,7 +3,7 @@ -- high-level Java classes, methods etc representation module JVM.Converter (parseClass, parseClassFile, - convertClass, classFile, + classFile2Direct, classDirect2File, encodeClass, methodByName, attrByName, @@ -16,170 +16,184 @@ import Data.List import Data.Word import Data.Bits import Data.Binary +import Data.Default () -- import instances only import qualified Data.ByteString.Lazy as B -import Data.Array +import qualified Data.ByteString.Lazy.Char8 () import qualified Data.Set as S import qualified Data.Map as M import JVM.ClassFile -import JVM.Types +import JVM.Common import JVM.Exceptions -- | Parse .class file data -parseClass :: B.ByteString -> Class -parseClass bstr = convertClass $ decode bstr +parseClass :: B.ByteString -> Class Direct +parseClass bstr = classFile2Direct $ decode bstr -- | Parse class data from file -parseClassFile :: FilePath -> IO Class -parseClassFile path = convertClass `fmap` decodeFile path +parseClassFile :: FilePath -> IO (Class Direct) +parseClassFile path = classFile2Direct `fmap` decodeFile path -encodeClass :: Class -> B.ByteString -encodeClass cls = encode $ classFile cls +encodeClass :: (Class Direct) -> B.ByteString +encodeClass cls = encode $ classDirect2File cls -convertClass :: ClassFile -> Class -convertClass (ClassFile {..}) = - let pool = constantPoolArray constsPool +classFile2Direct :: Class File -> Class Direct +classFile2Direct (Class {..}) = + let pool = poolFile2Direct constsPool superName = className $ pool ! superClass - in Class { - constantPool = pool, - classAccess = convertAccess accessFlags, - this = className $ pool ! thisClass, - super = if superClass == 0 then Nothing else Just superName, - implements = map (\i -> className $ pool ! i) interfaces, - fields = map (convertField pool) classFields, - methods = map (convertMethod pool) classMethods, - classAttrs = convertAttrs pool classAttributes } - -classFile :: Class -> ClassFile -classFile (Class {..}) = ClassFile { - magic = 0xCAFEBABE, - minorVersion = 0, - majorVersion = 50, - constsPoolSize = fromIntegral (length poolInfo + 1), + d = defaultClass :: Class Direct + in d { + constsPoolSize = fromIntegral (M.size pool), + constsPool = pool, + accessFlags = accessFile2Direct accessFlags, + thisClass = className $ pool ! thisClass, + superClass = if superClass == 0 then "" else superName, + interfacesCount = interfacesCount, + interfaces = map (\i -> className $ pool ! i) interfaces, + classFieldsCount = classFieldsCount, + classFields = map (fieldFile2Direct pool) classFields, + classMethodsCount = classMethodsCount, + classMethods = map (methodFile2Direct pool) classMethods, + classAttributesCount = classAttributesCount, + classAttributes = attributesFile2Direct pool classAttributes } + +classDirect2File :: Class Direct -> Class File +classDirect2File (Class {..}) = + let d = defaultClass :: Class File + in d { + constsPoolSize = fromIntegral (M.size poolInfo + 1), constsPool = poolInfo, - accessFlags = access2word16 classAccess, - thisClass = force "this" $ poolClassIndex poolInfo this, - superClass = case super of - Just s -> force "super" $ poolClassIndex poolInfo s - Nothing -> 0, - interfacesCount = fromIntegral (length implements), - interfaces = map (force "ifaces" . poolIndex poolInfo) implements, - classFieldsCount = fromIntegral (length fields), - classFields = map (fieldInfo poolInfo) fields, - classMethodsCount = fromIntegral (length methods), - classMethods = map (methodInfo poolInfo) methods, - classAttributesCount = fromIntegral (M.size classAttrs), - classAttributes = map (attrInfo poolInfo) (M.assocs classAttrs) } + accessFlags = accessDirect2File accessFlags, + thisClass = force "this" $ poolClassIndex poolInfo thisClass, + superClass = force "super" $ poolClassIndex poolInfo superClass, + interfacesCount = fromIntegral (length interfaces), + interfaces = map (force "ifaces" . poolIndex poolInfo) interfaces, + classFieldsCount = fromIntegral (length classFields), + classFields = map (fieldDirect2File poolInfo) classFields, + classMethodsCount = fromIntegral (length classMethods), + classMethods = map (methodDirect2File poolInfo) classMethods, + classAttributesCount = fromIntegral $ arsize classAttributes, + classAttributes = to (arlist classAttributes) } where - poolInfo = toCPInfo constantPool + poolInfo = poolDirect2File constsPool + to :: [(B.ByteString, B.ByteString)] -> Attributes File + to pairs = AP (map (attrInfo poolInfo) pairs) -toCPInfo :: Pool -> [CpInfo] -toCPInfo pool = result +poolDirect2File :: Pool Direct -> Pool File +poolDirect2File pool = result where - result = map cpInfo $ elems pool + result = M.map cpInfo pool - cpInfo (CClass name) = CONSTANT_Class (force "class" $ poolIndex result name) + cpInfo :: Constant Direct -> Constant File + cpInfo (CClass name) = CClass (force "class" $ poolIndex result name) cpInfo (CField cls name) = - CONSTANT_Fieldref (force "field a" $ poolClassIndex result cls) (force "field b" $ poolNTIndex result name) + CField (force "field a" $ poolClassIndex result cls) (force "field b" $ poolNTIndex result name) cpInfo (CMethod cls name) = - CONSTANT_Methodref (force "method a" $ poolClassIndex result cls) (force ("method b: " ++ show name) $ poolNTIndex result name) + CMethod (force "method a" $ poolClassIndex result cls) (force ("method b: " ++ show name) $ poolNTIndex result name) cpInfo (CIfaceMethod cls name) = - CONSTANT_InterfaceMethodref (force "iface method a" $ poolIndex result cls) (force "iface method b" $ poolNTIndex result name) - cpInfo (CString s) = CONSTANT_String (force "string" $ poolIndex result s) - cpInfo (CInteger x) = CONSTANT_Integer x - cpInfo (CFloat x) = CONSTANT_Float x - cpInfo (CLong x) = CONSTANT_Long (fromIntegral x) - cpInfo (CDouble x) = CONSTANT_Double x + CIfaceMethod (force "iface method a" $ poolIndex result cls) (force "iface method b" $ poolNTIndex result name) + cpInfo (CString s) = CString (force "string" $ poolIndex result s) + cpInfo (CInteger x) = CInteger x + cpInfo (CFloat x) = CFloat x + cpInfo (CLong x) = CLong (fromIntegral x) + cpInfo (CDouble x) = CDouble x cpInfo (CNameType n t) = - CONSTANT_NameAndType (force "name" $ poolIndex result n) (force "type" $ poolIndex result t) - cpInfo (CUTF8 s) = CONSTANT_Utf8 (fromIntegral $ B.length s) s - cpInfo (CUnicode s) = CONSTANT_Unicode (fromIntegral $ B.length s) s + CNameType (force "name" $ poolIndex result n) (force "type" $ poolIndex result t) + cpInfo (CUTF8 s) = CUTF8 s + cpInfo (CUnicode s) = CUnicode s -- | Find index of given string in the list of constants -poolIndex :: (Throws NoItemInPool e) => [CpInfo] -> B.ByteString -> EM e Word16 -poolIndex list name = case findIndex test list of +poolIndex :: (Throws NoItemInPool e) => Pool File -> B.ByteString -> EM e Word16 +poolIndex list name = case findIndex test (M.elems list) of Nothing -> throw (NoItemInPool name) Just i -> return $ fromIntegral $ i+1 where - test (CONSTANT_Utf8 _ s) | s == name = True - test (CONSTANT_Unicode _ s) | s == name = True + test (CUTF8 s) | s == name = True + test (CUnicode s) | s == name = True test _ = False -- | Find index of given string in the list of constants -poolClassIndex :: (Throws NoItemInPool e) => [CpInfo] -> B.ByteString -> EM e Word16 -poolClassIndex list name = case findIndex checkString list of +poolClassIndex :: (Throws NoItemInPool e) => Pool File -> B.ByteString -> EM e Word16 +poolClassIndex list name = case findIndex checkString (M.elems list) of Nothing -> throw (NoItemInPool name) - Just i -> case findIndex (checkClass $ fromIntegral $ i+1) list of + Just i -> case findIndex (checkClass $ fromIntegral $ i+1) (M.elems list) of Nothing -> throw (NoItemInPool $ i+1) Just j -> return $ fromIntegral $ j+1 where - checkString (CONSTANT_Utf8 _ s) | s == name = True - checkString (CONSTANT_Unicode _ s) | s == name = True + checkString (CUTF8 s) | s == name = True + checkString (CUnicode s) | s == name = True checkString _ = False - checkClass i (CONSTANT_Class x) | i == x = True + checkClass i (CClass x) | i == x = True checkClass _ _ = False poolNTIndex list x@(NameType n t) = do ni <- poolIndex list n ti <- poolIndex list (byteString t) - case findIndex (check ni ti) list of + case findIndex (check ni ti) (M.elems list) of Nothing -> throw (NoItemInPool x) Just i -> return $ fromIntegral (i+1) where - check ni ti (CONSTANT_NameAndType n' t') + check ni ti (CNameType n' t') | (ni == n') && (ti == t') = True check _ _ _ = False -fieldInfo :: [CpInfo] -> Field -> FieldInfo -fieldInfo pool (Field {..}) = FieldInfo { - fieldAccessFlags = access2word16 fieldAccess, - fieldNameIndex = force "field name" $ poolIndex pool fieldName, - fieldSignatureIndex = force "signature" $ poolIndex pool (encode fieldSignature), - fieldAttributesCount = fromIntegral (M.size fieldAttrs), - fieldAttributes = map (attrInfo pool) (M.assocs fieldAttrs) } - -methodInfo :: [CpInfo] -> Method -> MethodInfo -methodInfo pool (Method {..}) = MethodInfo { - methodAccessFlags = access2word16 methodAccess, - methodNameIndex = force "method name" $ poolIndex pool methodName, - methodSignatureIndex = force "method sig" $ poolIndex pool (encode methodSignature), - methodAttributesCount = fromIntegral (M.size methodAttrs), - methodAttributes = map (attrInfo pool) (M.assocs methodAttrs) } - -attrInfo :: [CpInfo] -> (B.ByteString, B.ByteString) -> AttributeInfo -attrInfo pool (name, value) = AttributeInfo { +fieldDirect2File :: Pool File -> Field Direct -> Field File +fieldDirect2File pool (Field {..}) = Field { + fieldAccessFlags = accessDirect2File fieldAccessFlags, + fieldName = force "field name" $ poolIndex pool fieldName, + fieldSignature = force "signature" $ poolIndex pool (encode fieldSignature), + fieldAttributesCount = fromIntegral (arsize fieldAttributes), + fieldAttributes = to (arlist fieldAttributes) } + where + to :: [(B.ByteString, B.ByteString)] -> Attributes File + to pairs = AP (map (attrInfo pool) pairs) + +methodDirect2File :: Pool File -> Method Direct -> Method File +methodDirect2File pool (Method {..}) = Method { + methodAccessFlags = accessDirect2File methodAccessFlags, + methodName = force "method name" $ poolIndex pool methodName, + methodSignature = force "method sig" $ poolIndex pool (encode methodSignature), + methodAttributesCount = fromIntegral (arsize methodAttributes), + methodAttributes = to (arlist methodAttributes) } + where + to :: [(B.ByteString, B.ByteString)] -> Attributes File + to pairs = AP (map (attrInfo pool) pairs) + +attrInfo :: Pool File -> (B.ByteString, B.ByteString) -> Attribute +attrInfo pool (name, value) = Attribute { attributeName = force "attr name" $ poolIndex pool name, attributeLength = fromIntegral (B.length value), attributeValue = value } -constantPoolArray :: [CpInfo] -> Pool -constantPoolArray list = pool +poolFile2Direct :: Pool File -> Pool Direct +poolFile2Direct ps = pool where - pool :: Pool - pool = listArray (1,n) $ map convert list - n = fromIntegral $ length list + pool :: Pool Direct + pool = M.map convert ps - convertNameType :: (HasSignature a, Binary (Signature a)) => Word16 -> NameType a + n = fromIntegral $ M.size ps + + convertNameType :: (HasSignature a) => Word16 -> NameType a convertNameType i = let (CNameType n s) = pool ! i in NameType n (decode s) - convert (CONSTANT_Class i) = CClass $ getString $ pool ! i - convert (CONSTANT_Fieldref i j) = CField (className $ pool ! i) (convertNameType j) - convert (CONSTANT_Methodref i j) = CMethod (className $ pool ! i) (convertNameType j) - convert (CONSTANT_InterfaceMethodref i j) = CIfaceMethod (className $ pool ! i) (convertNameType j) - convert (CONSTANT_String i) = CString $ getString $ pool ! i - convert (CONSTANT_Integer x) = CInteger x - convert (CONSTANT_Float x) = CFloat x - convert (CONSTANT_Long x) = CLong (fromIntegral x) - convert (CONSTANT_Double x) = CDouble x - convert (CONSTANT_NameAndType i j) = CNameType (getString $ pool ! i) (getString $ pool ! j) - convert (CONSTANT_Utf8 _ bs) = CUTF8 bs - convert (CONSTANT_Unicode _ bs) = CUnicode bs - -convertAccess :: Word16 -> Access -convertAccess w = S.fromList $ concat $ zipWith (\i f -> if testBit w i then [f] else []) [0..] $ [ + convert (CClass i) = CClass $ getString $ pool ! i + convert (CField i j) = CField (className $ pool ! i) (convertNameType j) + convert (CMethod i j) = CMethod (className $ pool ! i) (convertNameType j) + convert (CIfaceMethod i j) = CIfaceMethod (className $ pool ! i) (convertNameType j) + convert (CString i) = CString $ getString $ pool ! i + convert (CInteger x) = CInteger x + convert (CFloat x) = CFloat x + convert (CLong x) = CLong (fromIntegral x) + convert (CDouble x) = CDouble x + convert (CNameType i j) = CNameType (getString $ pool ! i) (getString $ pool ! j) + convert (CUTF8 bs) = CUTF8 bs + convert (CUnicode bs) = CUnicode bs + +accessFile2Direct :: AccessFlags File -> AccessFlags Direct +accessFile2Direct w = S.fromList $ concat $ zipWith (\i f -> if testBit w i then [f] else []) [0..] $ [ ACC_PUBLIC, ACC_PRIVATE, ACC_PROTECTED, @@ -192,43 +206,48 @@ convertAccess w = S.fromList $ concat $ zipWith (\i f -> if testBit w i then [f] ACC_INTERFACE, ACC_ABSTRACT ] -access2word16 :: Access -> Word16 -access2word16 fs = bitsOr $ map toBit $ S.toList fs +accessDirect2File :: AccessFlags Direct -> AccessFlags File +accessDirect2File fs = bitsOr $ map toBit $ S.toList fs where bitsOr = foldl (.|.) 0 toBit f = 1 `shiftL` (fromIntegral $ fromEnum f) -convertField :: Pool -> FieldInfo -> Field -convertField pool (FieldInfo {..}) = Field { - fieldAccess = convertAccess fieldAccessFlags, - fieldName = getString $ pool ! fieldNameIndex, - fieldSignature = decode $ getString $ pool ! fieldSignatureIndex, - fieldAttrs = convertAttrs pool fieldAttributes } - -convertMethod :: Pool -> MethodInfo -> Method -convertMethod pool (MethodInfo {..}) = Method { - methodAccess = convertAccess methodAccessFlags, - methodName = getString $ pool ! methodNameIndex, - methodSignature = decode $ getString $ pool ! methodSignatureIndex, - methodAttrs = convertAttrs pool methodAttributes } - -convertAttrs :: Pool -> [AttributeInfo] -> Attributes -convertAttrs pool attrs = M.fromList $ map go attrs +fieldFile2Direct :: Pool Direct -> Field File -> Field Direct +fieldFile2Direct pool (Field {..}) = Field { + fieldAccessFlags = accessFile2Direct fieldAccessFlags, + fieldName = getString $ pool ! fieldName, + fieldSignature = decode $ getString $ pool ! fieldSignature, + fieldAttributesCount = fromIntegral (apsize fieldAttributes), + fieldAttributes = attributesFile2Direct pool fieldAttributes } + +methodFile2Direct :: Pool Direct -> Method File -> Method Direct +methodFile2Direct pool (Method {..}) = Method { + methodAccessFlags = accessFile2Direct methodAccessFlags, + methodName = getString $ pool ! methodName, + methodSignature = decode $ getString $ pool ! methodSignature, + methodAttributesCount = fromIntegral (apsize methodAttributes), + methodAttributes = attributesFile2Direct pool methodAttributes } + +attributesFile2Direct :: Pool Direct -> Attributes File -> Attributes Direct +attributesFile2Direct pool (AP attrs) = AR (M.fromList $ map go attrs) where - go (AttributeInfo {..}) = (getString $ pool ! attributeName, - attributeValue) + go :: Attribute -> (B.ByteString, B.ByteString) + go (Attribute {..}) = (getString $ pool ! attributeName, + attributeValue) -- | Try to get class method by name -methodByName :: Class -> B.ByteString -> Maybe Method +methodByName :: Class Direct -> B.ByteString -> Maybe (Method Direct) methodByName cls name = - find (\m -> methodName m == name) (methods cls) + find (\m -> methodName m == name) (classMethods cls) -- | Try to get object attribute by name -attrByName :: (HasAttributes a) => a -> B.ByteString -> Maybe B.ByteString -attrByName x name = M.lookup name (attributes x) +attrByName :: (HasAttributes a) => a Direct -> B.ByteString -> Maybe B.ByteString +attrByName x name = + let (AR m) = attributes x + in M.lookup name m -- | Try to get Code for class method (no Code for interface methods) -methodCode :: Class +methodCode :: Class Direct -> B.ByteString -- ^ Method name -> Maybe B.ByteString methodCode cls name = do