gem5
v19.0.0.0
|
#include <base_dyn_inst.hh>
Public Types | |
enum | { MaxInstSrcRegs = TheISA::MaxInstSrcRegs, MaxInstDestRegs = TheISA::MaxInstDestRegs } |
typedef Impl::CPUType | ImplCPU |
typedef ImplCPU::ImplState | ImplState |
using | VecRegContainer = TheISA::VecRegContainer |
using | LSQRequestPtr = typename Impl::CPUPol::LSQ::LSQRequest * |
using | LQIterator = typename Impl::CPUPol::LSQUnit::LQIterator |
using | SQIterator = typename Impl::CPUPol::LSQUnit::SQIterator |
typedef Impl::DynInstPtr | DynInstPtr |
typedef RefCountingPtr< BaseDynInst< Impl > > | BaseDynInstPtr |
typedef std::list< DynInstPtr >::iterator | ListIt |
![]() | |
typedef TheISA::PCState | PCState |
using | VecRegContainer = TheISA::VecRegContainer |
using | VecElem = TheISA::VecElem |
using | VecPredRegContainer = TheISA::VecPredRegContainer |
Public Member Functions | |
BaseCPU * | getCpuPtr () |
void | recordResult (bool f) |
Records changes to result? More... | |
bool | effAddrValid () const |
Is the effective virtual address valid. More... | |
void | effAddrValid (bool b) |
bool | memOpDone () const |
Whether or not the memory operation is done. More... | |
void | memOpDone (bool f) |
bool | notAnInst () const |
void | setNotAnInst () |
void | demapPage (Addr vaddr, uint64_t asn) |
Invalidate a page in the DTLB and ITLB. More... | |
void | demapInstPage (Addr vaddr, uint64_t asn) |
void | demapDataPage (Addr vaddr, uint64_t asn) |
Fault | initiateMemRead (Addr addr, unsigned size, Request::Flags flags, const std::vector< bool > &byte_enable=std::vector< bool >()) |
Fault | writeMem (uint8_t *data, unsigned size, Addr addr, Request::Flags flags, uint64_t *res, const std::vector< bool > &byte_enable=std::vector< bool >()) |
Fault | initiateMemAMO (Addr addr, unsigned size, Request::Flags flags, AtomicOpFunctorPtr amo_op) |
bool | translationStarted () const |
True if the DTB address translation has started. More... | |
void | translationStarted (bool f) |
bool | translationCompleted () const |
True if the DTB address translation has completed. More... | |
void | translationCompleted (bool f) |
bool | possibleLoadViolation () const |
True if this address was found to match a previous load and they issued out of order. More... | |
void | possibleLoadViolation (bool f) |
bool | hitExternalSnoop () const |
True if the address hit a external snoop while sitting in the LSQ. More... | |
void | hitExternalSnoop (bool f) |
bool | isTranslationDelayed () const |
Returns true if the DTB address translation is being delayed due to a hw page table walk. More... | |
PhysRegIdPtr | renamedDestRegIdx (int idx) const |
Returns the physical register index of the i'th destination register. More... | |
PhysRegIdPtr | renamedSrcRegIdx (int idx) const |
Returns the physical register index of the i'th source register. More... | |
const RegId & | flattenedDestRegIdx (int idx) const |
Returns the flattened register index of the i'th destination register. More... | |
PhysRegIdPtr | prevDestRegIdx (int idx) const |
Returns the physical register index of the previous physical register that remapped to the same logical register index. More... | |
void | renameDestReg (int idx, PhysRegIdPtr renamed_dest, PhysRegIdPtr previous_rename) |
Renames a destination register to a physical register. More... | |
void | renameSrcReg (int idx, PhysRegIdPtr renamed_src) |
Renames a source logical register to the physical register which has/will produce that logical register's result. More... | |
void | flattenDestReg (int idx, const RegId &flattened_dest) |
Flattens a destination architectural register index into a logical index. More... | |
BaseDynInst (const StaticInstPtr &staticInst, const StaticInstPtr ¯oop, TheISA::PCState pc, TheISA::PCState predPC, InstSeqNum seq_num, ImplCPU *cpu) | |
BaseDynInst constructor given a binary instruction. More... | |
BaseDynInst (const StaticInstPtr &staticInst, const StaticInstPtr ¯oop) | |
BaseDynInst constructor given a StaticInst pointer. More... | |
~BaseDynInst () | |
BaseDynInst destructor. More... | |
void | dump () |
Dumps out contents of this BaseDynInst. More... | |
void | dump (std::string &outstring) |
Dumps out contents of this BaseDynInst into given string. More... | |
int | cpuId () const |
Read this CPU's ID. More... | |
uint32_t | socketId () const |
Read this CPU's Socket ID. More... | |
MasterID | masterId () const |
Read this CPU's data requestor ID. More... | |
ContextID | contextId () const |
Read this context's system-wide ID. More... | |
Fault | getFault () const |
Returns the fault type. More... | |
Fault & | getFault () |
TODO: This I added for the LSQRequest side to be able to modify the fault. More... | |
bool | doneTargCalc () |
Checks whether or not this instruction has had its branch target calculated yet. More... | |
void | setPredTarg (const TheISA::PCState &_predPC) |
Set the predicted target of this current instruction. More... | |
const TheISA::PCState & | readPredTarg () |
Addr | predInstAddr () |
Returns the predicted PC immediately after the branch. More... | |
Addr | predNextInstAddr () |
Returns the predicted PC two instructions after the branch. More... | |
Addr | predMicroPC () |
Returns the predicted micro PC after the branch. More... | |
bool | readPredTaken () |
Returns whether the instruction was predicted taken or not. More... | |
void | setPredTaken (bool predicted_taken) |
bool | mispredicted () |
Returns whether the instruction mispredicted. More... | |
bool | isNop () const |
bool | isMemRef () const |
bool | isLoad () const |
bool | isStore () const |
bool | isAtomic () const |
bool | isStoreConditional () const |
bool | isInstPrefetch () const |
bool | isDataPrefetch () const |
bool | isInteger () const |
bool | isFloating () const |
bool | isVector () const |
bool | isControl () const |
bool | isCall () const |
bool | isReturn () const |
bool | isDirectCtrl () const |
bool | isIndirectCtrl () const |
bool | isCondCtrl () const |
bool | isUncondCtrl () const |
bool | isCondDelaySlot () const |
bool | isThreadSync () const |
bool | isSerializing () const |
bool | isSerializeBefore () const |
bool | isSerializeAfter () const |
bool | isSquashAfter () const |
bool | isMemBarrier () const |
bool | isWriteBarrier () const |
bool | isNonSpeculative () const |
bool | isQuiesce () const |
bool | isIprAccess () const |
bool | isUnverifiable () const |
bool | isSyscall () const |
bool | isMacroop () const |
bool | isMicroop () const |
bool | isDelayedCommit () const |
bool | isLastMicroop () const |
bool | isFirstMicroop () const |
bool | isMicroBranch () const |
void | setSerializeBefore () |
Temporarily sets this instruction as a serialize before instruction. More... | |
void | clearSerializeBefore () |
Clears the serializeBefore part of this instruction. More... | |
bool | isTempSerializeBefore () |
Checks if this serializeBefore is only temporarily set. More... | |
void | setSerializeAfter () |
Temporarily sets this instruction as a serialize after instruction. More... | |
void | clearSerializeAfter () |
Clears the serializeAfter part of this instruction. More... | |
bool | isTempSerializeAfter () |
Checks if this serializeAfter is only temporarily set. More... | |
void | setSerializeHandled () |
Sets the serialization part of this instruction as handled. More... | |
bool | isSerializeHandled () |
Checks if the serialization part of this instruction has been handled. More... | |
OpClass | opClass () const |
Returns the opclass of this instruction. More... | |
TheISA::PCState | branchTarget () const |
Returns the branch target address. More... | |
int8_t | numSrcRegs () const |
Returns the number of source registers. More... | |
int8_t | numDestRegs () const |
Returns the number of destination registers. More... | |
int8_t | numFPDestRegs () const |
int8_t | numIntDestRegs () const |
int8_t | numCCDestRegs () const |
int8_t | numVecDestRegs () const |
int8_t | numVecElemDestRegs () const |
int8_t | numVecPredDestRegs () const |
const RegId & | destRegIdx (int i) const |
Returns the logical register index of the i'th destination register. More... | |
const RegId & | srcRegIdx (int i) const |
Returns the logical register index of the i'th source register. More... | |
uint8_t | resultSize () |
Return the size of the instResult queue. More... | |
InstResult | popResult (InstResult dflt=InstResult()) |
Pops a result off the instResult queue. More... | |
void | setIntRegOperand (const StaticInst *si, int idx, RegVal val) |
Records an integer register being set to a value. More... | |
void | setCCRegOperand (const StaticInst *si, int idx, RegVal val) |
Records a CC register being set to a value. More... | |
void | setVecRegOperand (const StaticInst *si, int idx, const VecRegContainer &val) |
Record a vector register being set to a value. More... | |
void | setFloatRegOperandBits (const StaticInst *si, int idx, RegVal val) |
Records an fp register being set to an integer value. More... | |
void | setVecElemOperand (const StaticInst *si, int idx, const VecElem val) |
Record a vector register being set to a value. More... | |
void | setVecPredRegOperand (const StaticInst *si, int idx, const VecPredRegContainer &val) |
Record a vector register being set to a value. More... | |
void | markSrcRegReady () |
Records that one of the source registers is ready. More... | |
void | markSrcRegReady (RegIndex src_idx) |
Marks a specific register as ready. More... | |
bool | isReadySrcRegIdx (int idx) const |
Returns if a source register is ready. More... | |
void | setCompleted () |
Sets this instruction as completed. More... | |
bool | isCompleted () const |
Returns whether or not this instruction is completed. More... | |
void | setResultReady () |
Marks the result as ready. More... | |
bool | isResultReady () const |
Returns whether or not the result is ready. More... | |
void | setCanIssue () |
Sets this instruction as ready to issue. More... | |
bool | readyToIssue () const |
Returns whether or not this instruction is ready to issue. More... | |
void | clearCanIssue () |
Clears this instruction being able to issue. More... | |
void | setIssued () |
Sets this instruction as issued from the IQ. More... | |
bool | isIssued () const |
Returns whether or not this instruction has issued. More... | |
void | clearIssued () |
Clears this instruction as being issued. More... | |
void | setExecuted () |
Sets this instruction as executed. More... | |
bool | isExecuted () const |
Returns whether or not this instruction has executed. More... | |
void | setCanCommit () |
Sets this instruction as ready to commit. More... | |
void | clearCanCommit () |
Clears this instruction as being ready to commit. More... | |
bool | readyToCommit () const |
Returns whether or not this instruction is ready to commit. More... | |
void | setAtCommit () |
bool | isAtCommit () |
void | setCommitted () |
Sets this instruction as committed. More... | |
bool | isCommitted () const |
Returns whether or not this instruction is committed. More... | |
void | setSquashed () |
Sets this instruction as squashed. More... | |
bool | isSquashed () const |
Returns whether or not this instruction is squashed. More... | |
void | setInIQ () |
Sets this instruction as a entry the IQ. More... | |
void | clearInIQ () |
Sets this instruction as a entry the IQ. More... | |
bool | isInIQ () const |
Returns whether or not this instruction has issued. More... | |
void | setSquashedInIQ () |
Sets this instruction as squashed in the IQ. More... | |
bool | isSquashedInIQ () const |
Returns whether or not this instruction is squashed in the IQ. More... | |
void | setInLSQ () |
Sets this instruction as a entry the LSQ. More... | |
void | removeInLSQ () |
Sets this instruction as a entry the LSQ. More... | |
bool | isInLSQ () const |
Returns whether or not this instruction is in the LSQ. More... | |
void | setSquashedInLSQ () |
Sets this instruction as squashed in the LSQ. More... | |
bool | isSquashedInLSQ () const |
Returns whether or not this instruction is squashed in the LSQ. More... | |
void | setInROB () |
Sets this instruction as a entry the ROB. More... | |
void | clearInROB () |
Sets this instruction as a entry the ROB. More... | |
bool | isInROB () const |
Returns whether or not this instruction is in the ROB. More... | |
void | setSquashedInROB () |
Sets this instruction as squashed in the ROB. More... | |
bool | isSquashedInROB () const |
Returns whether or not this instruction is squashed in the ROB. More... | |
bool | isPinnedRegsRenamed () const |
Returns whether pinned registers are renamed. More... | |
void | setPinnedRegsRenamed () |
Sets the destination registers as renamed. More... | |
bool | isPinnedRegsWritten () const |
Returns whether destination registers are written. More... | |
void | setPinnedRegsWritten () |
Sets destination registers as written. More... | |
bool | isPinnedRegsSquashDone () const |
Return whether dest registers' pinning status updated after squash. More... | |
void | setPinnedRegsSquashDone () |
Sets dest registers' status updated after squash. More... | |
TheISA::PCState | pcState () const |
Read the PC state of this instruction. More... | |
void | pcState (const TheISA::PCState &val) |
Set the PC state of this instruction. More... | |
Addr | instAddr () const |
Read the PC of this instruction. More... | |
Addr | nextInstAddr () const |
Read the PC of the next instruction. More... | |
Addr | microPC () const |
Read the micro PC of this instruction. More... | |
bool | readPredicate () const |
void | setPredicate (bool val) |
bool | readMemAccPredicate () const |
void | setMemAccPredicate (bool val) |
void | setASID (short addr_space_id) |
Sets the ASID. More... | |
short | getASID () |
void | setTid (ThreadID tid) |
Sets the thread id. More... | |
void | setThreadState (ImplState *state) |
Sets the pointer to the thread state. More... | |
ThreadContext * | tcBase () |
Returns the thread context. More... | |
bool | eaSrcsReady () const |
Returns whether or not the eff. More... | |
bool | strictlyOrdered () const |
Is this instruction's memory access strictly ordered? More... | |
void | strictlyOrdered (bool so) |
bool | hasRequest () const |
Has this instruction generated a memory request. More... | |
void | setRequest () |
Assert this instruction has generated a memory request. More... | |
ListIt & | getInstListIt () |
Returns iterator to this instruction in the list of all insts. More... | |
void | setInstListIt (ListIt _instListIt) |
Sets iterator for this instruction in the list of all insts. More... | |
unsigned int | readStCondFailures () const |
Returns the number of consecutive store conditional failures. More... | |
void | setStCondFailures (unsigned int sc_failures) |
Sets the number of consecutive store conditional failures. More... | |
void | armMonitor (Addr address) |
bool | mwait (PacketPtr pkt) |
void | mwaitAtomic (ThreadContext *tc) |
AddressMonitor * | getAddrMonitor () |
template<typename T > | |
void | setScalarResult (T &&t) |
Pushes a result onto the instResult queue. More... | |
template<typename T > | |
void | setVecResult (T &&t) |
Full vector result. More... | |
template<typename T > | |
void | setVecElemResult (T &&t) |
Vector element result. More... | |
template<typename T > | |
void | setVecPredResult (T &&t) |
Predicate result. More... | |
![]() | |
virtual RegVal | readIntRegOperand (const StaticInst *si, int idx)=0 |
Reads an integer register. More... | |
virtual RegVal | readFloatRegOperandBits (const StaticInst *si, int idx)=0 |
Reads a floating point register in its binary format, instead of by value. More... | |
virtual const VecRegContainer & | readVecRegOperand (const StaticInst *si, int idx) const =0 |
Vector Register Interfaces. More... | |
virtual VecRegContainer & | getWritableVecRegOperand (const StaticInst *si, int idx)=0 |
Gets destination vector register operand for modification. More... | |
virtual ConstVecLane8 | readVec8BitLaneOperand (const StaticInst *si, int idx) const =0 |
Vector Register Lane Interfaces. More... | |
virtual ConstVecLane16 | readVec16BitLaneOperand (const StaticInst *si, int idx) const =0 |
Reads source vector 16bit operand. More... | |
virtual ConstVecLane32 | readVec32BitLaneOperand (const StaticInst *si, int idx) const =0 |
Reads source vector 32bit operand. More... | |
virtual ConstVecLane64 | readVec64BitLaneOperand (const StaticInst *si, int idx) const =0 |
Reads source vector 64bit operand. More... | |
virtual void | setVecLaneOperand (const StaticInst *si, int idx, const LaneData< LaneSize::Byte > &val)=0 |
Write a lane of the destination vector operand. More... | |
virtual void | setVecLaneOperand (const StaticInst *si, int idx, const LaneData< LaneSize::TwoByte > &val)=0 |
virtual void | setVecLaneOperand (const StaticInst *si, int idx, const LaneData< LaneSize::FourByte > &val)=0 |
virtual void | setVecLaneOperand (const StaticInst *si, int idx, const LaneData< LaneSize::EightByte > &val)=0 |
virtual VecElem | readVecElemOperand (const StaticInst *si, int idx) const =0 |
Vector Elem Interfaces. More... | |
virtual const VecPredRegContainer & | readVecPredRegOperand (const StaticInst *si, int idx) const =0 |
Predicate registers interface. More... | |
virtual VecPredRegContainer & | getWritableVecPredRegOperand (const StaticInst *si, int idx)=0 |
Gets destination predicate register operand for modification. More... | |
virtual RegVal | readCCRegOperand (const StaticInst *si, int idx)=0 |
virtual RegVal | readMiscRegOperand (const StaticInst *si, int idx)=0 |
virtual void | setMiscRegOperand (const StaticInst *si, int idx, RegVal val)=0 |
virtual RegVal | readMiscReg (int misc_reg)=0 |
Reads a miscellaneous register, handling any architectural side effects due to reading that register. More... | |
virtual void | setMiscReg (int misc_reg, RegVal val)=0 |
Sets a miscellaneous register, handling any architectural side effects due to writing that register. More... | |
virtual Fault | readMem (Addr addr, uint8_t *data, unsigned int size, Request::Flags flags, const std::vector< bool > &byte_enable=std::vector< bool >()) |
Perform an atomic memory read operation. More... | |
virtual Fault | initiateMemRead (Addr addr, unsigned int size, Request::Flags flags, const std::vector< bool > &byte_enable=std::vector< bool >()) |
Initiate a timing memory read operation. More... | |
virtual Fault | writeMem (uint8_t *data, unsigned int size, Addr addr, Request::Flags flags, uint64_t *res, const std::vector< bool > &byte_enable=std::vector< bool >())=0 |
For atomic-mode contexts, perform an atomic memory write operation. More... | |
virtual Fault | amoMem (Addr addr, uint8_t *data, unsigned int size, Request::Flags flags, AtomicOpFunctorPtr amo_op) |
For atomic-mode contexts, perform an atomic AMO (a.k.a., Atomic Read-Modify-Write Memory Operation) More... | |
virtual Fault | initiateMemAMO (Addr addr, unsigned int size, Request::Flags flags, AtomicOpFunctorPtr amo_op) |
For timing-mode contexts, initiate an atomic AMO (atomic read-modify-write memory operation) More... | |
virtual void | syscall (Fault *fault)=0 |
Executes a syscall. More... | |
![]() | |
RefCounted () | |
We initialize the reference count to zero and the first object to take ownership of it must increment it to one. More... | |
virtual | ~RefCounted () |
We make the destructor virtual because we're likely to have virtual functions on reference counted objects. More... | |
void | incref () const |
Increment the reference count. More... | |
void | decref () const |
Decrement the reference count and destroy the object if all references are gone. More... | |
Public Attributes | |
InstSeqNum | seqNum |
The sequence number of the instruction. More... | |
const StaticInstPtr | staticInst |
The StaticInst used by this BaseDynInst. More... | |
ImplCPU * | cpu |
Pointer to the Impl's CPU object. More... | |
ImplState * | thread |
Pointer to the thread state. More... | |
Fault | fault |
The kind of fault this instruction has generated. More... | |
Trace::InstRecord * | traceData |
InstRecord that tracks this instructions. More... | |
ThreadID | threadNumber |
The thread this instruction is from. More... | |
ListIt | instListIt |
Iterator pointing to this BaseDynInst in the list of all insts. More... | |
TheISA::PCState | predPC |
Predicted PC state after this instruction. More... | |
const StaticInstPtr | macroop |
The Macroop if one exists. More... | |
uint8_t | readyRegs |
How many source registers are ready. More... | |
Addr | effAddr |
The effective virtual address (lds & stores only). More... | |
Addr | physEffAddr |
The effective physical address. More... | |
unsigned | memReqFlags |
The memory request flags (from translation). More... | |
short | asid |
data address space ID, for loads & stores. More... | |
unsigned | effSize |
The size of the request. More... | |
uint8_t * | memData |
Pointer to the data for the memory access. More... | |
int16_t | lqIdx |
Load queue index. More... | |
LQIterator | lqIt |
int16_t | sqIdx |
Store queue index. More... | |
SQIterator | sqIt |
LSQRequestPtr | savedReq |
Saved memory request (needed when the DTB address translation is delayed due to a hw page table walk). More... | |
RequestPtr | reqToVerify |
Protected Attributes | |
std::queue< InstResult > | instResult |
The result of the instruction; assumes an instruction can have many destination registers. More... | |
TheISA::PCState | pc |
PC state for this instruction. More... | |
std::bitset< MaxInstSrcRegs > | _readySrcRegIdx |
Whether or not the source register is ready. More... | |
std::array< RegId, TheISA::MaxInstDestRegs > | _flatDestRegIdx |
Flattened register index of the destination registers of this instruction. More... | |
std::array< PhysRegIdPtr, TheISA::MaxInstDestRegs > | _destRegIdx |
Physical register index of the destination registers of this instruction. More... | |
std::array< PhysRegIdPtr, TheISA::MaxInstSrcRegs > | _srcRegIdx |
Physical register index of the source registers of this instruction. More... | |
std::array< PhysRegIdPtr, TheISA::MaxInstDestRegs > | _prevDestRegIdx |
Physical register index of the previous producers of the architected destinations. More... | |
Private Member Functions | |
void | initVars () |
Function to initialize variables in the constructors. More... | |
Private Attributes | |
std::bitset< MaxFlags > | instFlags |
std::bitset< NumStatus > | status |
The status of this BaseDynInst. More... | |
Definition at line 78 of file base_dyn_inst.hh.
typedef RefCountingPtr<BaseDynInst<Impl> > BaseDynInst< Impl >::BaseDynInstPtr |
Definition at line 92 of file base_dyn_inst.hh.
typedef Impl::DynInstPtr BaseDynInst< Impl >::DynInstPtr |
Definition at line 91 of file base_dyn_inst.hh.
typedef Impl::CPUType BaseDynInst< Impl >::ImplCPU |
Definition at line 82 of file base_dyn_inst.hh.
typedef ImplCPU::ImplState BaseDynInst< Impl >::ImplState |
Definition at line 83 of file base_dyn_inst.hh.
typedef std::list<DynInstPtr>::iterator BaseDynInst< Impl >::ListIt |
Definition at line 95 of file base_dyn_inst.hh.
using BaseDynInst< Impl >::LQIterator = typename Impl::CPUPol::LSQUnit::LQIterator |
Definition at line 87 of file base_dyn_inst.hh.
using BaseDynInst< Impl >::LSQRequestPtr = typename Impl::CPUPol::LSQ::LSQRequest* |
Definition at line 86 of file base_dyn_inst.hh.
using BaseDynInst< Impl >::SQIterator = typename Impl::CPUPol::LSQUnit::SQIterator |
Definition at line 88 of file base_dyn_inst.hh.
using BaseDynInst< Impl >::VecRegContainer = TheISA::VecRegContainer |
Definition at line 84 of file base_dyn_inst.hh.
anonymous enum |
Enumerator | |
---|---|
MaxInstSrcRegs | |
MaxInstDestRegs | Max source regs. |
Definition at line 97 of file base_dyn_inst.hh.
|
protected |
Definition at line 132 of file base_dyn_inst.hh.
|
protected |
Enumerator | |
---|---|
IqEntry | |
RobEntry | Instruction is in the IQ. |
LsqEntry | Instruction is in the ROB. |
Completed | Instruction is in the LSQ. |
ResultReady | Instruction has completed. |
CanIssue | Instruction has its result. |
Issued | Instruction can issue and execute. |
Executed | Instruction has issued. |
CanCommit | Instruction has executed. |
AtCommit | Instruction can commit. |
Committed | Instruction has reached commit. |
Squashed | Instruction has committed. |
SquashedInIQ | Instruction is squashed. |
SquashedInLSQ | Instruction is squashed in the IQ. |
SquashedInROB | Instruction is squashed in the LSQ. |
PinnedRegsRenamed | Instruction is squashed in the ROB. |
PinnedRegsWritten | Pinned registers are renamed. |
PinnedRegsSquashDone | Pinned registers are written back. |
RecoverInst | Regs pinning status updated after squash. |
BlockingInst | Is a recover instruction. |
ThreadsyncWait | Is a blocking instruction. |
SerializeBefore | Is a thread synchronization instruction. |
SerializeAfter | Needs to serialize on instructions ahead of it. |
SerializeHandled | Needs to serialize instructions behind it. |
NumStatus | Serialization has been handled. |
Definition at line 103 of file base_dyn_inst.hh.
BaseDynInst< Impl >::BaseDynInst | ( | const StaticInstPtr & | staticInst, |
const StaticInstPtr & | macroop, | ||
TheISA::PCState | pc, | ||
TheISA::PCState | predPC, | ||
InstSeqNum | seq_num, | ||
ImplCPU * | cpu | ||
) |
BaseDynInst constructor given a binary instruction.
staticInst | A StaticInstPtr to the underlying instruction. |
pc | The PC state for the instruction. |
predPC | The predicted next PC state for the instruction. |
seq_num | The sequence number of the instruction. |
cpu | Pointer to the instruction's CPU. |
Definition at line 62 of file base_dyn_inst_impl.hh.
References BaseDynInst< Impl >::initVars(), BaseDynInst< Impl >::pc, BaseDynInst< Impl >::predPC, and BaseDynInst< Impl >::seqNum.
Referenced by BaseDynInst< Impl >::flattenDestReg().
BaseDynInst< Impl >::BaseDynInst | ( | const StaticInstPtr & | staticInst, |
const StaticInstPtr & | macroop | ||
) |
BaseDynInst constructor given a StaticInst pointer.
_staticInst | The StaticInst for this BaseDynInst. |
Definition at line 83 of file base_dyn_inst_impl.hh.
References BaseDynInst< Impl >::initVars(), and BaseDynInst< Impl >::seqNum.
BaseDynInst< Impl >::~BaseDynInst | ( | ) |
BaseDynInst destructor.
Definition at line 143 of file base_dyn_inst_impl.hh.
References RefCounted::count, cprintf(), BaseDynInst< Impl >::cpu, DPRINTF, BaseDynInst< Impl >::fault, BaseDynInst< Impl >::memData, NoFault, BaseDynInst< Impl >::seqNum, and BaseDynInst< Impl >::traceData.
Referenced by BaseDynInst< Impl >::flattenDestReg().
|
inlinevirtual |
Implements ExecContext.
Definition at line 954 of file base_dyn_inst.hh.
|
inline |
Returns the branch target address.
Definition at line 580 of file base_dyn_inst.hh.
References StaticInst::branchTarget().
|
inline |
Clears this instruction as being ready to commit.
Definition at line 761 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::CanCommit.
|
inline |
Clears this instruction being able to issue.
Definition at line 740 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::CanIssue.
|
inline |
Sets this instruction as a entry the IQ.
Definition at line 788 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::IqEntry.
|
inline |
Sets this instruction as a entry the ROB.
Definition at line 824 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::RobEntry.
|
inline |
Clears this instruction as being issued.
Definition at line 749 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::Issued.
|
inline |
Clears the serializeAfter part of this instruction.
Definition at line 561 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::SerializeAfter.
|
inline |
Clears the serializeBefore part of this instruction.
Definition at line 552 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::SerializeBefore.
|
inline |
Read this context's system-wide ID.
Definition at line 453 of file base_dyn_inst.hh.
|
inline |
Read this CPU's ID.
Definition at line 444 of file base_dyn_inst.hh.
|
inline |
Definition at line 301 of file base_dyn_inst.hh.
References addr, data, BaseDynInst< Impl >::initiateMemAMO(), BaseDynInst< Impl >::initiateMemRead(), and BaseDynInst< Impl >::writeMem().
|
inline |
Definition at line 297 of file base_dyn_inst.hh.
|
inlinevirtual |
Invalidate a page in the DTLB and ITLB.
Implements ExecContext.
Definition at line 293 of file base_dyn_inst.hh.
|
inline |
Returns the logical register index of the i'th destination register.
Definition at line 606 of file base_dyn_inst.hh.
References StaticInst::destRegIdx().
|
inline |
Checks whether or not this instruction has had its branch target calculated yet.
For now it is not utilized and is hacked to be always false.
Definition at line 466 of file base_dyn_inst.hh.
void BaseDynInst< Impl >::dump | ( | ) |
Dumps out contents of this BaseDynInst.
Definition at line 186 of file base_dyn_inst_impl.hh.
References cprintf(), StaticInst::disassemble(), BaseDynInst< Impl >::pc, BaseDynInst< Impl >::staticInst, and BaseDynInst< Impl >::threadNumber.
Referenced by BaseDynInst< Impl >::flattenDestReg().
void BaseDynInst< Impl >::dump | ( | std::string & | outstring | ) |
Dumps out contents of this BaseDynInst into given string.
Definition at line 195 of file base_dyn_inst_impl.hh.
References StaticInst::disassemble(), BaseDynInst< Impl >::pc, ArmISA::s, BaseDynInst< Impl >::staticInst, and BaseDynInst< Impl >::threadNumber.
bool BaseDynInst< Impl >::eaSrcsReady | ( | ) | const |
Returns whether or not the eff.
addr. source registers are ready.
Definition at line 226 of file base_dyn_inst_impl.hh.
References BaseDynInst< Impl >::_readySrcRegIdx, ArmISA::i, and BaseDynInst< Impl >::numSrcRegs().
Referenced by BaseDynInst< Impl >::tcBase().
|
inline |
Is the effective virtual address valid.
Definition at line 276 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::EffAddrValid.
|
inline |
Definition at line 277 of file base_dyn_inst.hh.
References ArmISA::b, and BaseDynInst< Impl >::EffAddrValid.
|
inline |
Flattens a destination architectural register index into a logical index.
Definition at line 409 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::BaseDynInst(), BaseDynInst< Impl >::dump(), BaseDynInst< Impl >::initVars(), and BaseDynInst< Impl >::~BaseDynInst().
|
inline |
Returns the flattened register index of the i'th destination register.
Definition at line 371 of file base_dyn_inst.hh.
|
inlinevirtual |
Implements ExecContext.
Definition at line 958 of file base_dyn_inst.hh.
|
inline |
Definition at line 913 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::asid.
|
inline |
Definition at line 159 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::cpu.
|
inline |
Returns the fault type.
Definition at line 456 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::fault.
|
inline |
TODO: This I added for the LSQRequest side to be able to modify the fault.
There should be a better mechanism in place.
Definition at line 459 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::fault.
|
inline |
Returns iterator to this instruction in the list of all insts.
Definition at line 938 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::instListIt.
|
inline |
Has this instruction generated a memory request.
Definition at line 933 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::ReqMade.
|
inline |
True if the address hit a external snoop while sitting in the LSQ.
If this is true and a older instruction sees it, this instruction must reexecute
Definition at line 336 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::HitExternalSnoop.
|
inline |
Definition at line 337 of file base_dyn_inst.hh.
References ArmISA::f, and BaseDynInst< Impl >::HitExternalSnoop.
Fault BaseDynInst< Impl >::initiateMemAMO | ( | Addr | addr, |
unsigned | size, | ||
Request::Flags | flags, | ||
AtomicOpFunctorPtr | amo_op | ||
) |
Definition at line 990 of file base_dyn_inst.hh.
Referenced by BaseDynInst< Impl >::demapDataPage().
Fault BaseDynInst< Impl >::initiateMemRead | ( | Addr | addr, |
unsigned | size, | ||
Request::Flags | flags, | ||
const std::vector< bool > & | byte_enable = std::vector<bool>() |
||
) |
Definition at line 964 of file base_dyn_inst.hh.
Referenced by BaseDynInst< Impl >::demapDataPage().
|
private |
Function to initialize variables in the constructors.
Definition at line 93 of file base_dyn_inst_impl.hh.
References BaseDynInst< Impl >::asid, BaseDynInst< Impl >::cpu, DPRINTF, BaseDynInst< Impl >::effAddr, BaseDynInst< Impl >::fault, BaseDynInst< Impl >::instFlags, BaseDynInst< Impl >::lqIdx, BaseDynInst< Impl >::MemAccPredicate, BaseDynInst< Impl >::memData, BaseDynInst< Impl >::memReqFlags, NoFault, BaseDynInst< Impl >::physEffAddr, BaseDynInst< Impl >::Predicate, BaseDynInst< Impl >::readyRegs, BaseDynInst< Impl >::RecordResult, BaseDynInst< Impl >::seqNum, BaseDynInst< Impl >::sqIdx, BaseDynInst< Impl >::status, and BaseDynInst< Impl >::threadNumber.
Referenced by BaseDynInst< Impl >::BaseDynInst(), and BaseDynInst< Impl >::flattenDestReg().
|
inline |
Read the PC of this instruction.
Definition at line 877 of file base_dyn_inst.hh.
Referenced by BaseO3DynInst< Impl >::~BaseO3DynInst().
|
inline |
Definition at line 768 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::AtCommit.
|
inline |
Definition at line 511 of file base_dyn_inst.hh.
References StaticInst::isAtomic().
|
inline |
Definition at line 520 of file base_dyn_inst.hh.
References StaticInst::isCall().
|
inline |
Returns whether or not this instruction is committed.
Definition at line 774 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::Committed, and BaseDynInst< Impl >::setSquashed().
|
inline |
Returns whether or not this instruction is completed.
Definition at line 725 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::Completed.
|
inline |
Definition at line 524 of file base_dyn_inst.hh.
References StaticInst::isCondCtrl().
|
inline |
Definition at line 526 of file base_dyn_inst.hh.
References StaticInst::isCondDelaySlot().
|
inline |
Definition at line 519 of file base_dyn_inst.hh.
References StaticInst::isControl().
|
inline |
Definition at line 515 of file base_dyn_inst.hh.
References StaticInst::isDataPrefetch().
|
inline |
Definition at line 543 of file base_dyn_inst.hh.
References StaticInst::isDelayedCommit().
|
inline |
Definition at line 522 of file base_dyn_inst.hh.
References StaticInst::isDirectCtrl().
|
inline |
Returns whether or not this instruction has executed.
Definition at line 755 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::Executed.
|
inline |
Definition at line 545 of file base_dyn_inst.hh.
References StaticInst::isFirstMicroop().
|
inline |
Definition at line 517 of file base_dyn_inst.hh.
References StaticInst::isFloating().
|
inline |
Definition at line 523 of file base_dyn_inst.hh.
References StaticInst::isIndirectCtrl().
|
inline |
Returns whether or not this instruction has issued.
Definition at line 791 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::IqEntry.
|
inline |
Returns whether or not this instruction is in the LSQ.
Definition at line 809 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::LsqEntry.
|
inline |
Returns whether or not this instruction is in the ROB.
Definition at line 827 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::RobEntry.
|
inline |
Definition at line 514 of file base_dyn_inst.hh.
References StaticInst::isInstPrefetch().
|
inline |
Definition at line 516 of file base_dyn_inst.hh.
References StaticInst::isInteger().
|
inline |
Definition at line 538 of file base_dyn_inst.hh.
References StaticInst::isIprAccess().
|
inline |
Returns whether or not this instruction has issued.
Definition at line 746 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::Issued.
|
inline |
Definition at line 544 of file base_dyn_inst.hh.
References StaticInst::isLastMicroop().
|
inline |
Definition at line 509 of file base_dyn_inst.hh.
References StaticInst::isLoad().
|
inline |
Definition at line 541 of file base_dyn_inst.hh.
References StaticInst::isMacroop().
|
inline |
Definition at line 534 of file base_dyn_inst.hh.
References StaticInst::isMemBarrier().
|
inline |
Definition at line 508 of file base_dyn_inst.hh.
References StaticInst::isMemRef().
|
inline |
Definition at line 546 of file base_dyn_inst.hh.
References StaticInst::isMicroBranch().
|
inline |
Definition at line 542 of file base_dyn_inst.hh.
References StaticInst::isMicroop().
|
inline |
Definition at line 536 of file base_dyn_inst.hh.
References StaticInst::isNonSpeculative().
|
inline |
Definition at line 507 of file base_dyn_inst.hh.
References StaticInst::isNop().
|
inline |
Returns whether pinned registers are renamed.
Definition at line 836 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::PinnedRegsRenamed.
Referenced by BaseDynInst< Impl >::setSquashed().
|
inline |
Return whether dest registers' pinning status updated after squash.
Definition at line 861 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::PinnedRegsSquashDone.
Referenced by BaseDynInst< Impl >::setSquashed().
|
inline |
Returns whether destination registers are written.
Definition at line 848 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::PinnedRegsWritten.
Referenced by BaseDynInst< Impl >::setSquashed().
|
inline |
Definition at line 537 of file base_dyn_inst.hh.
References StaticInst::isQuiesce().
|
inline |
Returns if a source register is ready.
Definition at line 716 of file base_dyn_inst.hh.
|
inline |
Returns whether or not the result is ready.
Definition at line 731 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::ResultReady.
|
inline |
Definition at line 521 of file base_dyn_inst.hh.
References StaticInst::isReturn().
|
inline |
Definition at line 531 of file base_dyn_inst.hh.
References StaticInst::isSerializeAfter(), and BaseDynInst< Impl >::SerializeAfter.
|
inline |
Definition at line 529 of file base_dyn_inst.hh.
References StaticInst::isSerializeBefore(), and BaseDynInst< Impl >::SerializeBefore.
|
inline |
Checks if the serialization part of this instruction has been handled.
This does not apply to the temporary serializing state; it only applies to this instruction's own permanent serializing state.
Definition at line 574 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::SerializeHandled.
|
inline |
Definition at line 528 of file base_dyn_inst.hh.
References StaticInst::isSerializing().
|
inline |
Definition at line 533 of file base_dyn_inst.hh.
References StaticInst::isSquashAfter().
|
inline |
Returns whether or not this instruction is squashed.
Definition at line 780 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::Squashed.
|
inline |
Returns whether or not this instruction is squashed in the IQ.
Definition at line 797 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::SquashedInIQ.
|
inline |
Returns whether or not this instruction is squashed in the LSQ.
Definition at line 815 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::SquashedInLSQ.
|
inline |
Returns whether or not this instruction is squashed in the ROB.
Definition at line 833 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::SquashedInROB.
|
inline |
Definition at line 510 of file base_dyn_inst.hh.
References StaticInst::isStore().
|
inline |
Definition at line 512 of file base_dyn_inst.hh.
References StaticInst::isStoreConditional().
Referenced by BaseO3DynInst< Impl >::completeAcc().
|
inline |
Definition at line 540 of file base_dyn_inst.hh.
References StaticInst::isSyscall().
|
inline |
Checks if this serializeAfter is only temporarily set.
Definition at line 564 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::SerializeAfter.
|
inline |
Checks if this serializeBefore is only temporarily set.
Definition at line 555 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::SerializeBefore.
|
inline |
Definition at line 527 of file base_dyn_inst.hh.
References StaticInst::isThreadSync().
|
inline |
Returns true if the DTB address translation is being delayed due to a hw page table walk.
Definition at line 343 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::translationCompleted(), and BaseDynInst< Impl >::translationStarted().
|
inline |
Definition at line 525 of file base_dyn_inst.hh.
References StaticInst::isUncondCtrl().
|
inline |
Definition at line 539 of file base_dyn_inst.hh.
References StaticInst::isUnverifiable().
|
inline |
Definition at line 518 of file base_dyn_inst.hh.
References StaticInst::isVector().
|
inline |
Definition at line 535 of file base_dyn_inst.hh.
References StaticInst::isWriteBarrier().
void BaseDynInst< Impl >::markSrcRegReady | ( | ) |
Records that one of the source registers is ready.
Definition at line 206 of file base_dyn_inst_impl.hh.
References DPRINTF, BaseDynInst< Impl >::numSrcRegs(), BaseDynInst< Impl >::readyRegs, BaseDynInst< Impl >::readyToIssue(), BaseDynInst< Impl >::seqNum, and BaseDynInst< Impl >::setCanIssue().
Referenced by BaseDynInst< Impl >::markSrcRegReady(), and BaseDynInst< Impl >::setVecPredRegOperand().
void BaseDynInst< Impl >::markSrcRegReady | ( | RegIndex | src_idx | ) |
Marks a specific register as ready.
Definition at line 217 of file base_dyn_inst_impl.hh.
References BaseDynInst< Impl >::_readySrcRegIdx, and BaseDynInst< Impl >::markSrcRegReady().
|
inline |
Read this CPU's data requestor ID.
Definition at line 450 of file base_dyn_inst.hh.
|
inline |
Whether or not the memory operation is done.
Definition at line 280 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::MemOpDone.
|
inline |
Definition at line 281 of file base_dyn_inst.hh.
References ArmISA::f, and BaseDynInst< Impl >::MemOpDone.
|
inline |
Read the micro PC of this instruction.
Definition at line 883 of file base_dyn_inst.hh.
Referenced by BaseO3DynInst< Impl >::~BaseO3DynInst().
|
inline |
Returns whether the instruction mispredicted.
Definition at line 497 of file base_dyn_inst.hh.
References AlphaISA::advancePC(), BaseDynInst< Impl >::pc, and BaseDynInst< Impl >::predPC.
|
inlinevirtual |
Implements ExecContext.
Definition at line 955 of file base_dyn_inst.hh.
|
inlinevirtual |
Implements ExecContext.
Definition at line 956 of file base_dyn_inst.hh.
|
inline |
Read the PC of the next instruction.
Definition at line 880 of file base_dyn_inst.hh.
|
inline |
Definition at line 283 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::NotAnInst.
|
inline |
Definition at line 593 of file base_dyn_inst.hh.
References StaticInst::numCCDestRegs().
|
inline |
Returns the number of destination registers.
Definition at line 587 of file base_dyn_inst.hh.
References StaticInst::numDestRegs().
Referenced by BaseO3DynInst< Impl >::forwardOldRegs(), and BaseDynInst< Impl >::setSquashed().
|
inline |
Definition at line 591 of file base_dyn_inst.hh.
References StaticInst::numFPDestRegs().
|
inline |
Definition at line 592 of file base_dyn_inst.hh.
References StaticInst::numIntDestRegs().
|
inline |
Returns the number of source registers.
Definition at line 584 of file base_dyn_inst.hh.
References StaticInst::numSrcRegs().
Referenced by BaseDynInst< Impl >::eaSrcsReady(), and BaseDynInst< Impl >::markSrcRegReady().
|
inline |
Definition at line 594 of file base_dyn_inst.hh.
References StaticInst::numVecDestRegs().
|
inline |
Definition at line 595 of file base_dyn_inst.hh.
References StaticInst::numVecElemDestRegs().
|
inline |
Definition at line 600 of file base_dyn_inst.hh.
References StaticInst::numVecPredDestRegs().
|
inline |
Returns the opclass of this instruction.
Definition at line 577 of file base_dyn_inst.hh.
References StaticInst::opClass().
|
inlinevirtual |
Read the PC state of this instruction.
Implements ExecContext.
Definition at line 871 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::pc.
Referenced by BaseO3DynInst< Impl >::syscall().
|
inlinevirtual |
Set the PC state of this instruction.
Implements ExecContext.
Definition at line 874 of file base_dyn_inst.hh.
References X86ISA::val.
|
inline |
Pops a result off the instResult queue.
If the result stack is empty, return the default value.
Definition at line 617 of file base_dyn_inst.hh.
References ArmISA::t.
|
inline |
True if this address was found to match a previous load and they issued out of order.
If that happend, then it's only a problem if an incoming snoop invalidate modifies the line, in which case we need to squash. If nothing modified the line the order doesn't matter.
Definition at line 329 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::PossibleLoadViolation.
|
inline |
Definition at line 330 of file base_dyn_inst.hh.
References ArmISA::f, and BaseDynInst< Impl >::PossibleLoadViolation.
|
inline |
Returns the predicted PC immediately after the branch.
Definition at line 477 of file base_dyn_inst.hh.
|
inline |
Returns the predicted micro PC after the branch.
Definition at line 483 of file base_dyn_inst.hh.
|
inline |
Returns the predicted PC two instructions after the branch.
Definition at line 480 of file base_dyn_inst.hh.
|
inline |
Returns the physical register index of the previous physical register that remapped to the same logical register index.
Definition at line 379 of file base_dyn_inst.hh.
Referenced by BaseO3DynInst< Impl >::forwardOldRegs().
|
inlinevirtual |
Implements ExecContext.
Definition at line 900 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::MemAccPredicate.
|
inlinevirtual |
Implements ExecContext.
Definition at line 885 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::Predicate.
|
inline |
Returns whether the instruction was predicted taken or not.
Definition at line 486 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::PredTaken.
|
inline |
Definition at line 474 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::predPC.
|
inlinevirtual |
Returns the number of consecutive store conditional failures.
Implements ExecContext.
Definition at line 945 of file base_dyn_inst.hh.
|
inline |
Returns whether or not this instruction is ready to commit.
Definition at line 764 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::CanCommit.
|
inline |
Returns whether or not this instruction is ready to issue.
Definition at line 737 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::CanIssue.
Referenced by BaseDynInst< Impl >::markSrcRegReady().
|
inline |
Records changes to result?
Definition at line 273 of file base_dyn_inst.hh.
References ArmISA::f, and BaseDynInst< Impl >::RecordResult.
|
inline |
Sets this instruction as a entry the LSQ.
Definition at line 806 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::LsqEntry.
|
inline |
Returns the physical register index of the i'th destination register.
Definition at line 356 of file base_dyn_inst.hh.
Referenced by BaseDynInst< Impl >::setSquashed().
|
inline |
Renames a destination register to a physical register.
Also records the previous physical register that the logical register mapped to.
Definition at line 387 of file base_dyn_inst.hh.
References PhysRegId::isPinned(), and BaseDynInst< Impl >::setPinnedRegsRenamed().
|
inline |
Returns the physical register index of the i'th source register.
Definition at line 362 of file base_dyn_inst.hh.
References ArmISA::MaxInstSrcRegs.
|
inline |
Renames a source logical register to the physical register which has/will produce that logical register's result.
Definition at line 401 of file base_dyn_inst.hh.
|
inline |
Return the size of the instResult queue.
Definition at line 612 of file base_dyn_inst.hh.
|
inline |
Sets the ASID.
Definition at line 912 of file base_dyn_inst.hh.
|
inline |
Definition at line 766 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::AtCommit.
|
inline |
Sets this instruction as ready to commit.
Definition at line 758 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::CanCommit.
|
inline |
Sets this instruction as ready to issue.
Definition at line 734 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::CanIssue.
Referenced by BaseDynInst< Impl >::markSrcRegReady().
|
inlinevirtual |
Records a CC register being set to a value.
Implements ExecContext.
Reimplemented in BaseO3DynInst< Impl >.
Definition at line 677 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::setScalarResult().
Referenced by BaseO3DynInst< Impl >::setCCRegOperand().
|
inline |
Sets this instruction as committed.
Definition at line 771 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::Committed.
|
inline |
Sets this instruction as completed.
Definition at line 722 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::Completed.
|
inline |
Sets this instruction as executed.
Definition at line 752 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::Executed.
|
inlinevirtual |
Records an fp register being set to an integer value.
Implements ExecContext.
Reimplemented in BaseO3DynInst< Impl >.
Definition at line 691 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::setScalarResult().
Referenced by BaseO3DynInst< Impl >::setFloatRegOperandBits().
|
inline |
Sets this instruction as a entry the IQ.
Definition at line 785 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::IqEntry.
|
inline |
Sets this instruction as a entry the LSQ.
Definition at line 803 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::LsqEntry.
|
inline |
Sets this instruction as a entry the ROB.
Definition at line 821 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::RobEntry.
|
inline |
Sets iterator for this instruction in the list of all insts.
Definition at line 941 of file base_dyn_inst.hh.
|
inlinevirtual |
Records an integer register being set to a value.
Implements ExecContext.
Reimplemented in BaseO3DynInst< Impl >.
Definition at line 671 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::setScalarResult().
Referenced by BaseO3DynInst< Impl >::setIntRegOperand().
|
inline |
Sets this instruction as issued from the IQ.
Definition at line 743 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::Issued.
|
inlinevirtual |
Implements ExecContext.
Definition at line 906 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::MemAccPredicate, and X86ISA::val.
|
inline |
Definition at line 284 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::NotAnInst.
|
inline |
Sets the destination registers as renamed.
Definition at line 840 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::PinnedRegsRenamed, BaseDynInst< Impl >::PinnedRegsSquashDone, and BaseDynInst< Impl >::PinnedRegsWritten.
Referenced by BaseDynInst< Impl >::renameDestReg().
|
inline |
Sets dest registers' status updated after squash.
Definition at line 865 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::PinnedRegsSquashDone.
Referenced by BaseDynInst< Impl >::setSquashed().
|
inline |
Sets destination registers as written.
Definition at line 852 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::PinnedRegsRenamed, BaseDynInst< Impl >::PinnedRegsSquashDone, and BaseDynInst< Impl >::PinnedRegsWritten.
|
inlinevirtual |
Implements ExecContext.
Definition at line 890 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::Predicate, Trace::InstRecord::setPredicate(), and X86ISA::val.
|
inline |
Definition at line 491 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::PredTaken.
|
inline |
Set the predicted target of this current instruction.
Definition at line 469 of file base_dyn_inst.hh.
|
inline |
Assert this instruction has generated a memory request.
Definition at line 935 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::ReqMade.
|
inline |
Marks the result as ready.
Definition at line 728 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::ResultReady.
|
inline |
Pushes a result onto the instResult queue.
Scalar result.
Definition at line 631 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::RecordResult, InstResult::Scalar, and ArmISA::t.
Referenced by BaseDynInst< Impl >::setCCRegOperand(), BaseDynInst< Impl >::setFloatRegOperandBits(), and BaseDynInst< Impl >::setIntRegOperand().
|
inline |
Temporarily sets this instruction as a serialize after instruction.
Definition at line 558 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::SerializeAfter.
|
inline |
Temporarily sets this instruction as a serialize before instruction.
Definition at line 549 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::SerializeBefore.
|
inline |
Sets the serialization part of this instruction as handled.
Definition at line 567 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::SerializeHandled.
void BaseDynInst< Impl >::setSquashed | ( | ) |
Sets this instruction as squashed.
Definition at line 244 of file base_dyn_inst_impl.hh.
References PhysRegId::incrNumPinnedWrites(), PhysRegId::incrNumPinnedWritesToComplete(), PhysRegId::isPinned(), BaseDynInst< Impl >::isPinnedRegsRenamed(), BaseDynInst< Impl >::isPinnedRegsSquashDone(), BaseDynInst< Impl >::isPinnedRegsWritten(), BaseDynInst< Impl >::numDestRegs(), BaseDynInst< Impl >::renamedDestRegIdx(), BaseDynInst< Impl >::setPinnedRegsSquashDone(), BaseDynInst< Impl >::Squashed, and BaseDynInst< Impl >::status.
Referenced by BaseDynInst< Impl >::isCommitted().
|
inline |
Sets this instruction as squashed in the IQ.
Definition at line 794 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::Squashed, and BaseDynInst< Impl >::SquashedInIQ.
|
inline |
Sets this instruction as squashed in the LSQ.
Definition at line 812 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::Squashed, and BaseDynInst< Impl >::SquashedInLSQ.
|
inline |
Sets this instruction as squashed in the ROB.
Definition at line 830 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::SquashedInROB.
|
inlinevirtual |
Sets the number of consecutive store conditional failures.
Implements ExecContext.
Definition at line 949 of file base_dyn_inst.hh.
|
inline |
Sets the pointer to the thread state.
Definition at line 919 of file base_dyn_inst.hh.
|
inline |
Sets the thread id.
Definition at line 916 of file base_dyn_inst.hh.
|
inlinevirtual |
Record a vector register being set to a value.
Implements ExecContext.
Reimplemented in BaseO3DynInst< Impl >.
Definition at line 697 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::setVecElemResult().
Referenced by BaseO3DynInst< Impl >::setVecElemOperand().
|
inline |
Vector element result.
Definition at line 651 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::RecordResult, ArmISA::t, and InstResult::VecElem.
Referenced by BaseDynInst< Impl >::setVecElemOperand().
|
inlinevirtual |
Record a vector register being set to a value.
Implements ExecContext.
Reimplemented in BaseO3DynInst< Impl >.
Definition at line 703 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::markSrcRegReady(), and BaseDynInst< Impl >::setVecPredResult().
Referenced by BaseO3DynInst< Impl >::setVecPredRegOperand().
|
inline |
Predicate result.
Definition at line 661 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::RecordResult, ArmISA::t, and InstResult::VecPredReg.
Referenced by BaseDynInst< Impl >::setVecPredRegOperand().
|
inlinevirtual |
Record a vector register being set to a value.
Implements ExecContext.
Reimplemented in BaseO3DynInst< Impl >.
Definition at line 683 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::setVecResult().
Referenced by BaseO3DynInst< Impl >::setVecRegOperand().
Full vector result.
Definition at line 641 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::RecordResult, ArmISA::t, and InstResult::VecReg.
Referenced by BaseDynInst< Impl >::setVecRegOperand().
|
inline |
Read this CPU's Socket ID.
Definition at line 447 of file base_dyn_inst.hh.
|
inline |
Returns the logical register index of the i'th source register.
Definition at line 609 of file base_dyn_inst.hh.
References StaticInst::srcRegIdx().
|
inline |
Is this instruction's memory access strictly ordered?
Definition at line 929 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::IsStrictlyOrdered.
|
inline |
Definition at line 930 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::IsStrictlyOrdered, and PowerISA::so.
|
inlinevirtual |
Returns the thread context.
Implements ExecContext.
Definition at line 922 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::eaSrcsReady().
|
inline |
True if the DTB address translation has completed.
Definition at line 321 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::TranslationCompleted.
Referenced by BaseDynInst< Impl >::isTranslationDelayed().
|
inline |
Definition at line 322 of file base_dyn_inst.hh.
References ArmISA::f, and BaseDynInst< Impl >::TranslationCompleted.
|
inline |
True if the DTB address translation has started.
Definition at line 317 of file base_dyn_inst.hh.
References BaseDynInst< Impl >::TranslationStarted.
Referenced by BaseDynInst< Impl >::isTranslationDelayed().
|
inline |
Definition at line 318 of file base_dyn_inst.hh.
References ArmISA::f, and BaseDynInst< Impl >::TranslationStarted.
Fault BaseDynInst< Impl >::writeMem | ( | uint8_t * | data, |
unsigned | size, | ||
Addr | addr, | ||
Request::Flags | flags, | ||
uint64_t * | res, | ||
const std::vector< bool > & | byte_enable = std::vector<bool>() |
||
) |
Definition at line 977 of file base_dyn_inst.hh.
Referenced by BaseDynInst< Impl >::demapDataPage().
|
protected |
Physical register index of the destination registers of this instruction.
Definition at line 258 of file base_dyn_inst.hh.
Referenced by BaseO3DynInst< Impl >::getWritableVecPredRegOperand(), BaseO3DynInst< Impl >::getWritableVecRegOperand(), BaseO3DynInst< Impl >::setCCRegOperand(), BaseO3DynInst< Impl >::setFloatRegOperandBits(), BaseO3DynInst< Impl >::setIntRegOperand(), BaseO3DynInst< Impl >::setVecElemOperand(), BaseO3DynInst< Impl >::setVecLaneOperandT(), BaseO3DynInst< Impl >::setVecPredRegOperand(), and BaseO3DynInst< Impl >::setVecRegOperand().
|
protected |
Flattened register index of the destination registers of this instruction.
Definition at line 253 of file base_dyn_inst.hh.
|
protected |
Physical register index of the previous producers of the architected destinations.
Definition at line 268 of file base_dyn_inst.hh.
|
protected |
Whether or not the source register is ready.
Definition at line 190 of file base_dyn_inst.hh.
Referenced by BaseDynInst< Impl >::eaSrcsReady(), BaseO3DynInst< Impl >::initVars(), and BaseDynInst< Impl >::markSrcRegReady().
|
protected |
Physical register index of the source registers of this instruction.
Definition at line 263 of file base_dyn_inst.hh.
Referenced by BaseO3DynInst< Impl >::readCCRegOperand(), BaseO3DynInst< Impl >::readFloatRegOperandBits(), BaseO3DynInst< Impl >::readIntRegOperand(), BaseO3DynInst< Impl >::readVec16BitLaneOperand(), BaseO3DynInst< Impl >::readVec32BitLaneOperand(), BaseO3DynInst< Impl >::readVec64BitLaneOperand(), BaseO3DynInst< Impl >::readVec8BitLaneOperand(), BaseO3DynInst< Impl >::readVecElemOperand(), BaseO3DynInst< Impl >::readVecPredRegOperand(), and BaseO3DynInst< Impl >::readVecRegOperand().
short BaseDynInst< Impl >::asid |
data address space ID, for loads & stores.
Definition at line 221 of file base_dyn_inst.hh.
Referenced by BaseDynInst< Impl >::getASID(), and BaseDynInst< Impl >::initVars().
ImplCPU* BaseDynInst< Impl >::cpu |
Pointer to the Impl's CPU object.
Definition at line 157 of file base_dyn_inst.hh.
Referenced by BaseO3DynInst< Impl >::completeAcc(), BaseO3DynInst< Impl >::forwardOldRegs(), BaseDynInst< Impl >::getCpuPtr(), BaseO3DynInst< Impl >::getWritableVecPredRegOperand(), BaseO3DynInst< Impl >::getWritableVecRegOperand(), BaseDynInst< Impl >::initVars(), BaseO3DynInst< Impl >::readCCRegOperand(), BaseO3DynInst< Impl >::readFloatRegOperandBits(), BaseO3DynInst< Impl >::readIntRegOperand(), BaseO3DynInst< Impl >::readMiscReg(), BaseO3DynInst< Impl >::readMiscRegOperand(), BaseO3DynInst< Impl >::readVec16BitLaneOperand(), BaseO3DynInst< Impl >::readVec32BitLaneOperand(), BaseO3DynInst< Impl >::readVec64BitLaneOperand(), BaseO3DynInst< Impl >::readVec8BitLaneOperand(), BaseO3DynInst< Impl >::readVecElemOperand(), BaseO3DynInst< Impl >::readVecPredRegOperand(), BaseO3DynInst< Impl >::readVecRegOperand(), BaseO3DynInst< Impl >::setCCRegOperand(), BaseO3DynInst< Impl >::setFloatRegOperandBits(), BaseO3DynInst< Impl >::setIntRegOperand(), BaseO3DynInst< Impl >::setVecElemOperand(), BaseO3DynInst< Impl >::setVecLaneOperandT(), BaseO3DynInst< Impl >::setVecPredRegOperand(), BaseO3DynInst< Impl >::setVecRegOperand(), BaseO3DynInst< Impl >::syscall(), BaseO3DynInst< Impl >::trap(), BaseO3DynInst< Impl >::updateMiscRegs(), and BaseDynInst< Impl >::~BaseDynInst().
Addr BaseDynInst< Impl >::effAddr |
The effective virtual address (lds & stores only).
Definition at line 212 of file base_dyn_inst.hh.
Referenced by BaseDynInst< Impl >::initVars().
unsigned BaseDynInst< Impl >::effSize |
The size of the request.
Definition at line 224 of file base_dyn_inst.hh.
Fault BaseDynInst< Impl >::fault |
The kind of fault this instruction has generated.
Definition at line 165 of file base_dyn_inst.hh.
Referenced by BaseO3DynInst< Impl >::completeAcc(), BaseO3DynInst< Impl >::execute(), BaseO3DynInst< Impl >::forwardOldRegs(), BaseDynInst< Impl >::getFault(), BaseO3DynInst< Impl >::initiateAcc(), BaseDynInst< Impl >::initVars(), and BaseDynInst< Impl >::~BaseDynInst().
|
private |
Definition at line 181 of file base_dyn_inst.hh.
Referenced by BaseDynInst< Impl >::initVars().
ListIt BaseDynInst< Impl >::instListIt |
Iterator pointing to this BaseDynInst in the list of all insts.
Definition at line 197 of file base_dyn_inst.hh.
Referenced by BaseDynInst< Impl >::getInstListIt().
|
protected |
The result of the instruction; assumes an instruction can have many destination registers.
Definition at line 174 of file base_dyn_inst.hh.
int16_t BaseDynInst< Impl >::lqIdx |
Load queue index.
Definition at line 230 of file base_dyn_inst.hh.
Referenced by BaseDynInst< Impl >::initVars().
LQIterator BaseDynInst< Impl >::lqIt |
Definition at line 231 of file base_dyn_inst.hh.
const StaticInstPtr BaseDynInst< Impl >::macroop |
The Macroop if one exists.
Definition at line 204 of file base_dyn_inst.hh.
uint8_t* BaseDynInst< Impl >::memData |
Pointer to the data for the memory access.
Definition at line 227 of file base_dyn_inst.hh.
Referenced by BaseDynInst< Impl >::initVars(), and BaseDynInst< Impl >::~BaseDynInst().
unsigned BaseDynInst< Impl >::memReqFlags |
The memory request flags (from translation).
Definition at line 218 of file base_dyn_inst.hh.
Referenced by BaseDynInst< Impl >::initVars().
|
protected |
PC state for this instruction.
Definition at line 177 of file base_dyn_inst.hh.
Referenced by BaseDynInst< Impl >::BaseDynInst(), BaseDynInst< Impl >::dump(), BaseDynInst< Impl >::mispredicted(), and BaseDynInst< Impl >::pcState().
Addr BaseDynInst< Impl >::physEffAddr |
The effective physical address.
Definition at line 215 of file base_dyn_inst.hh.
Referenced by BaseDynInst< Impl >::initVars().
TheISA::PCState BaseDynInst< Impl >::predPC |
Predicted PC state after this instruction.
Definition at line 201 of file base_dyn_inst.hh.
Referenced by BaseDynInst< Impl >::BaseDynInst(), BaseDynInst< Impl >::mispredicted(), and BaseDynInst< Impl >::readPredTarg().
uint8_t BaseDynInst< Impl >::readyRegs |
How many source registers are ready.
Definition at line 207 of file base_dyn_inst.hh.
Referenced by BaseDynInst< Impl >::initVars(), and BaseDynInst< Impl >::markSrcRegReady().
RequestPtr BaseDynInst< Impl >::reqToVerify |
Definition at line 247 of file base_dyn_inst.hh.
Referenced by BaseO3DynInst< Impl >::completeAcc().
LSQRequestPtr BaseDynInst< Impl >::savedReq |
Saved memory request (needed when the DTB address translation is delayed due to a hw page table walk).
Definition at line 243 of file base_dyn_inst.hh.
InstSeqNum BaseDynInst< Impl >::seqNum |
The sequence number of the instruction.
Definition at line 151 of file base_dyn_inst.hh.
Referenced by BaseDynInst< Impl >::BaseDynInst(), BaseDynInst< Impl >::initVars(), BaseDynInst< Impl >::markSrcRegReady(), BaseDynInst< Impl >::~BaseDynInst(), and BaseO3DynInst< Impl >::~BaseO3DynInst().
int16_t BaseDynInst< Impl >::sqIdx |
Store queue index.
Definition at line 234 of file base_dyn_inst.hh.
Referenced by BaseDynInst< Impl >::initVars().
SQIterator BaseDynInst< Impl >::sqIt |
Definition at line 235 of file base_dyn_inst.hh.
const StaticInstPtr BaseDynInst< Impl >::staticInst |
The StaticInst used by this BaseDynInst.
Definition at line 154 of file base_dyn_inst.hh.
Referenced by BaseO3DynInst< Impl >::completeAcc(), BaseDynInst< Impl >::dump(), BaseO3DynInst< Impl >::execute(), BaseO3DynInst< Impl >::forwardOldRegs(), BaseO3DynInst< Impl >::initiateAcc(), BaseO3DynInst< Impl >::trap(), and BaseO3DynInst< Impl >::~BaseO3DynInst().
|
private |
The status of this BaseDynInst.
Several bits can be set.
Definition at line 184 of file base_dyn_inst.hh.
Referenced by BaseDynInst< Impl >::initVars(), and BaseDynInst< Impl >::setSquashed().
ImplState* BaseDynInst< Impl >::thread |
Pointer to the thread state.
Definition at line 162 of file base_dyn_inst.hh.
Referenced by BaseO3DynInst< Impl >::completeAcc(), BaseO3DynInst< Impl >::execute(), BaseO3DynInst< Impl >::initiateAcc(), and BaseO3DynInst< Impl >::updateMiscRegs().
ThreadID BaseDynInst< Impl >::threadNumber |
The thread this instruction is from.
Definition at line 194 of file base_dyn_inst.hh.
Referenced by BaseDynInst< Impl >::dump(), BaseDynInst< Impl >::initVars(), BaseO3DynInst< Impl >::readMiscReg(), BaseO3DynInst< Impl >::readMiscRegOperand(), BaseO3DynInst< Impl >::syscall(), and BaseO3DynInst< Impl >::trap().
Trace::InstRecord* BaseDynInst< Impl >::traceData |
InstRecord that tracks this instructions.
Definition at line 168 of file base_dyn_inst.hh.
Referenced by BaseO3DynInst< Impl >::completeAcc(), BaseO3DynInst< Impl >::execute(), BaseO3DynInst< Impl >::initiateAcc(), and BaseDynInst< Impl >::~BaseDynInst().