| // Copyright (c) 2013, the Dart project authors. Please see the AUTHORS file |
| // for details. All rights reserved. Use of this source code is governed by a |
| // BSD-style license that can be found in the LICENSE file. |
| |
| #include "vm/globals.h" // Needed here to get TARGET_ARCH_ARM. |
| #if defined(TARGET_ARCH_ARM) |
| |
| #include "vm/compiler/backend/il.h" |
| |
| #include "vm/compiler/backend/flow_graph.h" |
| #include "vm/compiler/backend/flow_graph_compiler.h" |
| #include "vm/compiler/backend/locations.h" |
| #include "vm/compiler/backend/locations_helpers.h" |
| #include "vm/compiler/backend/range_analysis.h" |
| #include "vm/compiler/compiler_state.h" |
| #include "vm/compiler/ffi/native_calling_convention.h" |
| #include "vm/compiler/jit/compiler.h" |
| #include "vm/cpu.h" |
| #include "vm/dart_entry.h" |
| #include "vm/instructions.h" |
| #include "vm/object_store.h" |
| #include "vm/parser.h" |
| #include "vm/simulator.h" |
| #include "vm/stack_frame.h" |
| #include "vm/stub_code.h" |
| #include "vm/symbols.h" |
| #include "vm/type_testing_stubs.h" |
| |
| #define __ compiler->assembler()-> |
| #define Z (compiler->zone()) |
| |
| namespace dart { |
| |
| // Generic summary for call instructions that have all arguments pushed |
| // on the stack and return the result in a fixed location depending on |
| // the return value (R0, Location::Pair(R0, R1) or Q0). |
| LocationSummary* Instruction::MakeCallSummary(Zone* zone, |
| const Instruction* instr, |
| LocationSummary* locs) { |
| ASSERT(locs == nullptr || locs->always_calls()); |
| LocationSummary* result = |
| ((locs == nullptr) |
| ? (new (zone) LocationSummary(zone, 0, 0, LocationSummary::kCall)) |
| : locs); |
| const auto representation = instr->representation(); |
| switch (representation) { |
| case kTagged: |
| result->set_out( |
| 0, Location::RegisterLocation(CallingConventions::kReturnReg)); |
| break; |
| case kUnboxedInt64: |
| result->set_out( |
| 0, Location::Pair( |
| Location::RegisterLocation(CallingConventions::kReturnReg), |
| Location::RegisterLocation( |
| CallingConventions::kSecondReturnReg))); |
| break; |
| case kUnboxedDouble: |
| result->set_out( |
| 0, Location::FpuRegisterLocation(CallingConventions::kReturnFpuReg)); |
| break; |
| default: |
| UNREACHABLE(); |
| break; |
| } |
| return result; |
| } |
| |
| LocationSummary* LoadIndexedUnsafeInstr::MakeLocationSummary(Zone* zone, |
| bool opt) const { |
| const intptr_t kNumInputs = 1; |
| const intptr_t kNumTemps = ((representation() == kUnboxedDouble) ? 1 : 0); |
| LocationSummary* locs = new (zone) |
| LocationSummary(zone, kNumInputs, kNumTemps, LocationSummary::kNoCall); |
| |
| locs->set_in(0, Location::RequiresRegister()); |
| switch (representation()) { |
| case kTagged: |
| locs->set_out(0, Location::RequiresRegister()); |
| break; |
| case kUnboxedInt64: |
| locs->set_out(0, Location::Pair(Location::RequiresRegister(), |
| Location::RequiresRegister())); |
| break; |
| case kUnboxedDouble: |
| locs->set_temp(0, Location::RequiresRegister()); |
| locs->set_out(0, Location::RequiresFpuRegister()); |
| break; |
| default: |
| UNREACHABLE(); |
| break; |
| } |
| return locs; |
| } |
| |
| void LoadIndexedUnsafeInstr::EmitNativeCode(FlowGraphCompiler* compiler) { |
| ASSERT(RequiredInputRepresentation(0) == kTagged); // It is a Smi. |
| ASSERT(kSmiTag == 0); |
| ASSERT(kSmiTagSize == 1); |
| |
| const Register index = locs()->in(0).reg(); |
| |
| switch (representation()) { |
| case kTagged: { |
| const auto out = locs()->out(0).reg(); |
| __ add(out, base_reg(), compiler::Operand(index, LSL, 1)); |
| __ LoadFromOffset(out, out, offset()); |
| break; |
| } |
| case kUnboxedInt64: { |
| const auto out_lo = locs()->out(0).AsPairLocation()->At(0).reg(); |
| const auto out_hi = locs()->out(0).AsPairLocation()->At(1).reg(); |
| |
| __ add(out_hi, base_reg(), compiler::Operand(index, LSL, 1)); |
| __ LoadFromOffset(out_lo, out_hi, offset()); |
| __ LoadFromOffset(out_hi, out_hi, offset() + compiler::target::kWordSize); |
| break; |
| } |
| case kUnboxedDouble: { |
| const auto tmp = locs()->temp(0).reg(); |
| const auto out = EvenDRegisterOf(locs()->out(0).fpu_reg()); |
| __ add(tmp, base_reg(), compiler::Operand(index, LSL, 1)); |
| __ LoadDFromOffset(out, tmp, offset()); |
| break; |
| } |
| default: |
| UNREACHABLE(); |
| break; |
| } |
| } |
| |
| DEFINE_BACKEND(StoreIndexedUnsafe, |
| (NoLocation, Register index, Register value)) { |
| ASSERT(instr->RequiredInputRepresentation( |
| StoreIndexedUnsafeInstr::kIndexPos) == kTagged); // It is a Smi. |
| __ add(TMP, instr->base_reg(), compiler::Operand(index, LSL, 1)); |
| __ str(value, compiler::Address(TMP, instr->offset())); |
| |
| ASSERT(kSmiTag == 0); |
| ASSERT(kSmiTagSize == 1); |
| } |
| |
| DEFINE_BACKEND(TailCall, |
| (NoLocation, |
| Fixed<Register, ARGS_DESC_REG>, |
| Temp<Register> temp)) { |
| compiler->EmitTailCallToStub(instr->code()); |
| |
| // Even though the TailCallInstr will be the last instruction in a basic |
| // block, the flow graph compiler will emit native code for other blocks after |
| // the one containing this instruction and needs to be able to use the pool. |
| // (The `LeaveDartFrame` above disables usages of the pool.) |
| __ set_constant_pool_allowed(true); |
| } |
| |
| LocationSummary* MemoryCopyInstr::MakeLocationSummary(Zone* zone, |
| bool opt) const { |
| const intptr_t kNumInputs = 5; |
| const intptr_t kNumTemps = |
| element_size_ == 16 ? 4 : element_size_ == 8 ? 2 : 1; |
| LocationSummary* locs = new (zone) |
| LocationSummary(zone, kNumInputs, kNumTemps, LocationSummary::kNoCall); |
| locs->set_in(kSrcPos, Location::WritableRegister()); |
| locs->set_in(kDestPos, Location::WritableRegister()); |
| locs->set_in(kSrcStartPos, Location::RequiresRegister()); |
| locs->set_in(kDestStartPos, Location::RequiresRegister()); |
| locs->set_in(kLengthPos, Location::WritableRegister()); |
| for (intptr_t i = 0; i < kNumTemps; i++) { |
| locs->set_temp(i, Location::RequiresRegister()); |
| } |
| return locs; |
| } |
| |
| void MemoryCopyInstr::EmitNativeCode(FlowGraphCompiler* compiler) { |
| const Register src_reg = locs()->in(kSrcPos).reg(); |
| const Register dest_reg = locs()->in(kDestPos).reg(); |
| const Register src_start_reg = locs()->in(kSrcStartPos).reg(); |
| const Register dest_start_reg = locs()->in(kDestStartPos).reg(); |
| const Register length_reg = locs()->in(kLengthPos).reg(); |
| |
| const Register temp_reg = locs()->temp(0).reg(); |
| RegList temp_regs = 0; |
| for (intptr_t i = 0; i < locs()->temp_count(); i++) { |
| temp_regs |= 1 << locs()->temp(i).reg(); |
| } |
| |
| EmitComputeStartPointer(compiler, src_cid_, src_start(), src_reg, |
| src_start_reg); |
| EmitComputeStartPointer(compiler, dest_cid_, dest_start(), dest_reg, |
| dest_start_reg); |
| |
| compiler::Label loop, done; |
| |
| compiler::Address src_address = |
| compiler::Address(src_reg, element_size_, compiler::Address::PostIndex); |
| compiler::Address dest_address = |
| compiler::Address(dest_reg, element_size_, compiler::Address::PostIndex); |
| |
| // Untag length and skip copy if length is zero. |
| __ movs(length_reg, compiler::Operand(length_reg, ASR, 1)); |
| __ b(&done, ZERO); |
| |
| __ Bind(&loop); |
| switch (element_size_) { |
| case 1: |
| __ ldrb(temp_reg, src_address); |
| __ strb(temp_reg, dest_address); |
| break; |
| case 2: |
| __ ldrh(temp_reg, src_address); |
| __ strh(temp_reg, dest_address); |
| break; |
| case 4: |
| __ ldr(temp_reg, src_address); |
| __ str(temp_reg, dest_address); |
| break; |
| case 8: |
| case 16: |
| __ ldm(BlockAddressMode::IA_W, src_reg, temp_regs); |
| __ stm(BlockAddressMode::IA_W, dest_reg, temp_regs); |
| break; |
| } |
| __ subs(length_reg, length_reg, compiler::Operand(1)); |
| __ b(&loop, NOT_ZERO); |
| __ Bind(&done); |
| } |
| |
| void MemoryCopyInstr::EmitComputeStartPointer(FlowGraphCompiler* compiler, |
| classid_t array_cid, |
| Value* start, |
| Register array_reg, |
| Register start_reg) { |
| if (IsTypedDataBaseClassId(array_cid)) { |
| __ ldr( |
| array_reg, |
| compiler::FieldAddress( |
| array_reg, compiler::target::TypedDataBase::data_field_offset())); |
| } else { |
| switch (array_cid) { |
| case kOneByteStringCid: |
| __ add( |
| array_reg, array_reg, |
| compiler::Operand(compiler::target::OneByteString::data_offset() - |
| kHeapObjectTag)); |
| break; |
| case kTwoByteStringCid: |
| __ add( |
| array_reg, array_reg, |
| compiler::Operand(compiler::target::OneByteString::data_offset() - |
| kHeapObjectTag)); |
| break; |
| case kExternalOneByteStringCid: |
| __ ldr(array_reg, |
| compiler::FieldAddress(array_reg, |
| compiler::target::ExternalOneByteString:: |
| external_data_offset())); |
| break; |
| case kExternalTwoByteStringCid: |
| __ ldr(array_reg, |
| compiler::FieldAddress(array_reg, |
| compiler::target::ExternalTwoByteString:: |
| external_data_offset())); |
| break; |
| default: |
| UNREACHABLE(); |
| break; |
| } |
| } |
| intptr_t shift = Utils::ShiftForPowerOfTwo(element_size_) - 1; |
| if (shift < 0) { |
| __ add(array_reg, array_reg, compiler::Operand(start_reg, ASR, -shift)); |
| } else { |
| __ add(array_reg, array_reg, compiler::Operand(start_reg, LSL, shift)); |
| } |
| } |
| |
| LocationSummary* PushArgumentInstr::MakeLocationSummary(Zone* zone, |
| bool opt) const { |
| const intptr_t kNumInputs = 1; |
| const intptr_t kNumTemps = 0; |
| LocationSummary* locs = new (zone) |
| LocationSummary(zone, kNumInputs, kNumTemps, LocationSummary::kNoCall); |
| if (representation() == kUnboxedDouble) { |
| locs->set_in(0, Location::RequiresFpuRegister()); |
| } else if (representation() == kUnboxedInt64) { |
| locs->set_in(0, Location::Pair(Location::RequiresRegister(), |
| Location::RequiresRegister())); |
| } else { |
| locs->set_in(0, LocationAnyOrConstant(value())); |
| } |
| return locs; |
| } |
| |
| // Buffers registers to use STMDB in order to push |
| // multiple registers at once. |
| class ArgumentsPusher : public ValueObject { |
| public: |
| ArgumentsPusher() {} |
| |
| // Flush all buffered registers. |
| void Flush(FlowGraphCompiler* compiler) { |
| if (pending_regs_ != 0) { |
| if (is_single_register_) { |
| __ Push(lowest_register_); |
| } else { |
| __ PushList(pending_regs_); |
| } |
| pending_regs_ = 0; |
| lowest_register_ = kNoRegister; |
| is_single_register_ = false; |
| } |
| } |
| |
| // Buffer given register. May push previously buffered registers if needed. |
| void PushRegister(FlowGraphCompiler* compiler, Register reg) { |
| if (pending_regs_ != 0) { |
| ASSERT(lowest_register_ != kNoRegister); |
| // STMDB pushes higher registers first, so we can only buffer |
| // lower registers. |
| if (reg < lowest_register_) { |
| pending_regs_ |= (1 << reg); |
| lowest_register_ = reg; |
| is_single_register_ = false; |
| return; |
| } |
| Flush(compiler); |
| } |
| pending_regs_ = (1 << reg); |
| lowest_register_ = reg; |
| is_single_register_ = true; |
| } |
| |
| // Return a register which can be used to hold a value of an argument. |
| Register FindFreeRegister(FlowGraphCompiler* compiler, |
| Instruction* push_arg) { |
| // Dart calling conventions do not have callee-save registers, |
| // so arguments pushing can clobber all allocatable registers |
| // except registers used in arguments which were not pushed yet, |
| // as well as ParallelMove and inputs of a call instruction. |
| intptr_t busy = kReservedCpuRegisters; |
| for (Instruction* instr = push_arg;; instr = instr->next()) { |
| ASSERT(instr != nullptr); |
| if (ParallelMoveInstr* parallel_move = instr->AsParallelMove()) { |
| for (intptr_t i = 0, n = parallel_move->NumMoves(); i < n; ++i) { |
| const auto src_loc = parallel_move->MoveOperandsAt(i)->src(); |
| if (src_loc.IsRegister()) { |
| busy |= (1 << src_loc.reg()); |
| } else if (src_loc.IsPairLocation()) { |
| busy |= (1 << src_loc.AsPairLocation()->At(0).reg()); |
| busy |= (1 << src_loc.AsPairLocation()->At(1).reg()); |
| } |
| } |
| } else { |
| ASSERT(instr->IsPushArgument() || (instr->ArgumentCount() > 0)); |
| for (intptr_t i = 0, n = instr->locs()->input_count(); i < n; ++i) { |
| const auto in_loc = instr->locs()->in(i); |
| if (in_loc.IsRegister()) { |
| busy |= (1 << in_loc.reg()); |
| } else if (in_loc.IsPairLocation()) { |
| const auto pair_location = in_loc.AsPairLocation(); |
| busy |= (1 << pair_location->At(0).reg()); |
| busy |= (1 << pair_location->At(1).reg()); |
| } |
| } |
| if (instr->ArgumentCount() > 0) { |
| break; |
| } |
| } |
| } |
| if (pending_regs_ != 0) { |
| // Find the highest available register which can be pushed along with |
| // pending registers. |
| Register reg = HighestAvailableRegister(busy, lowest_register_); |
| if (reg != kNoRegister) { |
| return reg; |
| } |
| Flush(compiler); |
| } |
| // At this point there are no pending buffered registers. |
| // Use LR as it's the highest free register, it is not allocatable and |
| // it is clobbered by the call. |
| CLOBBERS_LR({ |
| static_assert(((1 << LR) & kDartAvailableCpuRegs) == 0, |
| "LR should not be allocatable"); |
| return LR; |
| }); |
| } |
| |
| private: |
| RegList pending_regs_ = 0; |
| Register lowest_register_ = kNoRegister; |
| bool is_single_register_ = false; |
| |
| Register HighestAvailableRegister(intptr_t busy, Register upper_bound) { |
| for (intptr_t i = upper_bound - 1; i >= 0; --i) { |
| if ((busy & (1 << i)) == 0) { |
| return static_cast<Register>(i); |
| } |
| } |
| return kNoRegister; |
| } |
| }; |
| |
| void PushArgumentInstr::EmitNativeCode(FlowGraphCompiler* compiler) { |
| // In SSA mode, we need an explicit push. Nothing to do in non-SSA mode |
| // where arguments are pushed by their definitions. |
| if (compiler->is_optimizing()) { |
| if (previous()->IsPushArgument()) { |
| // Already generated. |
| return; |
| } |
| ArgumentsPusher pusher; |
| for (PushArgumentInstr* push_arg = this; push_arg != nullptr; |
| push_arg = push_arg->next()->AsPushArgument()) { |
| const Location value = push_arg->locs()->in(0); |
| if (value.IsRegister()) { |
| pusher.PushRegister(compiler, value.reg()); |
| } else if (value.IsPairLocation()) { |
| pusher.PushRegister(compiler, value.AsPairLocation()->At(1).reg()); |
| pusher.PushRegister(compiler, value.AsPairLocation()->At(0).reg()); |
| } else if (value.IsFpuRegister()) { |
| pusher.Flush(compiler); |
| __ vstmd(DB_W, SP, EvenDRegisterOf(value.fpu_reg()), 1); |
| } else { |
| const Register reg = pusher.FindFreeRegister(compiler, push_arg); |
| ASSERT(reg != kNoRegister); |
| if (value.IsConstant()) { |
| __ LoadObject(reg, value.constant()); |
| } else { |
| ASSERT(value.IsStackSlot()); |
| const intptr_t value_offset = value.ToStackSlotOffset(); |
| __ LoadFromOffset(reg, value.base_reg(), value_offset); |
| } |
| pusher.PushRegister(compiler, reg); |
| } |
| } |
| pusher.Flush(compiler); |
| } |
| } |
| |
| LocationSummary* ReturnInstr::MakeLocationSummary(Zone* zone, bool opt) const { |
| const intptr_t kNumInputs = 1; |
| const intptr_t kNumTemps = 0; |
| LocationSummary* locs = new (zone) |
| LocationSummary(zone, kNumInputs, kNumTemps, LocationSummary::kNoCall); |
| switch (representation()) { |
| case kTagged: |
| locs->set_in(0, |
| Location::RegisterLocation(CallingConventions::kReturnReg)); |
| break; |
| case kUnboxedInt64: |
| locs->set_in( |
| 0, Location::Pair( |
| Location::RegisterLocation(CallingConventions::kReturnReg), |
| Location::RegisterLocation( |
| CallingConventions::kSecondReturnReg))); |
| break; |
| case kUnboxedDouble: |
| locs->set_in( |
| 0, Location::FpuRegisterLocation(CallingConventions::kReturnFpuReg)); |
| break; |
| default: |
| UNREACHABLE(); |
| break; |
| } |
| return locs; |
| } |
| |
| // Attempt optimized compilation at return instruction instead of at the entry. |
| // The entry needs to be patchable, no inlined objects are allowed in the area |
| // that will be overwritten by the patch instructions: a branch macro sequence. |
| void ReturnInstr::EmitNativeCode(FlowGraphCompiler* compiler) { |
| if (locs()->in(0).IsRegister()) { |
| const Register result = locs()->in(0).reg(); |
| ASSERT(result == CallingConventions::kReturnReg); |
| } else if (locs()->in(0).IsPairLocation()) { |
| const Register result_lo = locs()->in(0).AsPairLocation()->At(0).reg(); |
| const Register result_hi = locs()->in(0).AsPairLocation()->At(1).reg(); |
| ASSERT(result_lo == CallingConventions::kReturnReg); |
| ASSERT(result_hi == CallingConventions::kSecondReturnReg); |
| } else { |
| ASSERT(locs()->in(0).IsFpuRegister()); |
| const FpuRegister result = locs()->in(0).fpu_reg(); |
| ASSERT(result == CallingConventions::kReturnFpuReg); |
| } |
| |
| if (!compiler->flow_graph().graph_entry()->NeedsFrame()) { |
| __ Ret(); |
| return; |
| } |
| |
| #if defined(DEBUG) |
| compiler::Label stack_ok; |
| __ Comment("Stack Check"); |
| const intptr_t fp_sp_dist = |
| (compiler::target::frame_layout.first_local_from_fp + 1 - |
| compiler->StackSize()) * |
| compiler::target::kWordSize; |
| ASSERT(fp_sp_dist <= 0); |
| __ sub(R2, SP, compiler::Operand(FP)); |
| __ CompareImmediate(R2, fp_sp_dist); |
| __ b(&stack_ok, EQ); |
| __ bkpt(0); |
| __ Bind(&stack_ok); |
| #endif |
| ASSERT(__ constant_pool_allowed()); |
| if (yield_index() != UntaggedPcDescriptors::kInvalidYieldIndex) { |
| compiler->EmitYieldPositionMetadata(source(), yield_index()); |
| } |
| __ LeaveDartFrameAndReturn(); // Disallows constant pool use. |
| // This ReturnInstr may be emitted out of order by the optimizer. The next |
| // block may be a target expecting a properly set constant pool pointer. |
| __ set_constant_pool_allowed(true); |
| } |
| |
| // Detect pattern when one value is zero and another is a power of 2. |
| static bool IsPowerOfTwoKind(intptr_t v1, intptr_t v2) { |
| return (Utils::IsPowerOfTwo(v1) && (v2 == 0)) || |
| (Utils::IsPowerOfTwo(v2) && (v1 == 0)); |
| } |
| |
| LocationSummary* IfThenElseInstr::MakeLocationSummary(Zone* zone, |
| bool opt) const { |
| comparison()->InitializeLocationSummary(zone, opt); |
| return comparison()->locs(); |
| } |
| |
| void IfThenElseInstr::EmitNativeCode(FlowGraphCompiler* compiler) { |
| const Register result = locs()->out(0).reg(); |
| |
| Location left = locs()->in(0); |
| Location right = locs()->in(1); |
| ASSERT(!left.IsConstant() || !right.IsConstant()); |
| |
| // Clear out register. |
| __ eor(result, result, compiler::Operand(result)); |
| |
| // Emit comparison code. This must not overwrite the result register. |
| // IfThenElseInstr::Supports() should prevent EmitComparisonCode from using |
| // the labels or returning an invalid condition. |
| BranchLabels labels = {NULL, NULL, NULL}; |
| Condition true_condition = comparison()->EmitComparisonCode(compiler, labels); |
| ASSERT(true_condition != kInvalidCondition); |
| |
| const bool is_power_of_two_kind = IsPowerOfTwoKind(if_true_, if_false_); |
| |
| intptr_t true_value = if_true_; |
| intptr_t false_value = if_false_; |
| |
| if (is_power_of_two_kind) { |
| if (true_value == 0) { |
| // We need to have zero in result on true_condition. |
| true_condition = InvertCondition(true_condition); |
| } |
| } else { |
| if (true_value == 0) { |
| // Swap values so that false_value is zero. |
| intptr_t temp = true_value; |
| true_value = false_value; |
| false_value = temp; |
| } else { |
| true_condition = InvertCondition(true_condition); |
| } |
| } |
| |
| __ mov(result, compiler::Operand(1), true_condition); |
| |
| if (is_power_of_two_kind) { |
| const intptr_t shift = |
| Utils::ShiftForPowerOfTwo(Utils::Maximum(true_value, false_value)); |
| __ Lsl(result, result, compiler::Operand(shift + kSmiTagSize)); |
| } else { |
| __ sub(result, result, compiler::Operand(1)); |
| const int32_t val = compiler::target::ToRawSmi(true_value) - |
| compiler::target::ToRawSmi(false_value); |
| __ AndImmediate(result, result, val); |
| if (false_value != 0) { |
| __ AddImmediate(result, compiler::target::ToRawSmi(false_value)); |
| } |
| } |
| } |
| |
| LocationSummary* ClosureCallInstr::MakeLocationSummary(Zone* zone, |
| bool opt) const { |
| const intptr_t kNumInputs = 1; |
| const intptr_t kNumTemps = 0; |
| LocationSummary* summary = new (zone) |
| LocationSummary(zone, kNumInputs, kNumTemps, LocationSummary::kCall); |
| summary->set_in(0, Location::RegisterLocation(R0)); // Function. |
| return MakeCallSummary(zone, this, summary); |
| } |
| |
| void ClosureCallInstr::EmitNativeCode(FlowGraphCompiler* compiler) { |
| // Load arguments descriptor in R4. |
| const intptr_t argument_count = ArgumentCount(); // Includes type args. |
| const Array& arguments_descriptor = |
| Array::ZoneHandle(Z, GetArgumentsDescriptor()); |
| __ LoadObject(R4, arguments_descriptor); |
| |
| ASSERT(locs()->in(0).reg() == R0); |
| if (FLAG_precompiled_mode && FLAG_use_bare_instructions) { |
| // R0: Closure with a cached entry point. |
| __ ldr(R2, compiler::FieldAddress( |
| R0, compiler::target::Closure::entry_point_offset())); |
| } else { |
| // R0: Function. |
| __ ldr(CODE_REG, compiler::FieldAddress( |
| R0, compiler::target::Function::code_offset())); |
| // Closure functions only have one entry point. |
| __ ldr(R2, compiler::FieldAddress( |
| R0, compiler::target::Function::entry_point_offset())); |
| } |
| |
| // R4: Arguments descriptor array. |
| // R2: instructions entry point. |
| if (!FLAG_precompiled_mode) { |
| // R9: Smi 0 (no IC data; the lazy-compile stub expects a GC-safe value). |
| __ LoadImmediate(R9, 0); |
| } |
| __ blx(R2); |
| compiler->EmitCallsiteMetadata(source(), deopt_id(), |
| UntaggedPcDescriptors::kOther, locs(), env()); |
| __ Drop(argument_count); |
| } |
| |
| LocationSummary* LoadLocalInstr::MakeLocationSummary(Zone* zone, |
| bool opt) const { |
| return LocationSummary::Make(zone, 0, Location::RequiresRegister(), |
| LocationSummary::kNoCall); |
| } |
| |
| void LoadLocalInstr::EmitNativeCode(FlowGraphCompiler* compiler) { |
| const Register result = locs()->out(0).reg(); |
| __ LoadFromOffset(result, FP, |
| compiler::target::FrameOffsetInBytesForVariable(&local())); |
| } |
| |
| LocationSummary* StoreLocalInstr::MakeLocationSummary(Zone* zone, |
| bool opt) const { |
| return LocationSummary::Make(zone, 1, Location::SameAsFirstInput(), |
| LocationSummary::kNoCall); |
| } |
| |
| void StoreLocalInstr::EmitNativeCode(FlowGraphCompiler* compiler) { |
| const Register value = locs()->in(0).reg(); |
| const Register result = locs()->out(0).reg(); |
| ASSERT(result == value); // Assert that register assignment is correct. |
| __ StoreToOffset(value, FP, |
| compiler::target::FrameOffsetInBytesForVariable(&local())); |
| } |
| |
| LocationSummary* ConstantInstr::MakeLocationSummary(Zone* zone, |
| bool opt) const { |
| return LocationSummary::Make(zone, 0, Location::RequiresRegister(), |
| LocationSummary::kNoCall); |
| } |
| |
| void ConstantInstr::EmitNativeCode(FlowGraphCompiler* compiler) { |
| // The register allocator drops constant definitions that have no uses. |
| if (!locs()->out(0).IsInvalid()) { |
| const Register result = locs()->out(0).reg(); |
| __ LoadObject(result, value()); |
| } |
| } |
| |
| void ConstantInstr::EmitMoveToLocation(FlowGraphCompiler* compiler, |
| const Location& destination, |
| Register tmp, |
| intptr_t pair_index) { |
| if (destination.IsRegister()) { |
| if (RepresentationUtils::IsUnboxedInteger(representation())) { |
| int64_t v; |
| const bool ok = compiler::HasIntegerValue(value_, &v); |
| RELEASE_ASSERT(ok); |
| if (value_.IsSmi() && RepresentationUtils::IsUnsigned(representation())) { |
| // If the value is negative, then the sign bit was preserved during |
| // Smi untagging, which means the resulting value may be unexpected. |
| ASSERT(v >= 0); |
| } |
| __ LoadImmediate(destination.reg(), pair_index == 0 |
| ? Utils::Low32Bits(v) |
| : Utils::High32Bits(v)); |
| } else { |
| ASSERT(representation() == kTagged); |
| __ LoadObject(destination.reg(), value_); |
| } |
| } else if (destination.IsFpuRegister()) { |
| const DRegister dst = EvenDRegisterOf(destination.fpu_reg()); |
| if (Utils::DoublesBitEqual(Double::Cast(value_).value(), 0.0) && |
| TargetCPUFeatures::neon_supported()) { |
| QRegister qdst = destination.fpu_reg(); |
| __ veorq(qdst, qdst, qdst); |
| } else { |
| ASSERT(tmp != kNoRegister); |
| __ LoadDImmediate(dst, Double::Cast(value_).value(), tmp); |
| } |
| } else if (destination.IsDoubleStackSlot()) { |
| if (Utils::DoublesBitEqual(Double::Cast(value_).value(), 0.0) && |
| TargetCPUFeatures::neon_supported()) { |
| __ veorq(QTMP, QTMP, QTMP); |
| } else { |
| ASSERT(tmp != kNoRegister); |
| __ LoadDImmediate(DTMP, Double::Cast(value_).value(), tmp); |
| } |
| const intptr_t dest_offset = destination.ToStackSlotOffset(); |
| __ StoreDToOffset(DTMP, destination.base_reg(), dest_offset); |
| } else { |
| ASSERT(destination.IsStackSlot()); |
| ASSERT(tmp != kNoRegister); |
| const intptr_t dest_offset = destination.ToStackSlotOffset(); |
| if (RepresentationUtils::IsUnboxedInteger(representation())) { |
| int64_t v; |
| const bool ok = compiler::HasIntegerValue(value_, &v); |
| RELEASE_ASSERT(ok); |
| __ LoadImmediate( |
| tmp, pair_index == 0 ? Utils::Low32Bits(v) : Utils::High32Bits(v)); |
| } else { |
| __ LoadObject(tmp, value_); |
| } |
| __ StoreToOffset(tmp, destination.base_reg(), dest_offset); |
| } |
| } |
| |
| LocationSummary* UnboxedConstantInstr::MakeLocationSummary(Zone* zone, |
| bool opt) const { |
| const bool is_unboxed_int = |
| RepresentationUtils::IsUnboxedInteger(representation()); |
| ASSERT(!is_unboxed_int || RepresentationUtils::ValueSize(representation()) <= |
| compiler::target::kWordSize); |
| const intptr_t kNumInputs = 0; |
| const intptr_t kNumTemps = is_unboxed_int ? 0 : 1; |
| LocationSummary* locs = new (zone) |
| LocationSummary(zone, kNumInputs, kNumTemps, LocationSummary::kNoCall); |
| if (is_unboxed_int) { |
| locs->set_out(0, Location::RequiresRegister()); |
| } else { |
| ASSERT(representation_ == kUnboxedDouble); |
| locs->set_out(0, Location::RequiresFpuRegister()); |
| } |
| if (kNumTemps > 0) { |
| locs->set_temp(0, Location::RequiresRegister()); |
| } |
| return locs; |
| } |
| |
| void UnboxedConstantInstr::EmitNativeCode(FlowGraphCompiler* compiler) { |
| // The register allocator drops constant definitions that have no uses. |
| if (!locs()->out(0).IsInvalid()) { |
| const Register scratch = |
| locs()->temp_count() == 0 ? kNoRegister : locs()->temp(0).reg(); |
| EmitMoveToLocation(compiler, locs()->out(0), scratch); |
| } |
| } |
| |
| LocationSummary* AssertAssignableInstr::MakeLocationSummary(Zone* zone, |
| bool opt) const { |
| auto const dst_type_loc = |
| LocationFixedRegisterOrConstant(dst_type(), TypeTestABI::kDstTypeReg); |
| |
| // We want to prevent spilling of the inputs (e.g. function/instantiator tav), |
| // since TTS preserves them. So we make this a `kNoCall` summary, |
| // even though most other registers can be modified by the stub. To tell the |
| // register allocator about it, we reserve all the other registers as |
| // temporary registers. |
| // TODO(http://dartbug.com/32788): Simplify this. |
| |
| const intptr_t kNonChangeableInputRegs = |
| (1 << TypeTestABI::kInstanceReg) | |
| ((dst_type_loc.IsRegister() ? 1 : 0) << TypeTestABI::kDstTypeReg) | |
| (1 << TypeTestABI::kInstantiatorTypeArgumentsReg) | |
| (1 << TypeTestABI::kFunctionTypeArgumentsReg); |
| |
| const intptr_t kNumInputs = 4; |
| |
| // We invoke a stub that can potentially clobber any CPU register |
| // but can only clobber FPU registers on the slow path when |
| // entering runtime. Preserve all FPU registers that are |
| // not guarateed to be preserved by the ABI. |
| const intptr_t kCpuRegistersToPreserve = |
| kDartAvailableCpuRegs & ~kNonChangeableInputRegs; |
| const intptr_t kFpuRegistersToPreserve = |
| Utils::SignedNBitMask(kNumberOfFpuRegisters) & |
| ~(Utils::SignedNBitMask(kAbiPreservedFpuRegCount) |
| << kAbiFirstPreservedFpuReg) & |
| ~(1 << FpuTMP); |
| |
| const intptr_t kNumTemps = (Utils::CountOneBits64(kCpuRegistersToPreserve) + |
| Utils::CountOneBits64(kFpuRegistersToPreserve)); |
| |
| LocationSummary* summary = new (zone) LocationSummary( |
| zone, kNumInputs, kNumTemps, LocationSummary::kCallCalleeSafe); |
| summary->set_in(kInstancePos, |
| Location::RegisterLocation(TypeTestABI::kInstanceReg)); |
| summary->set_in(kDstTypePos, dst_type_loc); |
| summary->set_in( |
| kInstantiatorTAVPos, |
| Location::RegisterLocation(TypeTestABI::kInstantiatorTypeArgumentsReg)); |
| summary->set_in(kFunctionTAVPos, Location::RegisterLocation( |
| TypeTestABI::kFunctionTypeArgumentsReg)); |
| summary->set_out(0, Location::SameAsFirstInput()); |
| |
| // Let's reserve all registers except for the input ones. |
| intptr_t next_temp = 0; |
| for (intptr_t i = 0; i < kNumberOfCpuRegisters; ++i) { |
| const bool should_preserve = ((1 << i) & kCpuRegistersToPreserve) != 0; |
| if (should_preserve) { |
| summary->set_temp(next_temp++, |
| Location::RegisterLocation(static_cast<Register>(i))); |
| } |
| } |
| |
| for (intptr_t i = 0; i < kNumberOfFpuRegisters; i++) { |
| const bool should_preserve = ((1 << i) & kFpuRegistersToPreserve) != 0; |
| if (should_preserve) { |
| summary->set_temp(next_temp++, Location::FpuRegisterLocation( |
| static_cast<FpuRegister>(i))); |
| } |
| } |
| |
| return summary; |
| } |
| |
| void AssertBooleanInstr::EmitNativeCode(FlowGraphCompiler* compiler) { |
| ASSERT(locs()->always_calls()); |
| |
| auto object_store = compiler->isolate_group()->object_store(); |
| const auto& assert_boolean_stub = |
| Code::ZoneHandle(compiler->zone(), object_store->assert_boolean_stub()); |
| |
| compiler::Label done; |
| __ tst(AssertBooleanABI::kObjectReg, |
| compiler::Operand(compiler::target::ObjectAlignment::kBoolVsNullMask)); |
| __ b(&done, NOT_ZERO); |
| compiler->GenerateStubCall(source(), assert_boolean_stub, |
| /*kind=*/UntaggedPcDescriptors::kOther, locs(), |
| deopt_id(), env()); |
| __ Bind(&done); |
| } |
| |
| static Condition TokenKindToIntCondition(Token::Kind kind) { |
| switch (kind) { |
| case Token::kEQ: |
| return EQ; |
| case Token::kNE: |
| return NE; |
| case Token::kLT: |
| return LT; |
| case Token::kGT: |
| return GT; |
| case Token::kLTE: |
| return LE; |
| case Token::kGTE: |
| return GE; |
| default: |
| UNREACHABLE(); |
| return VS; |
| } |
| } |
| |
| static bool CanBePairOfImmediateOperands(const dart::Object& constant, |
| compiler::Operand* low, |
| compiler::Operand* high) { |
| int64_t imm; |
| if (!compiler::HasIntegerValue(constant, &imm)) { |
| return false; |
| } |
| return compiler::Operand::CanHold(Utils::Low32Bits(imm), low) && |
| compiler::Operand::CanHold(Utils::High32Bits(imm), high); |
| } |
| |
| static bool CanBePairOfImmediateOperands(Value* value, |
| compiler::Operand* low, |
| compiler::Operand* high) { |
| if (!value->BindsToConstant()) { |
| return false; |
| } |
| return CanBePairOfImmediateOperands(value->BoundConstant(), low, high); |
| } |
| |
| LocationSummary* EqualityCompareInstr::MakeLocationSummary(Zone* zone, |
| bool opt) const { |
| const intptr_t kNumInputs = 2; |
| if (is_null_aware()) { |
| const intptr_t kNumTemps = 1; |
| LocationSummary* locs = new (zone) |
| LocationSummary(zone, kNumInputs, kNumTemps, LocationSummary::kNoCall); |
| locs->set_in(0, Location::RequiresRegister()); |
| locs->set_in(1, Location::RequiresRegister()); |
| locs->set_temp(0, Location::RequiresRegister()); |
| locs->set_out(0, Location::RequiresRegister()); |
| return locs; |
| } |
| if (operation_cid() == kMintCid) { |
| compiler::Operand o; |
| const intptr_t kNumTemps = 0; |
| LocationSummary* locs = new (zone) |
| LocationSummary(zone, kNumInputs, kNumTemps, LocationSummary::kNoCall); |
| if (CanBePairOfImmediateOperands(left(), &o, &o)) { |
| locs->set_in(0, Location::Constant(left()->definition()->AsConstant())); |
| locs->set_in(1, Location::Pair(Location::RequiresRegister(), |
| Location::RequiresRegister())); |
| } else if (CanBePairOfImmediateOperands(right(), &o, &o)) { |
| locs->set_in(0, Location::Pair(Location::RequiresRegister(), |
| Location::RequiresRegister())); |
| locs->set_in(1, Location::Constant(right()->definition()->AsConstant())); |
| } else { |
| locs->set_in(0, Location::Pair(Location::RequiresRegister(), |
| Location::RequiresRegister())); |
| locs->set_in(1, Location::Pair(Location::RequiresRegister(), |
| Location::RequiresRegister())); |
| } |
| locs->set_out(0, Location::RequiresRegister()); |
| return locs; |
| } |
| if (operation_cid() == kDoubleCid) { |
| const intptr_t kNumTemps = 0; |
| LocationSummary* locs = new (zone) |
| LocationSummary(zone, kNumInputs, kNumTemps, LocationSummary::kNoCall); |
| locs->set_in(0, Location::RequiresFpuRegister()); |
| locs->set_in(1, Location::RequiresFpuRegister()); |
| locs->set_out(0, Location::RequiresRegister()); |
| return locs; |
| } |
| if (operation_cid() == kSmiCid) { |
| const intptr_t kNumTemps = 0; |
| LocationSummary* locs = new (zone) |
| LocationSummary(zone, kNumInputs, kNumTemps, LocationSummary::kNoCall); |
| locs->set_in(0, LocationRegisterOrConstant(left())); |
| // Only one input can be a constant operand. The case of two constant |
| // operands should be handled by constant propagation. |
| locs->set_in(1, locs->in(0).IsConstant() |
| ? Location::RequiresRegister() |
| : LocationRegisterOrConstant(right())); |
| locs->set_out(0, Location::RequiresRegister()); |
| return locs; |
| } |
| UNREACHABLE(); |
| return NULL; |
| } |
| |
| static void LoadValueCid(FlowGraphCompiler* compiler, |
| Register value_cid_reg, |
| Register value_reg, |
| compiler::Label* value_is_smi = NULL) { |
| if (value_is_smi == NULL) { |
| __ mov(value_cid_reg, compiler::Operand(kSmiCid)); |
| } |
| __ tst(value_reg, compiler::Operand(kSmiTagMask)); |
| if (value_is_smi == NULL) { |
| __ LoadClassId(value_cid_reg, value_reg, NE); |
| } else { |
| __ b(value_is_smi, EQ); |
| __ LoadClassId(value_cid_reg, value_reg); |
| } |
| } |
| |
| static Condition FlipCondition(Condition condition) { |
| switch (condition) { |
| case EQ: |
| return EQ; |
| case NE: |
| return NE; |
| case LT: |
| return GT; |
| case LE: |
| return GE; |
| case GT: |
| return LT; |
| case GE: |
| return LE; |
| case CC: |
| return HI; |
| case LS: |
| return CS; |
| case HI: |
| return CC; |
| case CS: |
| return LS; |
| default: |
| UNREACHABLE(); |
| return EQ; |
| } |
| } |
| |
| static void EmitBranchOnCondition(FlowGraphCompiler* compiler, |
| Condition true_condition, |
| BranchLabels labels) { |
| if (labels.fall_through == labels.false_label) { |
| // If the next block is the false successor we will fall through to it. |
| __ b(labels.true_label, true_condition); |
| } else { |
| // If the next block is not the false successor we will branch to it. |
| Condition false_condition = InvertCondition(true_condition); |
| __ b(labels.false_label, false_condition); |
| |
| // Fall through or jump to the true successor. |
| if (labels.fall_through != labels.true_label) { |
| __ b(labels.true_label); |
| } |
| } |
| } |
| |
| static Condition EmitSmiComparisonOp(FlowGraphCompiler* compiler, |
| LocationSummary* locs, |
| Token::Kind kind) { |
| Location left = locs->in(0); |
| Location right = locs->in(1); |
| ASSERT(!left.IsConstant() || !right.IsConstant()); |
| |
| Condition true_condition = TokenKindToIntCondition(kind); |
| |
| if (left.IsConstant()) { |
| __ CompareObject(right.reg(), left.constant()); |
| true_condition = FlipCondition(true_condition); |
| } else if (right.IsConstant()) { |
| __ CompareObject(left.reg(), right.constant()); |
| } else { |
| __ cmp(left.reg(), compiler::Operand(right.reg())); |
| } |
| return true_condition; |
| } |
| |
| static Condition EmitUnboxedMintEqualityOp(FlowGraphCompiler* compiler, |
| LocationSummary* locs, |
| Token::Kind kind) { |
| ASSERT(Token::IsEqualityOperator(kind)); |
| PairLocation* left_pair; |
| compiler::Operand right_lo, right_hi; |
| if (locs->in(0).IsConstant()) { |
| const bool ok = CanBePairOfImmediateOperands(locs->in(0).constant(), |
| &right_lo, &right_hi); |
| RELEASE_ASSERT(ok); |
| left_pair = locs->in(1).AsPairLocation(); |
| } else if (locs->in(1).IsConstant()) { |
| const bool ok = CanBePairOfImmediateOperands(locs->in(1).constant(), |
| &right_lo, &right_hi); |
| RELEASE_ASSERT(ok); |
| left_pair = locs->in(0).AsPairLocation(); |
| } else { |
| left_pair = locs->in(0).AsPairLocation(); |
| PairLocation* right_pair = locs->in(1).AsPairLocation(); |
| right_lo = compiler::Operand(right_pair->At(0).reg()); |
| right_hi = compiler::Operand(right_pair->At(1).reg()); |
| } |
| Register left_lo = left_pair->At(0).reg(); |
| Register left_hi = left_pair->At(1).reg(); |
| |
| // Compare lower. |
| __ cmp(left_lo, right_lo); |
| // Compare upper if lower is equal. |
| __ cmp(left_hi, right_hi, EQ); |
| return TokenKindToIntCondition(kind); |
| } |
| |
| static Condition EmitUnboxedMintComparisonOp(FlowGraphCompiler* compiler, |
| LocationSummary* locs, |
| Token::Kind kind, |
| BranchLabels labels) { |
| PairLocation* left_pair; |
| compiler::Operand right_lo, right_hi; |
| Condition true_condition = TokenKindToIntCondition(kind); |
| if (locs->in(0).IsConstant()) { |
| const bool ok = CanBePairOfImmediateOperands(locs->in(0).constant(), |
| &right_lo, &right_hi); |
| RELEASE_ASSERT(ok); |
| left_pair = locs->in(1).AsPairLocation(); |
| true_condition = FlipCondition(true_condition); |
| } else if (locs->in(1).IsConstant()) { |
| const bool ok = CanBePairOfImmediateOperands(locs->in(1).constant(), |
| &right_lo, &right_hi); |
| RELEASE_ASSERT(ok); |
| left_pair = locs->in(0).AsPairLocation(); |
| } else { |
| left_pair = locs->in(0).AsPairLocation(); |
| PairLocation* right_pair = locs->in(1).AsPairLocation(); |
| right_lo = compiler::Operand(right_pair->At(0).reg()); |
| right_hi = compiler::Operand(right_pair->At(1).reg()); |
| } |
| Register left_lo = left_pair->At(0).reg(); |
| Register left_hi = left_pair->At(1).reg(); |
| |
| // 64-bit comparison. |
| Condition hi_cond, lo_cond; |
| switch (true_condition) { |
| case LT: |
| hi_cond = LT; |
| lo_cond = CC; |
| break; |
| case GT: |
| hi_cond = GT; |
| lo_cond = HI; |
| break; |
| case LE: |
| hi_cond = LT; |
| lo_cond = LS; |
| break; |
| case GE: |
| hi_cond = GT; |
| lo_cond = CS; |
| break; |
| default: |
| UNREACHABLE(); |
| hi_cond = lo_cond = VS; |
| } |
| // Compare upper halves first. |
| __ cmp(left_hi, right_hi); |
| __ b(labels.true_label, hi_cond); |
| __ b(labels.false_label, FlipCondition(hi_cond)); |
| |
| // If higher words are equal, compare lower words. |
| __ cmp(left_lo, right_lo); |
| return lo_cond; |
| } |
| |
| static Condition EmitNullAwareInt64ComparisonOp(FlowGraphCompiler* compiler, |
| LocationSummary* locs, |
| Token::Kind kind, |
| BranchLabels labels) { |
| ASSERT((kind == Token::kEQ) || (kind == Token::kNE)); |
| const Register left = locs->in(0).reg(); |
| const Register right = locs->in(1).reg(); |
| const Register temp = locs->temp(0).reg(); |
| const Condition true_condition = TokenKindToIntCondition(kind); |
| compiler::Label* equal_result = |
| (true_condition == EQ) ? labels.true_label : labels.false_label; |
| compiler::Label* not_equal_result = |
| (true_condition == EQ) ? labels.false_label : labels.true_label; |
| |
| // Check if operands have the same value. If they don't, then they could |
| // be equal only if both of them are Mints with the same value. |
| __ cmp(left, compiler::Operand(right)); |
| __ b(equal_result, EQ); |
| __ and_(temp, left, compiler::Operand(right)); |
| __ BranchIfSmi(temp, not_equal_result); |
| __ CompareClassId(left, kMintCid, temp); |
| __ b(not_equal_result, NE); |
| __ CompareClassId(right, kMintCid, temp); |
| __ b(not_equal_result, NE); |
| __ LoadFieldFromOffset(temp, left, compiler::target::Mint::value_offset()); |
| __ LoadFieldFromOffset(TMP, right, compiler::target::Mint::value_offset()); |
| __ cmp(temp, compiler::Operand(TMP)); |
| __ LoadFieldFromOffset( |
| temp, left, |
| compiler::target::Mint::value_offset() + compiler::target::kWordSize, |
| compiler::kFourBytes, EQ); |
| __ LoadFieldFromOffset( |
| TMP, right, |
| compiler::target::Mint::value_offset() + compiler::target::kWordSize, |
| compiler::kFourBytes, EQ); |
| __ cmp(temp, compiler::Operand(TMP), EQ); |
| return true_condition; |
| } |
| |
| static Condition TokenKindToDoubleCondition(Token::Kind kind) { |
| switch (kind) { |
| case Token::kEQ: |
| return EQ; |
| case Token::kNE: |
| return NE; |
| case Token::kLT: |
| return LT; |
| case Token::kGT: |
| return GT; |
| case Token::kLTE: |
| return LE; |
| case Token::kGTE: |
| return GE; |
| default: |
| UNREACHABLE(); |
| return VS; |
| } |
| } |
| |
| static Condition EmitDoubleComparisonOp(FlowGraphCompiler* compiler, |
| LocationSummary* locs, |
| BranchLabels labels, |
| Token::Kind kind) { |
| const QRegister left = locs->in(0).fpu_reg(); |
| const QRegister right = locs->in(1).fpu_reg(); |
| const DRegister dleft = EvenDRegisterOf(left); |
| const DRegister dright = EvenDRegisterOf(right); |
| __ vcmpd(dleft, dright); |
| __ vmstat(); |
| Condition true_condition = TokenKindToDoubleCondition(kind); |
| if (true_condition != NE) { |
| // Special case for NaN comparison. Result is always false unless |
| // relational operator is !=. |
| __ b(labels.false_label, VS); |
| } |
| return true_condition; |
| } |
| |
| Condition EqualityCompareInstr::EmitComparisonCode(FlowGraphCompiler* compiler, |
| BranchLabels labels) { |
| if (is_null_aware()) { |
| ASSERT(operation_cid() == kMintCid); |
| return EmitNullAwareInt64ComparisonOp(compiler, locs(), kind(), labels); |
| } |
| if (operation_cid() == kSmiCid) { |
| return EmitSmiComparisonOp(compiler, locs(), kind()); |
| } else if (operation_cid() == kMintCid) { |
| return EmitUnboxedMintEqualityOp(compiler, locs(), kind()); |
| } else { |
| ASSERT(operation_cid() == kDoubleCid); |
| return EmitDoubleComparisonOp(compiler, locs(), labels, kind()); |
| } |
| } |
| |
| LocationSummary* TestSmiInstr::MakeLocationSummary(Zone* zone, bool opt) const { |
| const intptr_t kNumInputs = 2; |
| const intptr_t kNumTemps = 0; |
| LocationSummary* locs = new (zone) |
| LocationSummary(zone, kNumInputs, kNumTemps, LocationSummary::kNoCall); |
| locs->set_in(0, Location::RequiresRegister()); |
| // Only one input can be a constant operand. The case of two constant |
| // operands should be handled by constant propagation. |
| locs->set_in(1, LocationRegisterOrConstant(right())); |
| return locs; |
| } |
| |
| Condition TestSmiInstr::EmitComparisonCode(FlowGraphCompiler* compiler, |
| BranchLabels labels) { |
| const Register left = locs()->in(0).reg(); |
| Location right = locs()->in(1); |
| if (right.IsConstant()) { |
| ASSERT(compiler::target::IsSmi(right.constant())); |
| const int32_t imm = compiler::target::ToRawSmi(right.constant()); |
| __ TestImmediate(left, imm); |
| } else { |
| __ tst(left, compiler::Operand(right.reg())); |
| } |
| Condition true_condition = (kind() == Token::kNE) ? NE : EQ; |
| return true_condition; |
| } |
| |
| LocationSummary* TestCidsInstr::MakeLocationSummary(Zone* zone, |
| bool opt) const { |
| const intptr_t kNumInputs = 1; |
| const intptr_t kNumTemps = 1; |
| LocationSummary* locs = new (zone) |
| LocationSummary(zone, kNumInputs, kNumTemps, LocationSummary::kNoCall); |
| locs->set_in(0, Location::RequiresRegister()); |
| locs->set_temp(0, Location::RequiresRegister()); |
| locs->set_out(0, Location::RequiresRegister()); |
| return locs; |
| } |
| |
| Condition TestCidsInstr::EmitComparisonCode(FlowGraphCompiler* compiler, |
| BranchLabels labels) { |
| ASSERT((kind() == Token::kIS) || (kind() == Token::kISNOT)); |
| const Register val_reg = locs()->in(0).reg(); |
| const Register cid_reg = locs()->temp(0).reg(); |
| |
| compiler::Label* deopt = |
| CanDeoptimize() |
| ? compiler->AddDeoptStub(deopt_id(), ICData::kDeoptTestCids, |
| licm_hoisted_ ? ICData::kHoisted : 0) |
| : NULL; |
| |
| const intptr_t true_result = (kind() == Token::kIS) ? 1 : 0; |
| const ZoneGrowableArray<intptr_t>& data = cid_results(); |
| ASSERT(data[0] == kSmiCid); |
| bool result = data[1] == true_result; |
| __ tst(val_reg, compiler::Operand(kSmiTagMask)); |
| __ b(result ? labels.true_label : labels.false_label, EQ); |
| __ LoadClassId(cid_reg, val_reg); |
| |
| for (intptr_t i = 2; i < data.length(); i += 2) { |
| const intptr_t test_cid = data[i]; |
| ASSERT(test_cid != kSmiCid); |
| result = data[i + 1] == true_result; |
| __ CompareImmediate(cid_reg, test_cid); |
| __ b(result ? labels.true_label : labels.false_label, EQ); |
| } |
| // No match found, deoptimize or default action. |
| if (deopt == NULL) { |
| // If the cid is not in the list, jump to the opposite label from the cids |
| // that are in the list. These must be all the same (see asserts in the |
| // constructor). |
| compiler::Label* target = result ? labels.false_label : labels.true_label; |
| if (target != labels.fall_through) { |
| __ b(target); |
| } |
| } else { |
| __ b(deopt); |
| } |
| // Dummy result as this method already did the jump, there's no need |
| // for the caller to branch on a condition. |
| return kInvalidCondition; |
| } |
| |
| LocationSummary* RelationalOpInstr::MakeLocationSummary(Zone* zone, |
| bool opt) const { |
| const intptr_t kNumInputs = 2; |
| const intptr_t kNumTemps = 0; |
| if (operation_cid() == kMintCid) { |
| compiler::Operand o; |
| const intptr_t kNumTemps = 0; |
| LocationSummary* locs = new (zone) |
| LocationSummary(zone, kNumInputs, kNumTemps, LocationSummary::kNoCall); |
| if (CanBePairOfImmediateOperands(left(), &o, &o)) { |
| locs->set_in(0, Location::Constant(left()->definition()->AsConstant())); |
| locs->set_in(1, Location::Pair(Location::RequiresRegister(), |
| Location::RequiresRegister())); |
| } else if (CanBePairOfImmediateOperands(right(), &o, &o)) { |
| locs->set_in(0, Location::Pair(Location::RequiresRegister(), |
| Location::RequiresRegister())); |
| locs->set_in(1, Location::Constant(right()->definition()->AsConstant())); |
| } else { |
| locs->set_in(0, Location::Pair(Location::RequiresRegister(), |
| Location::RequiresRegister())); |
| locs->set_in(1, Location::Pair(Location::RequiresRegister(), |
| Location::RequiresRegister())); |
| } |
| locs->set_out(0, Location::RequiresRegister()); |
| return locs; |
| } |
| if (operation_cid() == kDoubleCid) { |
| LocationSummary* summary = new (zone) |
| LocationSummary(zone, kNumInputs, kNumTemps, LocationSummary::kNoCall); |
| summary->set_in(0, Location::RequiresFpuRegister()); |
| summary->set_in(1, Location::RequiresFpuRegister()); |
| summary->set_out(0, Location::RequiresRegister()); |
| return summary; |
| } |
| ASSERT(operation_cid() == kSmiCid); |
| LocationSummary* summary = new (zone) |
| LocationSummary(zone, kNumInputs, kNumTemps, LocationSummary::kNoCall); |
| summary->set_in(0, LocationRegisterOrConstant(left())); |
| // Only one input can be a constant operand. The case of two constant |
| // operands should be handled by constant propagation. |
| summary->set_in(1, summary->in(0).IsConstant() |
| ? Location::RequiresRegister() |
| : LocationRegisterOrConstant(right())); |
| summary->set_out(0, Location::RequiresRegister()); |
| return summary; |
| } |
| |
| Condition RelationalOpInstr::EmitComparisonCode(FlowGraphCompiler* compiler, |
| BranchLabels labels) { |
| if (operation_cid() == kSmiCid) { |
| return EmitSmiComparisonOp(compiler, locs(), kind()); |
| } else if (operation_cid() == kMintCid) { |
| return EmitUnboxedMintComparisonOp(compiler, locs(), kind(), labels); |
| } else { |
| ASSERT(operation_cid() == kDoubleCid); |
| return EmitDoubleComparisonOp(compiler, locs(), labels, kind()); |
| } |
| } |
| |
| void NativeCallInstr::EmitNativeCode(FlowGraphCompiler* compiler) { |
| SetupNative(); |
| const Register result = locs()->out(0).reg(); |
| |
| // All arguments are already @SP due to preceding PushArgument()s. |
| ASSERT(ArgumentCount() == |
| function().NumParameters() + (function().IsGeneric() ? 1 : 0)); |
| |
| // Push the result place holder initialized to NULL. |
| __ PushObject(Object::null_object()); |
| |
| // Pass a pointer to the first argument in R2. |
| __ add(R2, SP, |
| compiler::Operand(ArgumentCount() * compiler::target::kWordSize)); |
| |
| // Compute the effective address. When running under the simulator, |
| // this is a redirection address that forces the simulator to call |
| // into the runtime system. |
| uword entry; |
| const intptr_t argc_tag = NativeArguments::ComputeArgcTag(function()); |
| const Code* stub; |
| if (link_lazily()) { |
| stub = &StubCode::CallBootstrapNative(); |
| entry = NativeEntry::LinkNativeCallEntry(); |
| } else { |
| entry = reinterpret_cast<uword>(native_c_function()); |
| if (is_bootstrap_native()) { |
| stub = &StubCode::CallBootstrapNative(); |
| } else if (is_auto_scope()) { |
| stub = &StubCode::CallAutoScopeNative(); |
| } else { |
| stub = &StubCode::CallNoScopeNative(); |
| } |
| } |
| __ LoadImmediate(R1, argc_tag); |
| compiler::ExternalLabel label(entry); |
| __ LoadNativeEntry(R9, &label, |
| link_lazily() |
| ? compiler::ObjectPoolBuilderEntry::kPatchable |
| : compiler::ObjectPoolBuilderEntry::kNotPatchable); |
| if (link_lazily()) { |
| compiler->GeneratePatchableCall(source(), *stub, |
| UntaggedPcDescriptors::kOther, locs()); |
| } else { |
| // We can never lazy-deopt here because natives are never optimized. |
| ASSERT(!compiler->is_optimizing()); |
| compiler->GenerateNonLazyDeoptableStubCall( |
| source(), *stub, UntaggedPcDescriptors::kOther, locs()); |
| } |
| __ Pop(result); |
| |
| __ Drop(ArgumentCount()); // Drop the arguments. |
| } |
| |
| LocationSummary* FfiCallInstr::MakeLocationSummary(Zone* zone, |
| bool is_optimizing) const { |
| return MakeLocationSummaryInternal(zone, is_optimizing, R0); |
| } |
| |
| void FfiCallInstr::EmitNativeCode(FlowGraphCompiler* compiler) { |
| // For regular calls, this holds the FP for rebasing the original locations |
| // during EmitParamMoves. |
| // For leaf calls, this holds the SP used to restore the pre-aligned SP after |
| // the call. |
| const Register saved_fp_or_sp = locs()->temp(0).reg(); |
| RELEASE_ASSERT((CallingConventions::kCalleeSaveCpuRegisters & |
| (1 << saved_fp_or_sp)) != 0); |
| const Register temp1 = locs()->temp(1).reg(); |
| const Register temp2 = locs()->temp(2).reg(); |
| const Register branch = locs()->in(TargetAddressIndex()).reg(); |
| |
| // Ensure these are callee-saved register and are preserved across the call. |
| ASSERT((CallingConventions::kCalleeSaveCpuRegisters & |
| (1 << saved_fp_or_sp)) != 0); |
| // temp doesn't need to be preserved. |
| |
| __ mov(saved_fp_or_sp, |
| is_leaf_ ? compiler::Operand(SPREG) : compiler::Operand(FPREG)); |
| |
| if (!is_leaf_) { |
| // Make a space to put the return address. |
| __ PushImmediate(0); |
| |
| // We need to create a dummy "exit frame". It will have a null code object. |
| __ LoadObject(CODE_REG, Object::null_object()); |
| __ set_constant_pool_allowed(false); |
| __ EnterDartFrame(0, /*load_pool_pointer=*/false); |
| } |
| |
| // Reserve space for the arguments that go on the stack (if any), then align. |
| __ ReserveAlignedFrameSpace(marshaller_.RequiredStackSpaceInBytes()); |
| |
| EmitParamMoves(compiler, is_leaf_ ? FPREG : saved_fp_or_sp, temp1); |
| |
| if (compiler::Assembler::EmittingComments()) { |
| __ Comment(is_leaf_ ? "Leaf Call" : "Call"); |
| } |
| |
| if (is_leaf_) { |
| __ blx(branch); |
| } else { |
| // We need to copy the return address up into the dummy stack frame so the |
| // stack walker will know which safepoint to use. |
| __ mov(temp1, compiler::Operand(PC)); |
| __ str(temp1, compiler::Address(FPREG, kSavedCallerPcSlotFromFp * |
| compiler::target::kWordSize)); |
| |
| // For historical reasons, the PC on ARM points 8 bytes past the current |
| // instruction. Therefore we emit the metadata here, 8 bytes |
| // (2 instructions) after the original mov. |
| compiler->EmitCallsiteMetadata(InstructionSource(), deopt_id(), |
| UntaggedPcDescriptors::Kind::kOther, locs(), |
| env()); |
| |
| // Update information in the thread object and enter a safepoint. |
| if (CanExecuteGeneratedCodeInSafepoint()) { |
| __ LoadImmediate(temp1, compiler::target::Thread::exit_through_ffi()); |
| __ TransitionGeneratedToNative(branch, FPREG, temp1, saved_fp_or_sp, |
| /*enter_safepoint=*/true); |
| |
| __ blx(branch); |
| |
| // Update information in the thread object and leave the safepoint. |
| __ TransitionNativeToGenerated(saved_fp_or_sp, temp1, |
| /*leave_safepoint=*/true); |
| } else { |
| // We cannot trust that this code will be executable within a safepoint. |
| // Therefore we delegate the responsibility of entering/exiting the |
| // safepoint to a stub which in the VM isolate's heap, which will never |
| // lose execute permission. |
| __ ldr(temp1, |
| compiler::Address( |
| THR, compiler::target::Thread:: |
| call_native_through_safepoint_entry_point_offset())); |
| |
| // Calls R8 in a safepoint and clobbers R4 and NOTFP. |
| ASSERT(branch == R8); |
| static_assert((kReservedCpuRegisters & (1 << NOTFP)) != 0, |
| "NOTFP should be a reserved register"); |
| __ blx(temp1); |
| } |
| |
| // Restore the global object pool after returning from runtime (old space is |
| // moving, so the GOP could have been relocated). |
| if (FLAG_precompiled_mode && FLAG_use_bare_instructions) { |
| __ SetupGlobalPoolAndDispatchTable(); |
| } |
| } |
| |
| EmitReturnMoves(compiler, temp1, temp2); |
| |
| if (is_leaf_) { |
| // Restore the pre-aligned SP. |
| __ mov(SPREG, compiler::Operand(saved_fp_or_sp)); |
| } else { |
| // Leave dummy exit frame. |
| __ LeaveDartFrame(); |
| __ set_constant_pool_allowed(true); |
| |
| // Instead of returning to the "fake" return address, we just pop it. |
| __ PopRegister(temp1); |
| } |
| } |
| |
| // Keep in sync with NativeEntryInstr::EmitNativeCode. |
| void NativeReturnInstr::EmitNativeCode(FlowGraphCompiler* compiler) { |
| EmitReturnMoves(compiler); |
| |
| __ LeaveDartFrame(); |
| |
| // The dummy return address is in LR, no need to pop it as on Intel. |
| |
| // These can be anything besides the return registers (R0 and R1) and THR |
| // (R10). |
| const Register vm_tag_reg = R2; |
| const Register old_exit_frame_reg = R3; |
| const Register old_exit_through_ffi_reg = R4; |
| const Register tmp = R5; |
| |
| __ Pop(old_exit_frame_reg); |
| __ Pop(old_exit_through_ffi_reg); |
| |
| // Restore top_resource. |
| __ Pop(tmp); |
| __ StoreToOffset(tmp, THR, compiler::target::Thread::top_resource_offset()); |
| |
| __ Pop(vm_tag_reg); |
| |
| // If we were called by a trampoline, it will enter the safepoint on our |
| // behalf. |
| __ TransitionGeneratedToNative( |
| vm_tag_reg, old_exit_frame_reg, old_exit_through_ffi_reg, tmp, |
| /*enter_safepoint=*/!NativeCallbackTrampolines::Enabled()); |
| |
| __ PopNativeCalleeSavedRegisters(); |
| |
| #if defined(DART_TARGET_OS_FUCHSIA) && defined(USING_SHADOW_CALL_STACK) |
| #error Unimplemented |
| #endif |
| |
| // Leave the entry frame. |
| RESTORES_LR_FROM_FRAME(__ LeaveFrame(1 << LR | 1 << FP)); |
| |
| // Leave the dummy frame holding the pushed arguments. |
| RESTORES_LR_FROM_FRAME(__ LeaveFrame(1 << LR | 1 << FP)); |
| |
| __ Ret(); |
| |
| // For following blocks. |
| __ set_constant_pool_allowed(true); |
| } |
| |
| // Keep in sync with NativeReturnInstr::EmitNativeCode and ComputeInnerLRState. |
| void NativeEntryInstr::EmitNativeCode(FlowGraphCompiler* compiler) { |
| // Constant pool cannot be used until we enter the actual Dart frame. |
| __ set_constant_pool_allowed(false); |
| |
| __ Bind(compiler->GetJumpLabel(this)); |
| |
| // Create a dummy frame holding the pushed arguments. This simplifies |
| // NativeReturnInstr::EmitNativeCode. |
| SPILLS_LR_TO_FRAME(__ EnterFrame((1 << FP) | (1 << LR), 0)); |
| |
| // Save the argument registers, in reverse order. |
| SaveArguments(compiler); |
| |
| // Enter the entry frame. |
| SPILLS_LR_TO_FRAME(__ EnterFrame((1 << FP) | (1 << LR), 0)); |
| |
| // Save a space for the code object. |
| __ PushImmediate(0); |
| |
| #if defined(DART_TARGET_OS_FUCHSIA) && defined(USING_SHADOW_CALL_STACK) |
| #error Unimplemented |
| #endif |
| |
| __ PushNativeCalleeSavedRegisters(); |
| |
| // Load the thread object. If we were called by a trampoline, the thread is |
| // already loaded. |
| if (FLAG_precompiled_mode) { |
| compiler->LoadBSSEntry(BSS::Relocation::DRT_GetThreadForNativeCallback, R1, |
| R0); |
| } else if (!NativeCallbackTrampolines::Enabled()) { |
| // In JIT mode, we can just paste the address of the runtime entry into the |
| // generated code directly. This is not a problem since we don't save |
| // callbacks into JIT snapshots. |
| ASSERT(kWordSize == compiler::target::kWordSize); |
| __ LoadImmediate( |
| R1, static_cast<compiler::target::uword>( |
| reinterpret_cast<uword>(DLRT_GetThreadForNativeCallback))); |
| } |
| |
| // Load the thread object. If we were called by a trampoline, the thread is |
| // already loaded. |
| if (!NativeCallbackTrampolines::Enabled()) { |
| // Create another frame to align the frame before continuing in "native" |
| // code. |
| __ EnterFrame(1 << FP, 0); |
| __ ReserveAlignedFrameSpace(0); |
| |
| __ LoadImmediate(R0, callback_id_); |
| __ blx(R1); |
| __ mov(THR, compiler::Operand(R0)); |
| |
| __ LeaveFrame(1 << FP); |
| } |
| |
| // Save the current VMTag on the stack. |
| __ LoadFromOffset(R0, THR, compiler::target::Thread::vm_tag_offset()); |
| __ Push(R0); |
| |
| // Save top resource. |
| const intptr_t top_resource_offset = |
| compiler::target::Thread::top_resource_offset(); |
| __ LoadFromOffset(R0, THR, top_resource_offset); |
| __ Push(R0); |
| __ LoadImmediate(R0, 0); |
| __ StoreToOffset(R0, THR, top_resource_offset); |
| |
| __ LoadFromOffset(R0, THR, |
| compiler::target::Thread::exit_through_ffi_offset()); |
| __ Push(R0); |
| |
| // Save top exit frame info. Don't set it to 0 yet, |
| // TransitionNativeToGenerated will handle that. |
| __ LoadFromOffset(R0, THR, |
| compiler::target::Thread::top_exit_frame_info_offset()); |
| __ Push(R0); |
| |
| __ EmitEntryFrameVerification(R0); |
| |
| // Either DLRT_GetThreadForNativeCallback or the callback trampoline (caller) |
| // will leave the safepoint for us. |
| __ TransitionNativeToGenerated(/*scratch0=*/R0, /*scratch1=*/R1, |
| /*exit_safepoint=*/false); |
| |
| // Now that the safepoint has ended, we can touch Dart objects without |
| // handles. |
| |
| // Load the code object. |
| __ LoadFromOffset(R0, THR, compiler::target::Thread::callback_code_offset()); |
| __ LoadFieldFromOffset(R0, R0, |
| compiler::target::GrowableObjectArray::data_offset()); |
| __ LoadFieldFromOffset(CODE_REG, R0, |
| compiler::target::Array::data_offset() + |
| callback_id_ * compiler::target::kWordSize); |
| |
| // Put the code object in the reserved slot. |
| __ StoreToOffset(CODE_REG, FPREG, |
| kPcMarkerSlotFromFp * compiler::target::kWordSize); |
| if (FLAG_precompiled_mode && FLAG_use_bare_instructions) { |
| __ SetupGlobalPoolAndDispatchTable(); |
| } else { |
| __ LoadImmediate(PP, 0); // GC safe value into PP. |
| } |
| |
| // Load a GC-safe value for the arguments descriptor (unused but tagged). |
| __ LoadImmediate(ARGS_DESC_REG, 0); |
| |
| // Load a dummy return address which suggests that we are inside of |
| // InvokeDartCodeStub. This is how the stack walker detects an entry frame. |
| CLOBBERS_LR({ |
| __ LoadFromOffset(LR, THR, |
| compiler::target::Thread::invoke_dart_code_stub_offset()); |
| __ LoadFieldFromOffset(LR, LR, |
| compiler::target::Code::entry_point_offset()); |
| }); |
| |
| FunctionEntryInstr::EmitNativeCode(compiler); |
| } |
| |
| LocationSummary* OneByteStringFromCharCodeInstr::MakeLocationSummary( |
| Zone* zone, |
| bool opt) const { |
| const intptr_t kNumInputs = 1; |
| // TODO(fschneider): Allow immediate operands for the char code. |
| return LocationSummary::Make(zone, kNumInputs, Location::RequiresRegister(), |
| LocationSummary::kNoCall); |
| } |
| |
| void OneByteStringFromCharCodeInstr::EmitNativeCode( |
| FlowGraphCompiler* compiler) { |
| ASSERT(compiler->is_optimizing()); |
| const Register char_code = locs()->in(0).reg(); |
| const Register result = locs()->out(0).reg(); |
| |
| __ ldr( |
| result, |
| compiler::Address( |
| THR, compiler::target::Thread::predefined_symbols_address_offset())); |
| __ AddImmediate( |
| result, Symbols::kNullCharCodeSymbolOffset * compiler::target::kWordSize); |
| __ ldr(result, |
| compiler::Address(result, char_code, LSL, 1)); // Char code is a smi. |
| } |
| |
| LocationSummary* StringToCharCodeInstr::MakeLocationSummary(Zone* zone, |
| bool opt) const { |
| const intptr_t kNumInputs = 1; |
| return LocationSummary::Make(zone, kNumInputs, Location::RequiresRegister(), |
| LocationSummary::kNoCall); |
| } |
| |
| void StringToCharCodeInstr::EmitNativeCode(FlowGraphCompiler* compiler) { |
| ASSERT(cid_ == kOneByteStringCid); |
| const Register str = locs()->in(0).reg(); |
| const Register result = locs()->out(0).reg(); |
| __ ldr(result, compiler::FieldAddress( |
| str, compiler::target::String::length_offset())); |
| __ cmp(result, compiler::Operand(compiler::target::ToRawSmi(1))); |
| __ LoadImmediate(result, -1, NE); |
| __ ldrb(result, |
| compiler::FieldAddress( |
| str, compiler::target::OneByteString::data_offset()), |
| EQ); |
| __ SmiTag(result); |
| } |
| |
| LocationSummary* Utf8ScanInstr::MakeLocationSummary(Zone* zone, |
| bool opt) const { |
| const intptr_t kNumInputs = 5; |
| const intptr_t kNumTemps = 0; |
| LocationSummary* summary = new (zone) |
| LocationSummary(zone, kNumInputs, kNumTemps, LocationSummary::kNoCall); |
| summary->set_in(0, Location::Any()); // decoder |
| summary->set_in(1, Location::WritableRegister()); // bytes |
| summary->set_in(2, Location::WritableRegister()); // start |
| summary->set_in(3, Location::WritableRegister()); // end |
| summary->set_in(4, Location::WritableRegister()); // table |
| summary->set_out(0, Location::RequiresRegister()); |
| return summary; |
| } |
| |
| void Utf8ScanInstr::EmitNativeCode(FlowGraphCompiler* compiler) { |
| const Register bytes_reg = locs()->in(1).reg(); |
| const Register start_reg = locs()->in(2).reg(); |
| const Register end_reg = locs()->in(3).reg(); |
| const Register table_reg = locs()->in(4).reg(); |
| const Register size_reg = locs()->out(0).reg(); |
| |
| const Register bytes_ptr_reg = start_reg; |
| const Register bytes_end_reg = end_reg; |
| const Register flags_reg = bytes_reg; |
| const Register temp_reg = TMP; |
| const Register decoder_temp_reg = start_reg; |
| const Register flags_temp_reg = end_reg; |
| |
| static const intptr_t kSizeMask = 0x03; |
| static const intptr_t kFlagsMask = 0x3C; |
| |
| compiler::Label loop, loop_in; |
| |
| // Address of input bytes. |
| __ LoadFieldFromOffset(bytes_reg, bytes_reg, |
| compiler::target::TypedDataBase::data_field_offset()); |
| |
| // Table. |
| __ AddImmediate( |
| table_reg, table_reg, |
| compiler::target::OneByteString::data_offset() - kHeapObjectTag); |
| |
| // Pointers to start and end. |
| __ add(bytes_ptr_reg, bytes_reg, compiler::Operand(start_reg)); |
| __ add(bytes_end_reg, bytes_reg, compiler::Operand(end_reg)); |
| |
| // Initialize size and flags. |
| __ LoadImmediate(size_reg, 0); |
| __ LoadImmediate(flags_reg, 0); |
| |
| __ b(&loop_in); |
| __ Bind(&loop); |
| |
| // Read byte and increment pointer. |
| __ ldrb(temp_reg, |
| compiler::Address(bytes_ptr_reg, 1, compiler::Address::PostIndex)); |
| |
| // Update size and flags based on byte value. |
| __ ldrb(temp_reg, compiler::Address(table_reg, temp_reg)); |
| __ orr(flags_reg, flags_reg, compiler::Operand(temp_reg)); |
| __ and_(temp_reg, temp_reg, compiler::Operand(kSizeMask)); |
| __ add(size_reg, size_reg, compiler::Operand(temp_reg)); |
| |
| // Stop if end is reached. |
| __ Bind(&loop_in); |
| __ cmp(bytes_ptr_reg, compiler::Operand(bytes_end_reg)); |
| __ b(&loop, UNSIGNED_LESS); |
| |
| // Write flags to field. |
| __ AndImmediate(flags_reg, flags_reg, kFlagsMask); |
| if (!IsScanFlagsUnboxed()) { |
| __ SmiTag(flags_reg); |
| } |
| Register decoder_reg; |
| const Location decoder_location = locs()->in(0); |
| if (decoder_location.IsStackSlot()) { |
| __ ldr(decoder_temp_reg, LocationToStackSlotAddress(decoder_location)); |
| decoder_reg = decoder_temp_reg; |
| } else { |
| decoder_reg = decoder_location.reg(); |
| } |
| const auto scan_flags_field_offset = scan_flags_field_.offset_in_bytes(); |
| __ LoadFieldFromOffset(flags_temp_reg, decoder_reg, scan_flags_field_offset); |
| __ orr(flags_temp_reg, flags_temp_reg, compiler::Operand(flags_reg)); |
| __ StoreFieldToOffset(flags_temp_reg, decoder_reg, scan_flags_field_offset); |
| } |
| |
| LocationSummary* LoadUntaggedInstr::MakeLocationSummary(Zone* zone, |
| bool opt) const { |
| const intptr_t kNumInputs = 1; |
| return LocationSummary::Make(zone, kNumInputs, Location::RequiresRegister(), |
| LocationSummary::kNoCall); |
| } |
| |
| void LoadUntaggedInstr::EmitNativeCode(FlowGraphCompiler* compiler) { |
| const Register obj = locs()->in(0).reg(); |
| const Register result = locs()->out(0).reg(); |
| if (object()->definition()->representation() == kUntagged) { |
| __ LoadFromOffset(result, obj, offset()); |
| } else { |
| ASSERT(object()->definition()->representation() == kTagged); |
| __ LoadFieldFromOffset(result, obj, offset()); |
| } |
| } |
| |
| static bool CanBeImmediateIndex(Value* value, |
| intptr_t cid, |
| bool is_external, |
| bool is_load, |
| bool* needs_base) { |
| if ((cid == kTypedDataInt32x4ArrayCid) || |
| (cid == kTypedDataFloat32x4ArrayCid) || |
| (cid == kTypedDataFloat64x2ArrayCid)) { |
| // We are using vldmd/vstmd which do not support offset. |
| return false; |
| } |
| |
| ConstantInstr* constant = value->definition()->AsConstant(); |
| if ((constant == NULL) || |
| !compiler::Assembler::IsSafeSmi(constant->value())) { |
| return false; |
| } |
| const int64_t index = compiler::target::SmiValue(constant->value()); |
| const intptr_t scale = compiler::target::Instance::ElementSizeFor(cid); |
| const intptr_t base_offset = |
| (is_external ? 0 : (Instance::DataOffsetFor(cid) - kHeapObjectTag)); |
| const int64_t offset = index * scale + base_offset; |
| if (!Utils::IsAbsoluteUint(12, offset)) { |
| return false; |
| } |
| if (compiler::Address::CanHoldImmediateOffset(is_load, cid, offset)) { |
| *needs_base = false; |
| return true; |
| } |
| |
| if (compiler::Address::CanHoldImmediateOffset(is_load, cid, |
| offset - base_offset)) { |
| *needs_base = true; |
| return true; |
| } |
| |
| return false; |
| } |
| |
| LocationSummary* LoadIndexedInstr::MakeLocationSummary(Zone* zone, |
| bool opt) const { |
| const bool directly_addressable = |
| aligned() && representation() != kUnboxedInt64; |
| const intptr_t kNumInputs = 2; |
| intptr_t kNumTemps = 0; |
| |
| if (!directly_addressable) { |
| kNumTemps += 1; |
| if (representation() == kUnboxedDouble) { |
| kNumTemps += 1; |
| } |
| } |
| LocationSummary* locs = new (zone) |
| LocationSummary(zone, kNumInputs, kNumTemps, LocationSummary::kNoCall); |
| locs->set_in(0, Location::RequiresRegister()); |
| bool needs_base = false; |
| if (CanBeImmediateIndex(index(), class_id(), IsExternal(), |
| true, // Load. |
| &needs_base)) { |
| // CanBeImmediateIndex must return false for unsafe smis. |
| locs->set_in(1, Location::Constant(index()->definition()->AsConstant())); |
| } else { |
| locs->set_in(1, Location::RequiresRegister()); |
| } |
| if ((representation() == kUnboxedDouble) || |
| (representation() == kUnboxedFloat32x4) || |
| (representation() == kUnboxedInt32x4) || |
| (representation() == kUnboxedFloat64x2)) { |
| if (class_id() == kTypedDataFloat32ArrayCid) { |
| // Need register < Q7 for float operations. |
| // TODO(30953): Support register range constraints in the regalloc. |
| locs->set_out(0, Location::FpuRegisterLocation(Q6)); |
| } else { |
| locs->set_out(0, Location::RequiresFpuRegister()); |
| } |
| } else if (representation() == kUnboxedInt64) { |
| ASSERT(class_id() == kTypedDataInt64ArrayCid || |
| class_id() == kTypedDataUint64ArrayCid); |
| locs->set_out(0, Location::Pair(Location::RequiresRegister(), |
| Location::RequiresRegister())); |
| } else { |
| locs->set_out(0, Location::RequiresRegister()); |
| } |
| if (!directly_addressable) { |
| locs->set_temp(0, Location::RequiresRegister()); |
| if (representation() == kUnboxedDouble) { |
| locs->set_temp(1, Location::RequiresRegister()); |
| } |
| } |
| return locs; |
| } |
| |
| void LoadIndexedInstr::EmitNativeCode(FlowGraphCompiler* compiler) { |
| const bool directly_addressable = |
| aligned() && representation() != kUnboxedInt64; |
| // The array register points to the backing store for external arrays. |
| const Register array = locs()->in(0).reg(); |
| const Location index = locs()->in(1); |
| const Register address = |
| directly_addressable ? kNoRegister : locs()->temp(0).reg(); |
| |
| compiler::Address element_address(kNoRegister); |
| if (directly_addressable) { |
| element_address = |
| index.IsRegister() |
| ? __ ElementAddressForRegIndex(true, // Load. |
| IsExternal(), class_id(), |
| index_scale(), index_unboxed_, array, |
| index.reg()) |
| : __ ElementAddressForIntIndex( |
| true, // Load. |
| IsExternal(), class_id(), index_scale(), array, |
| compiler::target::SmiValue(index.constant()), |
| IP); // Temp register. |
| // Warning: element_address may use register IP as base. |
| } else { |
| if (index.IsRegister()) { |
| __ LoadElementAddressForRegIndex(address, |
| true, // Load. |
| IsExternal(), class_id(), index_scale(), |
| index_unboxed_, array, index.reg()); |
| } else { |
| __ LoadElementAddressForIntIndex( |
| address, |
| true, // Load. |
| IsExternal(), class_id(), index_scale(), array, |
| compiler::target::SmiValue(index.constant())); |
| } |
| } |
| |
| if ((representation() == kUnboxedDouble) || |
| (representation() == kUnboxedFloat32x4) || |
| (representation() == kUnboxedInt32x4) || |
| (representation() == kUnboxedFloat64x2)) { |
| const QRegister result = locs()->out(0).fpu_reg(); |
| const DRegister dresult0 = EvenDRegisterOf(result); |
| switch (class_id()) { |
| case kTypedDataFloat32ArrayCid: |
| // Load single precision float. |
| // vldrs does not support indexed addressing. |
| if (aligned()) { |
| __ vldrs(EvenSRegisterOf(dresult0), element_address); |
| } else { |
| const Register value = locs()->temp(1).reg(); |
| __ LoadWordUnaligned(value, address, TMP); |
| __ vmovsr(EvenSRegisterOf(dresult0), value); |
| } |
| break; |
| case kTypedDataFloat64ArrayCid: |
| // vldrd does not support indexed addressing. |
| if (aligned()) { |
| __ vldrd(dresult0, element_address); |
| } else { |
| const Register value = locs()->temp(1).reg(); |
| __ LoadWordUnaligned(value, address, TMP); |
| __ vmovdr(dresult0, 0, value); |
| __ AddImmediate(address, address, 4); |
| __ LoadWordUnaligned(value, address, TMP); |
| __ vmovdr(dresult0, 1, value); |
| } |
| break; |
| case kTypedDataFloat64x2ArrayCid: |
| case kTypedDataInt32x4ArrayCid: |
| case kTypedDataFloat32x4ArrayCid: |
| ASSERT(element_address.Equals(compiler::Address(IP))); |
| ASSERT(aligned()); |
| __ vldmd(IA, IP, dresult0, 2); |
| break; |
| default: |
| UNREACHABLE(); |
| } |
| return; |
| } |
| |
| switch (class_id()) { |
| case kTypedDataInt32ArrayCid: { |
| const Register result = locs()->out(0).reg(); |
| ASSERT(representation() == kUnboxedInt32); |
| if (aligned()) { |
| __ ldr(result, element_address); |
| } else { |
| __ LoadWordUnaligned(result, address, TMP); |
| } |
| break; |
| } |
| case kTypedDataUint32ArrayCid: { |
| const Register result = locs()->out(0).reg(); |
| ASSERT(representation() == kUnboxedUint32); |
| if (aligned()) { |
| __ ldr(result, element_address); |
| } else { |
| __ LoadWordUnaligned(result, address, TMP); |
| } |
| break; |
| } |
| case kTypedDataInt64ArrayCid: |
| case kTypedDataUint64ArrayCid: { |
| ASSERT(representation() == kUnboxedInt64); |
| ASSERT(!directly_addressable); // need to add to register |
| ASSERT(locs()->out(0).IsPairLocation()); |
| PairLocation* result_pair = locs()->out(0).AsPairLocation(); |
| const Register result_lo = result_pair->At(0).reg(); |
| const Register result_hi = result_pair->At(1).reg(); |
| if (aligned()) { |
| __ ldr(result_lo, compiler::Address(address)); |
| __ ldr(result_hi, |
| compiler::Address(address, compiler::target::kWordSize)); |
| } else { |
| __ LoadWordUnaligned(result_lo, address, TMP); |
| __ AddImmediate(address, address, compiler::target::kWordSize); |
| __ LoadWordUnaligned(result_hi, address, TMP); |
| } |
| break; |
| } |
| case kTypedDataInt8ArrayCid: { |
| const Register result = locs()->out(0).reg(); |
| ASSERT(representation() == kUnboxedIntPtr); |
| ASSERT(index_scale() == 1); |
| ASSERT(aligned()); |
| __ ldrsb(result, element_address); |
| break; |
| } |
| case kTypedDataUint8ArrayCid: |
| case kTypedDataUint8ClampedArrayCid: |
| case kExternalTypedDataUint8ArrayCid: |
| case kExternalTypedDataUint8ClampedArrayCid: |
| case kOneByteStringCid: |
| case kExternalOneByteStringCid: { |
| const Register result = locs()->out(0).reg(); |
| ASSERT(representation() == kUnboxedIntPtr); |
| ASSERT(index_scale() == 1); |
| ASSERT(aligned()); |
| __ ldrb(result, element_address); |
| break; |
| } |
| case kTypedDataInt16ArrayCid: { |
| const Register result = locs()->out(0).reg(); |
| ASSERT(representation() == kUnboxedIntPtr); |
| if (aligned()) { |
| __ ldrsh(result, element_address); |
| } else { |
| __ LoadHalfWordUnaligned(result, address, TMP); |
| } |
| break; |
| } |
| case kTypedDataUint16ArrayCid: |
| case kTwoByteStringCid: |
| case kExternalTwoByteStringCid: { |
| const Register result = locs()->out(0).reg(); |
| ASSERT(representation() == kUnboxedIntPtr); |
| if (aligned()) { |
| __ ldrh(result, element_address); |
| } else { |
| __ LoadHalfWordUnsignedUnaligned(result, address, TMP); |
| } |
| break; |
| } |
| default: { |
| const Register result = locs()->out(0).reg(); |
| ASSERT(representation() == kTagged); |
| ASSERT((class_id() == kArrayCid) || (class_id() == kImmutableArrayCid) || |
| (class_id() == kTypeArgumentsCid)); |
| __ ldr(result, element_address); |
| break; |
| } |
| } |
| } |
| |
| LocationSummary* StoreIndexedInstr::MakeLocationSummary(Zone* zone, |
| bool opt) const { |
| const bool directly_addressable = |
| aligned() && class_id() != kTypedDataInt64ArrayCid && |
| class_id() != kTypedDataUint64ArrayCid && class_id() != kArrayCid; |
| const intptr_t kNumInputs = 3; |
| LocationSummary* locs; |
| |
| bool needs_base = false; |
| intptr_t kNumTemps = 0; |
| if (CanBeImmediateIndex(index(), class_id(), IsExternal(), |
| false, // Store. |
| &needs_base)) { |
| if (!directly_addressable) { |
| kNumTemps += 2; |
| } else if (needs_base) { |
| kNumTemps += 1; |
| } |
| |
| locs = new (zone) |
| LocationSummary(zone, kNumInputs, kNumTemps, LocationSummary::kNoCall); |
| |
| // CanBeImmediateIndex must return false for unsafe smis. |
| locs->set_in(1, Location::Constant(index()->definition()->AsConstant())); |
| } else { |
| if (!directly_addressable) { |
| kNumTemps += 2; |
| } |
| |
| locs = new (zone) |
| LocationSummary(zone, kNumInputs, kNumTemps, LocationSummary::kNoCall); |
| |
| locs->set_in(1, Location::WritableRegister()); |
| } |
| locs->set_in(0, Location::RequiresRegister()); |
| for (intptr_t i = 0; i < kNumTemps; i++) { |
| locs->set_temp(i, Location::RequiresRegister()); |
| } |
| |
| switch (class_id()) { |
| case kArrayCid: |
| locs->set_in(2, ShouldEmitStoreBarrier() |
| ? Location::RegisterLocation(kWriteBarrierValueReg) |
| : LocationRegisterOrConstant(value())); |
| if (ShouldEmitStoreBarrier()) { |
| locs->set_in(0, Location::RegisterLocation(kWriteBarrierObjectReg)); |
| locs->set_temp(0, Location::RegisterLocation(kWriteBarrierSlotReg)); |
| } |
| break; |
| case kExternalTypedDataUint8ArrayCid: |
| case kExternalTypedDataUint8ClampedArrayCid: |
| case kTypedDataInt8ArrayCid: |
| case kTypedDataUint8ArrayCid: |
| case kTypedDataUint8ClampedArrayCid: |
| case kOneByteStringCid: |
| case kTwoByteStringCid: |
| case kTypedDataInt16ArrayCid: |
| case kTypedDataUint16ArrayCid: |
| case kTypedDataInt32ArrayCid: |
| case kTypedDataUint32ArrayCid: |
| locs->set_in(2, Location::RequiresRegister()); |
| break; |
| case kTypedDataInt64ArrayCid: |
| case kTypedDataUint64ArrayCid: |
| locs->set_in(2, Location::Pair(Location::RequiresRegister(), |
| Location::RequiresRegister())); |
| break; |
| case kTypedDataFloat32ArrayCid: |
| // Need low register (< Q7). |
| locs->set_in(2, Location::FpuRegisterLocation(Q6)); |
| break; |
| case kTypedDataFloat64ArrayCid: // TODO(srdjan): Support Float64 constants. |
| case kTypedDataInt32x4ArrayCid: |
| case kTypedDataFloat32x4ArrayCid: |
| case kTypedDataFloat64x2ArrayCid: |
| locs->set_in(2, Location::RequiresFpuRegister()); |
| break; |
| default: |
| UNREACHABLE(); |
| return NULL; |
| } |
| |
| return locs; |
| } |
| |
| void StoreIndexedInstr::EmitNativeCode(FlowGraphCompiler* compiler) { |
| const bool directly_addressable = |
| aligned() && class_id() != kTypedDataInt64ArrayCid && |
| class_id() != kTypedDataUint64ArrayCid && class_id() != kArrayCid; |
| // The array register points to the backing store for external arrays. |
| const Register array = locs()->in(0).reg(); |
| const Location index = locs()->in(1); |
| const Register temp = |
| (locs()->temp_count() > 0) ? locs()->temp(0).reg() : kNoRegister; |
| const Register temp2 = |
| (locs()->temp_count() > 1) ? locs()->temp(1).reg() : kNoRegister; |
| |
| compiler::Address element_address(kNoRegister); |
| if (directly_addressable) { |
| element_address = |
| index.IsRegister() |
| ? __ ElementAddressForRegIndex(false, // Store. |
| IsExternal(), class_id(), |
| index_scale(), index_unboxed_, array, |
| index.reg()) |
| : __ ElementAddressForIntIndex( |
| false, // Store. |
| IsExternal(), class_id(), index_scale(), array, |
| compiler::target::SmiValue(index.constant()), temp); |
| } else { |
| if (index.IsRegister()) { |
| __ LoadElementAddressForRegIndex(temp, |
| false, // Store. |
| IsExternal(), class_id(), index_scale(), |
| index_unboxed_, array, index.reg()); |
| } else { |
| __ LoadElementAddressForIntIndex( |
| temp, |
| false, // Store. |
| IsExternal(), class_id(), index_scale(), array, |
| compiler::target::SmiValue(index.constant())); |
| } |
| } |
| |
| switch (class_id()) { |
| case kArrayCid: |
| if (ShouldEmitStoreBarrier()) { |
| const Register value = locs()->in(2).reg(); |
| __ StoreIntoArray(array, temp, value, CanValueBeSmi()); |
| } else if (locs()->in(2).IsConstant()) { |
| const Object& constant = locs()->in(2).constant(); |
| __ StoreIntoObjectNoBarrier(array, compiler::Address(temp), constant); |
| } else { |
| const Register value = locs()->in(2).reg(); |
| __ StoreIntoObjectNoBarrier(array, compiler::Address(temp), value); |
| } |
| break; |
| case kTypedDataInt8ArrayCid: |
| case kTypedDataUint8ArrayCid: |
| case kExternalTypedDataUint8ArrayCid: |
| case kOneByteStringCid: { |
| ASSERT(RequiredInputRepresentation(2) == kUnboxedIntPtr); |
| if (locs()->in(2).IsConstant()) { |
| __ LoadImmediate(IP, |
| compiler::target::SmiValue(locs()->in(2).constant())); |
| __ strb(IP, element_address); |
| } else { |
| const Register value = locs()->in(2).reg(); |
| __ strb(value, element_address); |
| } |
| break; |
| } |
| case kTypedDataUint8ClampedArrayCid: |
| case kExternalTypedDataUint8ClampedArrayCid: { |
| ASSERT(RequiredInputRepresentation(2) == kUnboxedIntPtr); |
| if (locs()->in(2).IsConstant()) { |
| intptr_t value = compiler::target::SmiValue(locs()->in(2).constant()); |
| // Clamp to 0x0 or 0xFF respectively. |
| if (value > 0xFF) { |
| value = 0xFF; |
| } else if (value < 0) { |
| value = 0; |
| } |
| __ LoadImmediate(IP, static_cast<int8_t>(value)); |
| __ strb(IP, element_address); |
| } else { |
| const Register value = locs()->in(2).reg(); |
| // Clamp to 0x00 or 0xFF respectively. |
| __ LoadImmediate(IP, 0xFF); |
| __ cmp(value, |
| compiler::Operand(IP)); // Compare Smi value and smi 0xFF. |
| __ mov(IP, compiler::Operand(0), LE); // IP = value <= 0xFF ? 0 : 0xFF. |
| __ mov(IP, compiler::Operand(value), |
| LS); // IP = value in range ? value : IP. |
| __ strb(IP, element_address); |
| } |
| break; |
| } |
| case kTwoByteStringCid: |
| case kTypedDataInt16ArrayCid: |
| case kTypedDataUint16ArrayCid: { |
| ASSERT(RequiredInputRepresentation(2) == kUnboxedIntPtr); |
| const Register value = locs()->in(2).reg(); |
| if (aligned()) { |
| __ strh(value, element_address); |
| } else { |
| __ StoreHalfWordUnaligned(value, temp, temp2); |
| } |
| break; |
| } |
| case kTypedDataInt32ArrayCid: |
| case kTypedDataUint32ArrayCid: { |
| const Register value = locs()->in(2).reg(); |
| if (aligned()) { |
| __ str(value, element_address); |
| } else { |
| __ StoreWordUnaligned(value, temp, temp2); |
| } |
| break; |
| } |
| case kTypedDataInt64ArrayCid: |
| case kTypedDataUint64ArrayCid: { |
| ASSERT(!directly_addressable); // need to add to register |
| ASSERT(locs()->in(2).IsPairLocation()); |
| PairLocation* value_pair = locs()->in(2).AsPairLocation(); |
| Register value_lo = value_pair->At(0).reg(); |
| Register value_hi = value_pair->At(1).reg(); |
| if (aligned()) { |
| __ str(value_lo, compiler::Address(temp)); |
| __ str(value_hi, compiler::Address(temp, compiler::target::kWordSize)); |
| } else { |
| __ StoreWordUnaligned(value_lo, temp, temp2); |
| __ AddImmediate(temp, temp, compiler::target::kWordSize); |
| __ StoreWordUnaligned(value_hi, temp, temp2); |
| } |
| break; |
| } |
| case kTypedDataFloat32ArrayCid: { |
| const SRegister value_reg = |
| EvenSRegisterOf(EvenDRegisterOf(locs()->in(2).fpu_reg())); |
| if (aligned()) { |
| __ vstrs(value_reg, element_address); |
| } else { |
| const Register address = temp; |
| const Register value = temp2; |
| __ vmovrs(value, value_reg); |
| __ StoreWordUnaligned(value, address, TMP); |
| } |
| break; |
| } |
| case kTypedDataFloat64ArrayCid: { |
| const DRegister value_reg = EvenDRegisterOf(locs()->in(2).fpu_reg()); |
| if (aligned()) { |
| __ vstrd(value_reg, element_address); |
| } else { |
| const Register address = temp; |
| const Register value = temp2; |
| __ vmovrs(value, EvenSRegisterOf(value_reg)); |
| __ StoreWordUnaligned(value, address, TMP); |
| __ AddImmediate(address, address, 4); |
| __ vmovrs(value, OddSRegisterOf(value_reg)); |
| __ StoreWordUnaligned(value, address, TMP); |
| } |
| break; |
| } |
| case kTypedDataFloat64x2ArrayCid: |
| case kTypedDataInt32x4ArrayCid: |
| case kTypedDataFloat32x4ArrayCid: { |
| ASSERT(element_address.Equals(compiler::Address(index.reg()))); |
| ASSERT(aligned()); |
| const DRegister value_reg = EvenDRegisterOf(locs()->in(2).fpu_reg()); |
| __ vstmd(IA, index.reg(), value_reg, 2); |
| break; |
| } |
| default: |
| UNREACHABLE(); |
| } |
| } |
| |
| LocationSummary* GuardFieldClassInstr::MakeLocationSummary(Zone* zone, |
| bool opt) const { |
| const intptr_t kNumInputs = 1; |
| |
| const intptr_t value_cid = value()->Type()->ToCid(); |
| const intptr_t field_cid = field().guarded_cid(); |
| |
| const bool emit_full_guard = !opt || (field_cid == kIllegalCid); |
| |
| const bool needs_value_cid_temp_reg = |
| emit_full_guard || ((value_cid == kDynamicCid) && (field_cid != kSmiCid)); |
| |
| const bool needs_field_temp_reg = emit_full_guard; |
| |
| intptr_t num_temps = 0; |
| if (needs_value_cid_temp_reg) { |
| num_temps++; |
| } |
| if (needs_field_temp_reg) { |
| num_temps++; |
| } |
| |
| LocationSummary* summary = new (zone) |
| LocationSummary(zone, kNumInputs, num_temps, LocationSummary::kNoCall); |
| summary->set_in(0, Location::RequiresRegister()); |
| |
| for (intptr_t i = 0; i < num_temps; i++) { |
| summary->set_temp(i, Location::RequiresRegister()); |
| } |
| |
| return summary; |
| } |
| |
| void GuardFieldClassInstr::EmitNativeCode(FlowGraphCompiler* compiler) { |
| ASSERT(compiler::target::UntaggedObject::kClassIdTagSize == 16); |
| ASSERT(sizeof(UntaggedField::guarded_cid_) == 2); |
| ASSERT(sizeof(UntaggedField::is_nullable_) == 2); |
| |
| const intptr_t value_cid = value()->Type()->ToCid(); |
| const intptr_t field_cid = field().guarded_cid(); |
| const intptr_t nullability = field().is_nullable() ? kNullCid : kIllegalCid; |
| |
| if (field_cid == kDynamicCid) { |
| return; // Nothing to emit. |
| } |
| |
| const bool emit_full_guard = |
| !compiler->is_optimizing() || (field_cid == kIllegalCid); |
| |
| const bool needs_value_cid_temp_reg = |
| emit_full_guard || ((value_cid == kDynamicCid) && (field_cid != kSmiCid)); |
| |
| const bool needs_field_temp_reg = emit_full_guard; |
| |
| const Register value_reg = locs()->in(0).reg(); |
| |
| const Register value_cid_reg = |
| needs_value_cid_temp_reg ? locs()->temp(0).reg() : kNoRegister; |
| |
| const Register field_reg = needs_field_temp_reg |
| ? locs()->temp(locs()->temp_count() - 1).reg() |
| : kNoRegister; |
| |
| compiler::Label ok, fail_label; |
| |
| compiler::Label* deopt = |
| compiler->is_optimizing() |
| ? compiler->AddDeoptStub(deopt_id(), ICData::kDeoptGuardField) |
| : NULL; |
| |
| compiler::Label* fail = (deopt != NULL) ? deopt : &fail_label; |
| |
| if (emit_full_guard) { |
| __ LoadObject(field_reg, Field::ZoneHandle(field().Original())); |
| |
| compiler::FieldAddress field_cid_operand( |
| field_reg, compiler::target::Field::guarded_cid_offset()); |
| compiler::FieldAddress field_nullability_operand( |
| field_reg, compiler::target::Field::is_nullable_offset()); |
| |
| if (value_cid == kDynamicCid) { |
| LoadValueCid(compiler, value_cid_reg, value_reg); |
| __ ldrh(IP, field_cid_operand); |
| __ cmp(value_cid_reg, compiler::Operand(IP)); |
| __ b(&ok, EQ); |
| __ ldrh(IP, field_nullability_operand); |
| __ cmp(value_cid_reg, compiler::Operand(IP)); |
| } else if (value_cid == kNullCid) { |
| __ ldrh(value_cid_reg, field_nullability_operand); |
| __ CompareImmediate(value_cid_reg, value_cid); |
| } else { |
| __ ldrh(value_cid_reg, field_cid_operand); |
| __ CompareImmediate(value_cid_reg, value_cid); |
| } |
| __ b(&ok, EQ); |
| |
| // Check if the tracked state of the guarded field can be initialized |
| // inline. If the field needs length check we fall through to runtime |
| // which is responsible for computing offset of the length field |
| // based on the class id. |
| // Length guard will be emitted separately when needed via GuardFieldLength |
| // instruction after GuardFieldClass. |
| if (!field().needs_length_check()) { |
| // Uninitialized field can be handled inline. Check if the |
| // field is still unitialized. |
| __ ldrh(IP, field_cid_operand); |
| __ CompareImmediate(IP, kIllegalCid); |
| __ b(fail, NE); |
| |
| if (value_cid == kDynamicCid) { |
| __ strh(value_cid_reg, field_cid_operand); |
| __ strh(value_cid_reg, field_nullability_operand); |
| } else { |
| __ LoadImmediate(IP, value_cid); |
| __ strh(IP, field_cid_operand); |
| __ strh(IP, field_nullability_operand); |
| } |
| |
| __ b(&ok); |
| } |
| |
| if (deopt == NULL) { |
| __ Bind(fail); |
| |
| __ ldrh(IP, |
| compiler::FieldAddress( |
| field_reg, compiler::target::Field::guarded_cid_offset())); |
| __ CompareImmediate(IP, kDynamicCid); |
| __ b(&ok, EQ); |
| |
| __ Push(field_reg); |
| __ Push(value_reg); |
| ASSERT(!compiler->is_optimizing()); // No deopt info needed. |
| __ CallRuntime(kUpdateFieldCidRuntimeEntry, 2); |
| __ Drop(2); // Drop the field and the value. |
| } else { |
| __ b(fail); |
| } |
| } else { |
| ASSERT(compiler->is_optimizing()); |
| ASSERT(deopt != NULL); |
| |
| // Field guard class has been initialized and is known. |
| if (value_cid == kDynamicCid) { |
| // Field's guarded class id is fixed by value's class id is not known. |
| __ tst(value_reg, compiler::Operand(kSmiTagMask)); |
| |
| if (field_cid != kSmiCid) { |
| __ b(fail, EQ); |
| __ LoadClassId(value_cid_reg, value_reg); |
| __ CompareImmediate(value_cid_reg, field_cid); |
| } |
| |
| if (field().is_nullable() && (field_cid != kNullCid)) { |
| __ b(&ok, EQ); |
| if (field_cid != kSmiCid) { |
| __ CompareImmediate(value_cid_reg, kNullCid); |
| } else { |
| __ CompareObject(value_reg, Object::null_object()); |
| } |
| } |
| __ b(fail, NE); |
| } else if (value_cid == field_cid) { |
| // This would normaly be caught by Canonicalize, but RemoveRedefinitions |
| // may sometimes produce the situation after the last Canonicalize pass. |
| } else { |
| // Both value's and field's class id is known. |
| ASSERT(value_cid != nullability); |
| __ b(fail); |
| } |
| } |
| __ Bind(&ok); |
| } |
| |
| LocationSummary* GuardFieldLengthInstr::MakeLocationSummary(Zone* zone, |
| bool opt) const { |
| const intptr_t kNumInputs = 1; |
| if (!opt || (field().guarded_list_length() == Field::kUnknownFixedLength)) { |
| const intptr_t kNumTemps = 3; |
| LocationSummary* summary = new (zone) |
| LocationSummary(zone, kNumInputs, kNumTemps, LocationSummary::kNoCall); |
| summary->set_in(0, Location::RequiresRegister()); |
| // We need temporaries for field object, length offset and expected length. |
| summary->set_temp(0, Location::RequiresRegister()); |
| summary->set_temp(1, Location::RequiresRegister()); |
| summary->set_temp(2, Location::RequiresRegister()); |
| return summary; |
| } else { |
| // TODO(vegorov): can use TMP when length is small enough to fit into |
| // immediate. |
| const intptr_t kNumTemps = 1; |
| LocationSummary* summary = new (zone) |
| LocationSummary(zone, kNumInputs, kNumTemps, LocationSummary::kNoCall); |
| summary->set_in(0, Location::RequiresRegister()); |
| summary->set_temp(0, Location::RequiresRegister()); |
| return summary; |
| } |
| UNREACHABLE(); |
| } |
| |
| void GuardFieldLengthInstr::EmitNativeCode(FlowGraphCompiler* compiler) { |
| if (field().guarded_list_length() == Field::kNoFixedLength) { |
| return; // Nothing to emit. |
| } |
| |
| compiler::Label* deopt = |
| compiler->is_optimizing() |
| ? compiler->AddDeoptStub(deopt_id(), ICData::kDeoptGuardField) |
| : NULL; |
| |
| const Register value_reg = locs()->in(0).reg(); |
| |
| if (!compiler->is_optimizing() || |
| (field().guarded_list_length() == Field::kUnknownFixedLength)) { |
| const Register field_reg = locs()->temp(0).reg(); |
| const Register offset_reg = locs()->temp(1).reg(); |
| const Register length_reg = locs()->temp(2).reg(); |
| |
| compiler::Label ok; |
| |
| __ LoadObject(field_reg, Field::ZoneHandle(field().Original())); |
| |
| __ ldrsb(offset_reg, |
| compiler::FieldAddress( |
| field_reg, compiler::target::Field:: |
| guarded_list_length_in_object_offset_offset())); |
| __ ldr( |
| length_reg, |
| compiler::FieldAddress( |
| field_reg, compiler::target::Field::guarded_list_length_offset())); |
| |
| __ tst(offset_reg, compiler::Operand(offset_reg)); |
| __ b(&ok, MI); |
| |
| // Load the length from the value. GuardFieldClass already verified that |
| // value's class matches guarded class id of the field. |
| // offset_reg contains offset already corrected by -kHeapObjectTag that is |
| // why we use Address instead of FieldAddress. |
| __ ldr(IP, compiler::Address(value_reg, offset_reg)); |
| __ cmp(length_reg, compiler::Operand(IP)); |
| |
| if (deopt == NULL) { |
| __ b(&ok, EQ); |
| |
| __ Push(field_reg); |
| __ Push(value_reg); |
| ASSERT(!compiler->is_optimizing()); // No deopt info needed. |
| __ CallRuntime(kUpdateFieldCidRuntimeEntry, 2); |
| __ Drop(2); // Drop the field and the value. |
| } else { |
| __ b(deopt, NE); |
| } |
| |
| __ Bind(&ok); |
| } else { |
| ASSERT(compiler->is_optimizing()); |
| ASSERT(field().guarded_list_length() >= 0); |
| ASSERT(field().guarded_list_length_in_object_offset() != |
| Field::kUnknownLengthOffset); |
| |
| const Register length_reg = locs()->temp(0).reg(); |
| |
| __ ldr(length_reg, |
| compiler::FieldAddress( |
| value_reg, field().guarded_list_length_in_object_offset())); |
| __ CompareImmediate( |
| length_reg, compiler::target::ToRawSmi(field().guarded_list_length())); |
| __ b(deopt, NE); |
| } |
| } |
| |
| DEFINE_UNIMPLEMENTED_INSTRUCTION(GuardFieldTypeInstr) |
| DEFINE_UNIMPLEMENTED_INSTRUCTION(CheckConditionInstr) |
| |
| LocationSummary* LoadCodeUnitsInstr::MakeLocationSummary(Zone* zone, |
| bool opt) const { |
| const bool might_box = (representation() == kTagged) && !can_pack_into_smi(); |
| const intptr_t kNumInputs = 2; |
| const intptr_t kNumTemps = might_box ? 2 : 0; |
| LocationSummary* summary = new (zone) LocationSummary( |
| zone, kNumInputs, kNumTemps, |
| might_box ? LocationSummary::kCallOnSlowPath : LocationSummary::kNoCall); |
| summary->set_in(0, Location::RequiresRegister()); |
| summary->set_in(1, Location::RequiresRegister()); |
| |
| if (might_box) { |
| summary->set_temp(0, Location::RequiresRegister()); |
| summary->set_temp(1, Location::RequiresRegister()); |
| } |
| |
| if (representation() == kUnboxedInt64) { |
| summary->set_out(0, Location::Pair(Location::RequiresRegister(), |
| Location::RequiresRegister())); |
| } else { |
| ASSERT(representation() == kTagged); |
| summary->set_out(0, Location::RequiresRegister()); |
| } |
| |
| return summary; |
| } |
| |
| void LoadCodeUnitsInstr::EmitNativeCode(FlowGraphCompiler* compiler) { |
| // The string register points to the backing store for external strings. |
| const Register str = locs()->in(0).reg(); |
| const Location index = locs()->in(1); |
| |
| compiler::Address element_address = __ ElementAddressForRegIndex( |
| true, IsExternal(), class_id(), index_scale(), /*index_unboxed=*/false, |
| str, index.reg()); |
| // Warning: element_address may use register IP as base. |
| |
| if (representation() == kUnboxedInt64) { |
| ASSERT(compiler->is_optimizing()); |
| ASSERT(locs()->out(0).IsPairLocation()); |
| PairLocation* result_pair = locs()->out(0).AsPairLocation(); |
| Register result1 = result_pair->At(0).reg(); |
| Register result2 = result_pair->At(1).reg(); |
| switch (class_id()) { |
| case kOneByteStringCid: |
| case kExternalOneByteStringCid: |
| ASSERT(element_count() == 4); |
| __ ldr(result1, element_address); |
| __ eor(result2, result2, compiler::Operand(result2)); |
| break; |
| case kTwoByteStringCid: |
| case kExternalTwoByteStringCid: |
| ASSERT(element_count() == 2); |
| __ ldr(result1, element_address); |
| __ eor(result2, result2, compiler::Operand(result2)); |
| break; |
| default:
|