javaclass-0.0.1: Java class files

Safe HaskellNone
LanguageHaskell2010

Language.Java.Class.ClassFile

Synopsis

Documentation

data ClassFile p c i a f s m b t d u Source

Instances

(Eq (ConstantPool p c), Eq (Interfaces i), Eq (Fields a f s), Eq (Methods m b t), Eq (Attributes d u)) => Eq (ClassFile p c i a f s m b t d u) Source 
(Ord (ConstantPool p c), Ord (Interfaces i), Ord (Fields a f s), Ord (Methods m b t), Ord (Attributes d u)) => Ord (ClassFile p c i a f s m b t d u) Source 
(Show (ConstantPool p c), Show (Interfaces i), Show (Fields a f s), Show (Methods m b t), Show (Attributes d u)) => Show (ClassFile p c i a f s m b t d u) Source 

type ClassFile' x = ClassFile x x x x x x x x x x x Source

data ClassFileError c Source

Instances

(Choice p, Applicative f) => AsConstantPoolInvalidJavaString p f ClassFileError Source 
(Choice p, Applicative f) => AsConstantPoolConstantPoolInfoError p f ClassFileError Source 
(Choice p, Applicative f) => AsClassFileConstantPoolError p f ClassFileError Source 
(Choice p, Applicative f) => AsVersionMajorUnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsVersionMinorUnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsThisClassUnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsThisAccessFlagsUnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsSuperClassUnexpectedEof p f (ClassFileError c) Source 
((~) (* -> * -> *) p (->), Applicative f) => AsMethodAccessFlagsUnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsInterfacesUnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsInterfacesCountUnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsConstantPoolInfoInvalidConstantPoolTag p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsConstantPoolInfoNameAndType2UnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsConstantPoolInfoNameAndType1UnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsConstantPoolInfoInterfaceMethodRef2UnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsConstantPoolInfoInterfaceMethodRef1UnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsConstantPoolInfoMethodRef2UnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsConstantPoolInfoMethodRef1UnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsConstantPoolInfoFieldRef2UnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsConstantPoolInfoFieldRef1UnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsConstantPoolInfoConstantStringUnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsConstantPoolInfoConstantClassUnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsConstantPoolInfoConstantDoubleUnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsConstantPoolInfoConstantLongUnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsConstantPoolInfoConstantFloatUnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsConstantPoolInfoConstantIntegerUnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsConstantPoolInfoUtf8UnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsConstantPoolInfoUtf8LengthUnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsConstantPoolInfoTagUnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsConstantPoolCountUnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsCafebabeInvalidMagicNumber p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsCafebabeUnexpectedEof p f (ClassFileError c) Source 
((~) (* -> * -> *) p (->), Applicative f) => AsAttributeUnexpectedEof p f (ClassFileError c) Source 
((~) (* -> * -> *) p (->), Applicative f) => AsAttributeLengthUnexpectedEof p f (ClassFileError c) Source 
((~) (* -> * -> *) p (->), Applicative f) => AsAttributeNameIndexUnexpectedEof p f (ClassFileError c) Source 
((~) (* -> * -> *) p (->), Applicative f) => AsAttributesAttributeError p f (ClassFileError c) Source 
((~) (* -> * -> *) p (->), Applicative f) => AsAttributesInfoUnexpectedEof p f (ClassFileError c) Source 
((~) (* -> * -> *) p (->), Applicative f) => AsFieldAttributeError p f (ClassFileError c) Source 
((~) (* -> * -> *) p (->), Applicative f) => AsFieldAttributeCountUnexpectedEof p f (ClassFileError c) Source 
((~) (* -> * -> *) p (->), Applicative f) => AsFieldDescriptorIndexUnexpectedEof p f (ClassFileError c) Source 
((~) (* -> * -> *) p (->), Applicative f) => AsFieldNameIndexUnexpectedEof p f (ClassFileError c) Source 
((~) (* -> * -> *) p (->), Applicative f) => AsFieldFieldAccessFlagsError p f (ClassFileError c) Source 
((~) (* -> * -> *) p (->), Applicative f) => AsFieldErrorAttributeError p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsFieldsFieldError p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsFieldsFieldInfoUnexpectedEof p f (ClassFileError c) Source 
((~) (* -> * -> *) p (->), Applicative f) => AsMethodMethodAccessFlagsError p f (ClassFileError c) Source 
((~) (* -> * -> *) p (->), Applicative f) => AsMethodAttributeUnexpectedEof p f (ClassFileError c) Source 
((~) (* -> * -> *) p (->), Applicative f) => AsMethodAttributeCountUnexpectedEof p f (ClassFileError c) Source 
((~) (* -> * -> *) p (->), Applicative f) => AsMethodDescriptorIndexUnexpectedEof p f (ClassFileError c) Source 
((~) (* -> * -> *) p (->), Applicative f) => AsMethodNameIndexUnexpectedEof p f (ClassFileError c) Source 
((~) (* -> * -> *) p (->), Applicative f) => AsMethodErrorAttributeError p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsMethodsMethodError p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsMethodsInfoUnexpectedEof p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsClassFileUnexpectedInputOnStream p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsClassFileAttributesError p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsClassFileMethodsError p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsClassFileFieldsError p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsClassFileInterfacesError p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsClassFileSuperClassError p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsClassFileThisClassError p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsClassFileThisAccessFlagsError p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsClassFileVersionError p f (ClassFileError c) Source 
(Choice p, Applicative f) => AsClassFileCafebabeError p f (ClassFileError c) Source 
Eq (ConstantPoolError c) => Eq (ClassFileError c) Source 
Ord (ConstantPoolError c) => Ord (ClassFileError c) Source 
Show (ConstantPoolError c) => Show (ClassFileError c) Source 

class AsClassFileCafebabeError p f s where Source

Minimal complete definition

Nothing

class AsClassFileVersionError p f s where Source

Minimal complete definition

Nothing

class AsClassFileConstantPoolError p f s where Source

Minimal complete definition

Nothing

class AsClassFileThisClassError p f s where Source

Minimal complete definition

Nothing

class AsClassFileSuperClassError p f s where Source

Minimal complete definition

Nothing

class AsClassFileInterfacesError p f s where Source

Minimal complete definition

Nothing

class AsClassFileFieldsError p f s where Source

Minimal complete definition

Nothing

class AsClassFileMethodsError p f s where Source

Minimal complete definition

Nothing

class AsClassFileAttributesError p f s where Source

Minimal complete definition

Nothing

class AsClassFileUnexpectedInputOnStream p f s where Source

Minimal complete definition

Nothing

classFile :: (AsEmpty (c Word8), AsEmpty (t Char), AsEmpty (f (Attribute a1)), AsEmpty (a Word8), AsEmpty (m (Attribute a2)), AsEmpty (a3 Word8), AsEmpty (a4 Word8), AsEmpty (c1 (ConstantPoolInfo p)), AsEmpty (i Word16), AsEmpty (s1 (Field a5 f1)), AsEmpty (t1 (Method m1 b)), AsEmpty (u (Attribute d)), Cons (c Word8) (c Word8) Word8 Word8, Cons (t Char) (t Char) Char Char, Cons (f (Attribute a1)) (f (Attribute a1)) (Attribute a) (Attribute a), Cons (a Word8) (a Word8) Word8 Word8, Cons (m (Attribute a2)) (m (Attribute a2)) (Attribute a3) (Attribute a3), Cons (a3 Word8) (a3 Word8) Word8 Word8, Cons (a4 Word8) (a4 Word8) Word8 Word8, Cons (c1 (ConstantPoolInfo p)) (c1 (ConstantPoolInfo p)) (ConstantPoolInfo t) (ConstantPoolInfo t), Cons (i Word16) (i Word16) Word16 Word16, Cons (s1 (Field a5 f1)) (s1 (Field a5 f1)) (Field a1 f) (Field a1 f), Cons (t1 (Method m1 b)) (t1 (Method m1 b)) (Method m a2) (Method m a2), Cons (u (Attribute d)) (u (Attribute d)) (Attribute a4) (Attribute a4), AsClassFileCafebabeError Tagged Identity (s c), AsClassFileVersionError Tagged Identity (s c), AsClassFileConstantPoolError Tagged Identity s, AsClassFileThisAccessFlagsError Tagged Identity (s c), AsClassFileThisClassError Tagged Identity (s c), AsClassFileSuperClassError Tagged Identity (s c), AsClassFileInterfacesError Tagged Identity (s c), AsClassFileFieldsError Tagged Identity (s c), AsClassFileMethodsError Tagged Identity (s c), AsClassFileAttributesError Tagged Identity (s c), AsClassFileUnexpectedInputOnStream Tagged Identity (s c)) => Get (s c) (ClassFile p c1 i a5 f1 s1 m1 b t1 d u) Source