Class InstructionAdapter

java.lang.Object
org.objectweb.asm.MethodVisitor
org.objectweb.asm.commons.InstructionAdapter

public class InstructionAdapter extends MethodVisitor
A MethodVisitor providing a more detailed API to generate and transform instructions.
  • Field Details

    • OBJECT_TYPE

      public static final Type OBJECT_TYPE
      The type of the java.lang.Object class.
  • Constructor Details

    • InstructionAdapter

      public InstructionAdapter(MethodVisitor methodVisitor)
      Constructs a new InstructionAdapter. Subclasses must not use this constructor. Instead, they must use the InstructionAdapter(int, MethodVisitor) version.
      Parameters:
      methodVisitor - the method visitor to which this adapter delegates calls.
      Throws:
      IllegalStateException - If a subclass calls this constructor.
    • InstructionAdapter

      protected InstructionAdapter(int api, MethodVisitor methodVisitor)
      Constructs a new InstructionAdapter.
      Parameters:
      api - the ASM API version implemented by this visitor. Must be one of the ASMx values in Opcodes.
      methodVisitor - the method visitor to which this adapter delegates calls.
  • Method Details

    • visitInsn

      public void visitInsn(int opcode)
      Description copied from class: MethodVisitor
      Visits a zero operand instruction.
      Overrides:
      visitInsn in class MethodVisitor
      Parameters:
      opcode - the opcode of the instruction to be visited. This opcode is either NOP, ACONST_NULL, ICONST_M1, ICONST_0, ICONST_1, ICONST_2, ICONST_3, ICONST_4, ICONST_5, LCONST_0, LCONST_1, FCONST_0, FCONST_1, FCONST_2, DCONST_0, DCONST_1, IALOAD, LALOAD, FALOAD, DALOAD, AALOAD, BALOAD, CALOAD, SALOAD, IASTORE, LASTORE, FASTORE, DASTORE, AASTORE, BASTORE, CASTORE, SASTORE, POP, POP2, DUP, DUP_X1, DUP_X2, DUP2, DUP2_X1, DUP2_X2, SWAP, IADD, LADD, FADD, DADD, ISUB, LSUB, FSUB, DSUB, IMUL, LMUL, FMUL, DMUL, IDIV, LDIV, FDIV, DDIV, IREM, LREM, FREM, DREM, INEG, LNEG, FNEG, DNEG, ISHL, LSHL, ISHR, LSHR, IUSHR, LUSHR, IAND, LAND, IOR, LOR, IXOR, LXOR, I2L, I2F, I2D, L2I, L2F, L2D, F2I, F2L, F2D, D2I, D2L, D2F, I2B, I2C, I2S, LCMP, FCMPL, FCMPG, DCMPL, DCMPG, IRETURN, LRETURN, FRETURN, DRETURN, ARETURN, RETURN, ARRAYLENGTH, ATHROW, MONITORENTER, or MONITOREXIT.
    • visitIntInsn

      public void visitIntInsn(int opcode, int operand)
      Description copied from class: MethodVisitor
      Visits an instruction with a single int operand.
      Overrides:
      visitIntInsn in class MethodVisitor
      Parameters:
      opcode - the opcode of the instruction to be visited. This opcode is either BIPUSH, SIPUSH or NEWARRAY.
      operand - the operand of the instruction to be visited.
      When opcode is BIPUSH, operand value should be between Byte.MIN_VALUE and Byte.MAX_VALUE.
      When opcode is SIPUSH, operand value should be between Short.MIN_VALUE and Short.MAX_VALUE.
      When opcode is NEWARRAY, operand value should be one of Opcodes.T_BOOLEAN, Opcodes.T_CHAR, Opcodes.T_FLOAT, Opcodes.T_DOUBLE, Opcodes.T_BYTE, Opcodes.T_SHORT, Opcodes.T_INT or Opcodes.T_LONG.
    • visitVarInsn

      public void visitVarInsn(int opcode, int varIndex)
      Description copied from class: MethodVisitor
      Visits a local variable instruction. A local variable instruction is an instruction that loads or stores the value of a local variable.
      Overrides:
      visitVarInsn in class MethodVisitor
      Parameters:
      opcode - the opcode of the local variable instruction to be visited. This opcode is either ILOAD, LLOAD, FLOAD, DLOAD, ALOAD, ISTORE, LSTORE, FSTORE, DSTORE, ASTORE or RET.
      varIndex - the operand of the instruction to be visited. This operand is the index of a local variable.
    • visitTypeInsn

      public void visitTypeInsn(int opcode, String type)
      Description copied from class: MethodVisitor
      Visits a type instruction. A type instruction is an instruction that takes the internal name of a class as parameter (see Type.getInternalName()).
      Overrides:
      visitTypeInsn in class MethodVisitor
      Parameters:
      opcode - the opcode of the type instruction to be visited. This opcode is either NEW, ANEWARRAY, CHECKCAST or INSTANCEOF.
      type - the operand of the instruction to be visited. This operand must be the internal name of an object or array class (see Type.getInternalName()).
    • visitFieldInsn

      public void visitFieldInsn(int opcode, String owner, String name, String descriptor)
      Description copied from class: MethodVisitor
      Visits a field instruction. A field instruction is an instruction that loads or stores the value of a field of an object.
      Overrides:
      visitFieldInsn in class MethodVisitor
      Parameters:
      opcode - the opcode of the type instruction to be visited. This opcode is either GETSTATIC, PUTSTATIC, GETFIELD or PUTFIELD.
      owner - the internal name of the field's owner class (see Type.getInternalName()).
      name - the field's name.
      descriptor - the field's descriptor (see Type).
    • visitMethodInsn

      public void visitMethodInsn(int opcodeAndSource, String owner, String name, String descriptor, boolean isInterface)
      Description copied from class: MethodVisitor
      Visits a method instruction. A method instruction is an instruction that invokes a method.
      Overrides:
      visitMethodInsn in class MethodVisitor
      Parameters:
      opcodeAndSource - the opcode of the type instruction to be visited. This opcode is either INVOKEVIRTUAL, INVOKESPECIAL, INVOKESTATIC or INVOKEINTERFACE.
      owner - the internal name of the method's owner class (see Type.getInternalName()).
      name - the method's name.
      descriptor - the method's descriptor (see Type).
      isInterface - if the method's owner class is an interface.
    • visitInvokeDynamicInsn

      public void visitInvokeDynamicInsn(String name, String descriptor, Handle bootstrapMethodHandle, Object... bootstrapMethodArguments)
      Description copied from class: MethodVisitor
      Visits an invokedynamic instruction.
      Overrides:
      visitInvokeDynamicInsn in class MethodVisitor
      Parameters:
      name - the method's name.
      descriptor - the method's descriptor (see Type).
      bootstrapMethodHandle - the bootstrap method.
      bootstrapMethodArguments - the bootstrap method constant arguments. Each argument must be an Integer, Float, Long, Double, String, Type, Handle or ConstantDynamic value. This method is allowed to modify the content of the array so a caller should expect that this array may change.
    • visitJumpInsn

      public void visitJumpInsn(int opcode, Label label)
      Description copied from class: MethodVisitor
      Visits a jump instruction. A jump instruction is an instruction that may jump to another instruction.
      Overrides:
      visitJumpInsn in class MethodVisitor
      Parameters:
      opcode - the opcode of the type instruction to be visited. This opcode is either IFEQ, IFNE, IFLT, IFGE, IFGT, IFLE, IF_ICMPEQ, IF_ICMPNE, IF_ICMPLT, IF_ICMPGE, IF_ICMPGT, IF_ICMPLE, IF_ACMPEQ, IF_ACMPNE, GOTO, JSR, IFNULL or IFNONNULL.
      label - the operand of the instruction to be visited. This operand is a label that designates the instruction to which the jump instruction may jump.
    • visitLabel

      public void visitLabel(Label label)
      Description copied from class: MethodVisitor
      Visits a label. A label designates the instruction that will be visited just after it.
      Overrides:
      visitLabel in class MethodVisitor
      Parameters:
      label - a Label object.
    • visitLdcInsn

      public void visitLdcInsn(Object value)
      Description copied from class: MethodVisitor
      Visits a LDC instruction. Note that new constant types may be added in future versions of the Java Virtual Machine. To easily detect new constant types, implementations of this method should check for unexpected constant types, like this:
       if (cst instanceof Integer) {
           // ...
       } else if (cst instanceof Float) {
           // ...
       } else if (cst instanceof Long) {
           // ...
       } else if (cst instanceof Double) {
           // ...
       } else if (cst instanceof String) {
           // ...
       } else if (cst instanceof Type) {
           int sort = ((Type) cst).getSort();
           if (sort == Type.OBJECT) {
               // ...
           } else if (sort == Type.ARRAY) {
               // ...
           } else if (sort == Type.METHOD) {
               // ...
           } else {
               // throw an exception
           }
       } else if (cst instanceof Handle) {
           // ...
       } else if (cst instanceof ConstantDynamic) {
           // ...
       } else {
           // throw an exception
       }
       
      Overrides:
      visitLdcInsn in class MethodVisitor
      Parameters:
      value - the constant to be loaded on the stack. This parameter must be a non null Integer, a Float, a Long, a Double, a String, a Type of OBJECT or ARRAY sort for .class constants, for classes whose version is 49, a Type of METHOD sort for MethodType, a Handle for MethodHandle constants, for classes whose version is 51 or a ConstantDynamic for a constant dynamic for classes whose version is 55.
    • visitIincInsn

      public void visitIincInsn(int varIndex, int increment)
      Description copied from class: MethodVisitor
      Visits an IINC instruction.
      Overrides:
      visitIincInsn in class MethodVisitor
      Parameters:
      varIndex - index of the local variable to be incremented.
      increment - amount to increment the local variable by.
    • visitTableSwitchInsn

      public void visitTableSwitchInsn(int min, int max, Label dflt, Label... labels)
      Description copied from class: MethodVisitor
      Visits a TABLESWITCH instruction.
      Overrides:
      visitTableSwitchInsn in class MethodVisitor
      Parameters:
      min - the minimum key value.
      max - the maximum key value.
      dflt - beginning of the default handler block.
      labels - beginnings of the handler blocks. labels[i] is the beginning of the handler block for the min + i key.
    • visitLookupSwitchInsn

      public void visitLookupSwitchInsn(Label dflt, int[] keys, Label[] labels)
      Description copied from class: MethodVisitor
      Visits a LOOKUPSWITCH instruction.
      Overrides:
      visitLookupSwitchInsn in class MethodVisitor
      Parameters:
      dflt - beginning of the default handler block.
      keys - the values of the keys.
      labels - beginnings of the handler blocks. labels[i] is the beginning of the handler block for the keys[i] key.
    • visitMultiANewArrayInsn

      public void visitMultiANewArrayInsn(String descriptor, int numDimensions)
      Description copied from class: MethodVisitor
      Visits a MULTIANEWARRAY instruction.
      Overrides:
      visitMultiANewArrayInsn in class MethodVisitor
      Parameters:
      descriptor - an array type descriptor (see Type).
      numDimensions - the number of dimensions of the array to allocate.
    • nop

      public void nop()
      Generates a nop instruction.
    • aconst

      public void aconst(Object value)
      Generates the instruction to push the given value on the stack.
      Parameters:
      value - the constant to be pushed on the stack. This parameter must be an Integer, a Float, a Long, a Double, a String, a Type of OBJECT or ARRAY sort for .class constants, for classes whose version is 49, a Type of METHOD sort for MethodType, a Handle for MethodHandle constants, for classes whose version is 51 or a ConstantDynamic for a constant dynamic for classes whose version is 55.
    • iconst

      public void iconst(int intValue)
      Generates the instruction to push the given value on the stack.
      Parameters:
      intValue - the constant to be pushed on the stack.
    • lconst

      public void lconst(long longValue)
      Generates the instruction to push the given value on the stack.
      Parameters:
      longValue - the constant to be pushed on the stack.
    • fconst

      public void fconst(float floatValue)
      Generates the instruction to push the given value on the stack.
      Parameters:
      floatValue - the constant to be pushed on the stack.
    • dconst

      public void dconst(double doubleValue)
      Generates the instruction to push the given value on the stack.
      Parameters:
      doubleValue - the constant to be pushed on the stack.
    • tconst

      public void tconst(Type type)
      Generates the instruction to push the given type on the stack.
      Parameters:
      type - the type to be pushed on the stack.
    • hconst

      public void hconst(Handle handle)
      Generates the instruction to push the given handle on the stack.
      Parameters:
      handle - the handle to be pushed on the stack.
    • cconst

      public void cconst(ConstantDynamic constantDynamic)
      Generates the instruction to push the given constant dynamic on the stack.
      Parameters:
      constantDynamic - the constant dynamic to be pushed on the stack.
    • load

      public void load(int varIndex, Type type)
    • aload

      public void aload(Type type)
    • store

      public void store(int varIndex, Type type)
    • astore

      public void astore(Type type)
    • pop

      public void pop()
    • pop2

      public void pop2()
    • dup

      public void dup()
    • dup2

      public void dup2()
    • dupX1

      public void dupX1()
    • dupX2

      public void dupX2()
    • dup2X1

      public void dup2X1()
    • dup2X2

      public void dup2X2()
    • swap

      public void swap()
    • add

      public void add(Type type)
    • sub

      public void sub(Type type)
    • mul

      public void mul(Type type)
    • div

      public void div(Type type)
    • rem

      public void rem(Type type)
    • neg

      public void neg(Type type)
    • shl

      public void shl(Type type)
    • shr

      public void shr(Type type)
    • ushr

      public void ushr(Type type)
    • and

      public void and(Type type)
    • or

      public void or(Type type)
    • xor

      public void xor(Type type)
    • iinc

      public void iinc(int varIndex, int increment)
    • cast

      public void cast(Type from, Type to)
      Generates the instruction to cast from the first given type to the other.
      Parameters:
      from - a Type.
      to - a Type.
    • lcmp

      public void lcmp()
    • cmpl

      public void cmpl(Type type)
    • cmpg

      public void cmpg(Type type)
    • ifeq

      public void ifeq(Label label)
    • ifne

      public void ifne(Label label)
    • iflt

      public void iflt(Label label)
    • ifge

      public void ifge(Label label)
    • ifgt

      public void ifgt(Label label)
    • ifle

      public void ifle(Label label)
    • ificmpeq

      public void ificmpeq(Label label)
    • ificmpne

      public void ificmpne(Label label)
    • ificmplt

      public void ificmplt(Label label)
    • ificmpge

      public void ificmpge(Label label)
    • ificmpgt

      public void ificmpgt(Label label)
    • ificmple

      public void ificmple(Label label)
    • ifacmpeq

      public void ifacmpeq(Label label)
    • ifacmpne

      public void ifacmpne(Label label)
    • goTo

      public void goTo(Label label)
    • jsr

      public void jsr(Label label)
    • ret

      public void ret(int varIndex)
    • tableswitch

      public void tableswitch(int min, int max, Label dflt, Label... labels)
    • lookupswitch

      public void lookupswitch(Label dflt, int[] keys, Label[] labels)
    • areturn

      public void areturn(Type type)
    • getstatic

      public void getstatic(String owner, String name, String descriptor)
    • putstatic

      public void putstatic(String owner, String name, String descriptor)
    • getfield

      public void getfield(String owner, String name, String descriptor)
    • putfield

      public void putfield(String owner, String name, String descriptor)
    • invokevirtual

      @Deprecated public void invokevirtual(String owner, String name, String descriptor)
      Deprecated.
      Parameters:
      owner - the internal name of the method's owner class (see Type.getInternalName()).
      name - the method's name.
      descriptor - the method's descriptor (see Type).
    • invokevirtual

      public void invokevirtual(String owner, String name, String descriptor, boolean isInterface)
      Generates the instruction to call the given virtual method.
      Parameters:
      owner - the internal name of the method's owner class (see Type.getInternalName()).
      name - the method's name.
      descriptor - the method's descriptor (see Type).
      isInterface - if the method's owner class is an interface.
    • invokespecial

      @Deprecated public void invokespecial(String owner, String name, String descriptor)
      Deprecated.
      Parameters:
      owner - the internal name of the method's owner class (see Type.getInternalName()).
      name - the method's name.
      descriptor - the method's descriptor (see Type).
    • invokespecial

      public void invokespecial(String owner, String name, String descriptor, boolean isInterface)
      Generates the instruction to call the given special method.
      Parameters:
      owner - the internal name of the method's owner class (see Type.getInternalName()).
      name - the method's name.
      descriptor - the method's descriptor (see Type).
      isInterface - if the method's owner class is an interface.
    • invokestatic

      @Deprecated public void invokestatic(String owner, String name, String descriptor)
      Deprecated.
      Parameters:
      owner - the internal name of the method's owner class (see Type.getInternalName()).
      name - the method's name.
      descriptor - the method's descriptor (see Type).
    • invokestatic

      public void invokestatic(String owner, String name, String descriptor, boolean isInterface)
      Generates the instruction to call the given static method.
      Parameters:
      owner - the internal name of the method's owner class (see Type.getInternalName()).
      name - the method's name.
      descriptor - the method's descriptor (see Type).
      isInterface - if the method's owner class is an interface.
    • invokeinterface

      public void invokeinterface(String owner, String name, String descriptor)
      Generates the instruction to call the given interface method.
      Parameters:
      owner - the internal name of the method's owner class (see Type.getInternalName()).
      name - the method's name.
      descriptor - the method's descriptor (see Type).
    • invokedynamic

      public void invokedynamic(String name, String descriptor, Handle bootstrapMethodHandle, Object[] bootstrapMethodArguments)
      Generates the instruction to call the given dynamic method.
      Parameters:
      name - the method's name.
      descriptor - the method's descriptor (see Type).
      bootstrapMethodHandle - the bootstrap method.
      bootstrapMethodArguments - the bootstrap method constant arguments. Each argument must be an Integer, Float, Long, Double, String, Type, Handle or ConstantDynamic value. This method is allowed to modify the content of the array so a caller should expect that this array may change.
    • anew

      public void anew(Type type)
    • newarray

      public void newarray(Type type)
      Generates the instruction to create and push on the stack an array of the given type.
      Parameters:
      type - an array Type.
    • arraylength

      public void arraylength()
    • athrow

      public void athrow()
    • checkcast

      public void checkcast(Type type)
    • instanceOf

      public void instanceOf(Type type)
    • monitorenter

      public void monitorenter()
    • monitorexit

      public void monitorexit()
    • multianewarray

      public void multianewarray(String descriptor, int numDimensions)
    • ifnull

      public void ifnull(Label label)
    • ifnonnull

      public void ifnonnull(Label label)
    • mark

      public void mark(Label label)