blob: 42d517b2e5f9b91b83a863668f68a6550fa408d4 [file] [log] [blame]
Alkis Evlogimenos71499de2003-12-18 13:06:04 +00001//===-- TwoAddressInstructionPass.cpp - Two-Address instruction pass ------===//
2//
3// The LLVM Compiler Infrastructure
4//
Chris Lattner4ee451d2007-12-29 20:36:04 +00005// This file is distributed under the University of Illinois Open Source
6// License. See LICENSE.TXT for details.
Alkis Evlogimenos71499de2003-12-18 13:06:04 +00007//
8//===----------------------------------------------------------------------===//
9//
Alkis Evlogimenos50c047d2004-01-04 23:09:24 +000010// This file implements the TwoAddress instruction pass which is used
11// by most register allocators. Two-Address instructions are rewritten
12// from:
13//
14// A = B op C
15//
16// to:
17//
18// A = B
Alkis Evlogimenos14be6402004-02-04 22:17:40 +000019// A op= C
Alkis Evlogimenos71499de2003-12-18 13:06:04 +000020//
Alkis Evlogimenos14be6402004-02-04 22:17:40 +000021// Note that if a register allocator chooses to use this pass, that it
22// has to be capable of handling the non-SSA nature of these rewritten
23// virtual registers.
24//
25// It is also worth noting that the duplicate operand of the two
26// address instruction is removed.
Chris Lattnerbd91c1c2004-01-31 21:07:15 +000027//
Alkis Evlogimenos71499de2003-12-18 13:06:04 +000028//===----------------------------------------------------------------------===//
29
30#define DEBUG_TYPE "twoaddrinstr"
Chris Lattnerbd91c1c2004-01-31 21:07:15 +000031#include "llvm/CodeGen/Passes.h"
Chris Lattner1e313632004-07-21 23:17:57 +000032#include "llvm/Function.h"
Alkis Evlogimenos71499de2003-12-18 13:06:04 +000033#include "llvm/CodeGen/LiveVariables.h"
Alkis Evlogimenos71499de2003-12-18 13:06:04 +000034#include "llvm/CodeGen/MachineFunctionPass.h"
35#include "llvm/CodeGen/MachineInstr.h"
Chris Lattner84bc5422007-12-31 04:13:23 +000036#include "llvm/CodeGen/MachineRegisterInfo.h"
Dan Gohman6f0d0242008-02-10 18:45:23 +000037#include "llvm/Target/TargetRegisterInfo.h"
Alkis Evlogimenos71499de2003-12-18 13:06:04 +000038#include "llvm/Target/TargetInstrInfo.h"
39#include "llvm/Target/TargetMachine.h"
Owen Anderson95dad832008-10-07 20:22:28 +000040#include "llvm/Target/TargetOptions.h"
Chris Lattnera4f0b3a2006-08-27 12:54:02 +000041#include "llvm/Support/Compiler.h"
Evan Cheng875357d2008-03-13 06:37:55 +000042#include "llvm/Support/Debug.h"
Evan Cheng7543e582008-06-18 07:49:14 +000043#include "llvm/ADT/BitVector.h"
44#include "llvm/ADT/DenseMap.h"
Dan Gohmand68a0762009-01-05 17:59:02 +000045#include "llvm/ADT/SmallSet.h"
Reid Spencer551ccae2004-09-01 22:55:40 +000046#include "llvm/ADT/Statistic.h"
47#include "llvm/ADT/STLExtras.h"
Alkis Evlogimenos71499de2003-12-18 13:06:04 +000048using namespace llvm;
49
Chris Lattnercd3245a2006-12-19 22:41:21 +000050STATISTIC(NumTwoAddressInstrs, "Number of two-address instructions");
51STATISTIC(NumCommuted , "Number of instructions commuted to coalesce");
Evan Chengd498c8f2009-01-25 03:53:59 +000052STATISTIC(NumAggrCommuted , "Number of instructions aggressively commuted");
Chris Lattnercd3245a2006-12-19 22:41:21 +000053STATISTIC(NumConvertedTo3Addr, "Number of instructions promoted to 3-address");
Evan Cheng875357d2008-03-13 06:37:55 +000054STATISTIC(Num3AddrSunk, "Number of 3-address instructions sunk");
Evan Cheng7543e582008-06-18 07:49:14 +000055STATISTIC(NumReMats, "Number of instructions re-materialized");
Evan Cheng28c7ce32009-02-21 03:14:25 +000056STATISTIC(NumDeletes, "Number of dead instructions deleted");
Evan Cheng875357d2008-03-13 06:37:55 +000057
58namespace {
Bill Wendling637980e2008-05-10 00:12:52 +000059 class VISIBILITY_HIDDEN TwoAddressInstructionPass
60 : public MachineFunctionPass {
Evan Cheng875357d2008-03-13 06:37:55 +000061 const TargetInstrInfo *TII;
62 const TargetRegisterInfo *TRI;
63 MachineRegisterInfo *MRI;
64 LiveVariables *LV;
65
Evan Cheng870b8072009-03-01 02:03:43 +000066 // DistanceMap - Keep track the distance of a MI from the start of the
67 // current basic block.
68 DenseMap<MachineInstr*, unsigned> DistanceMap;
69
70 // SrcRegMap - A map from virtual registers to physical registers which
71 // are likely targets to be coalesced to due to copies from physical
72 // registers to virtual registers. e.g. v1024 = move r0.
73 DenseMap<unsigned, unsigned> SrcRegMap;
74
75 // DstRegMap - A map from virtual registers to physical registers which
76 // are likely targets to be coalesced to due to copies to physical
77 // registers from virtual registers. e.g. r1 = move v1024.
78 DenseMap<unsigned, unsigned> DstRegMap;
79
Bill Wendling637980e2008-05-10 00:12:52 +000080 bool Sink3AddrInstruction(MachineBasicBlock *MBB, MachineInstr *MI,
81 unsigned Reg,
82 MachineBasicBlock::iterator OldPos);
Evan Cheng7543e582008-06-18 07:49:14 +000083
Evan Cheng7543e582008-06-18 07:49:14 +000084 bool isProfitableToReMat(unsigned Reg, const TargetRegisterClass *RC,
Evan Cheng601ca4b2008-06-25 01:16:38 +000085 MachineInstr *MI, MachineInstr *DefMI,
Evan Cheng870b8072009-03-01 02:03:43 +000086 MachineBasicBlock *MBB, unsigned Loc);
Evan Cheng81913712009-01-23 23:27:33 +000087
Evan Chengd498c8f2009-01-25 03:53:59 +000088 bool NoUseAfterLastDef(unsigned Reg, MachineBasicBlock *MBB, unsigned Dist,
Evan Chengd498c8f2009-01-25 03:53:59 +000089 unsigned &LastDef);
90
91 bool isProfitableToCommute(unsigned regB, unsigned regC,
92 MachineInstr *MI, MachineBasicBlock *MBB,
Evan Cheng870b8072009-03-01 02:03:43 +000093 unsigned Dist);
Evan Chengd498c8f2009-01-25 03:53:59 +000094
Evan Cheng81913712009-01-23 23:27:33 +000095 bool CommuteInstruction(MachineBasicBlock::iterator &mi,
96 MachineFunction::iterator &mbbi,
Evan Cheng870b8072009-03-01 02:03:43 +000097 unsigned RegB, unsigned RegC, unsigned Dist);
98
Evan Chenge6f350d2009-03-30 21:34:07 +000099 bool isProfitableToConv3Addr(unsigned RegA);
100
101 bool ConvertInstTo3Addr(MachineBasicBlock::iterator &mi,
102 MachineBasicBlock::iterator &nmi,
103 MachineFunction::iterator &mbbi,
104 unsigned RegB, unsigned Dist);
105
Evan Cheng870b8072009-03-01 02:03:43 +0000106 void ProcessCopy(MachineInstr *MI, MachineBasicBlock *MBB,
107 SmallPtrSet<MachineInstr*, 8> &Processed);
Evan Cheng875357d2008-03-13 06:37:55 +0000108 public:
Nick Lewyckyecd94c82007-05-06 13:37:16 +0000109 static char ID; // Pass identification, replacement for typeid
Dan Gohmanae73dc12008-09-04 17:05:41 +0000110 TwoAddressInstructionPass() : MachineFunctionPass(&ID) {}
Devang Patel794fd752007-05-01 21:15:47 +0000111
Bill Wendling637980e2008-05-10 00:12:52 +0000112 virtual void getAnalysisUsage(AnalysisUsage &AU) const {
Bill Wendling637980e2008-05-10 00:12:52 +0000113 AU.addPreserved<LiveVariables>();
114 AU.addPreservedID(MachineLoopInfoID);
115 AU.addPreservedID(MachineDominatorsID);
Owen Anderson95dad832008-10-07 20:22:28 +0000116 if (StrongPHIElim)
117 AU.addPreservedID(StrongPHIEliminationID);
118 else
119 AU.addPreservedID(PHIEliminationID);
Bill Wendling637980e2008-05-10 00:12:52 +0000120 MachineFunctionPass::getAnalysisUsage(AU);
121 }
Alkis Evlogimenos4c080862003-12-18 22:40:24 +0000122
Bill Wendling637980e2008-05-10 00:12:52 +0000123 /// runOnMachineFunction - Pass entry point.
Misha Brukman75fa4e42004-07-22 15:26:23 +0000124 bool runOnMachineFunction(MachineFunction&);
125 };
Chris Lattnerd74ea2b2006-05-24 17:04:05 +0000126}
Alkis Evlogimenos71499de2003-12-18 13:06:04 +0000127
Dan Gohman844731a2008-05-13 00:00:25 +0000128char TwoAddressInstructionPass::ID = 0;
129static RegisterPass<TwoAddressInstructionPass>
130X("twoaddressinstruction", "Two-Address instruction pass");
131
Dan Gohman6ddba2b2008-05-13 02:05:11 +0000132const PassInfo *const llvm::TwoAddressInstructionPassID = &X;
Alkis Evlogimenos4c080862003-12-18 22:40:24 +0000133
Evan Cheng875357d2008-03-13 06:37:55 +0000134/// Sink3AddrInstruction - A two-address instruction has been converted to a
135/// three-address instruction to avoid clobbering a register. Try to sink it
Bill Wendling637980e2008-05-10 00:12:52 +0000136/// past the instruction that would kill the above mentioned register to reduce
137/// register pressure.
Evan Cheng875357d2008-03-13 06:37:55 +0000138bool TwoAddressInstructionPass::Sink3AddrInstruction(MachineBasicBlock *MBB,
139 MachineInstr *MI, unsigned SavedReg,
140 MachineBasicBlock::iterator OldPos) {
141 // Check if it's safe to move this instruction.
142 bool SeenStore = true; // Be conservative.
143 if (!MI->isSafeToMove(TII, SeenStore))
144 return false;
145
146 unsigned DefReg = 0;
147 SmallSet<unsigned, 4> UseRegs;
Bill Wendling637980e2008-05-10 00:12:52 +0000148
Evan Cheng875357d2008-03-13 06:37:55 +0000149 for (unsigned i = 0, e = MI->getNumOperands(); i != e; ++i) {
150 const MachineOperand &MO = MI->getOperand(i);
Dan Gohmand735b802008-10-03 15:45:36 +0000151 if (!MO.isReg())
Evan Cheng875357d2008-03-13 06:37:55 +0000152 continue;
153 unsigned MOReg = MO.getReg();
154 if (!MOReg)
155 continue;
156 if (MO.isUse() && MOReg != SavedReg)
157 UseRegs.insert(MO.getReg());
158 if (!MO.isDef())
159 continue;
160 if (MO.isImplicit())
161 // Don't try to move it if it implicitly defines a register.
162 return false;
163 if (DefReg)
164 // For now, don't move any instructions that define multiple registers.
165 return false;
166 DefReg = MO.getReg();
167 }
168
169 // Find the instruction that kills SavedReg.
170 MachineInstr *KillMI = NULL;
171 for (MachineRegisterInfo::use_iterator UI = MRI->use_begin(SavedReg),
172 UE = MRI->use_end(); UI != UE; ++UI) {
173 MachineOperand &UseMO = UI.getOperand();
174 if (!UseMO.isKill())
175 continue;
176 KillMI = UseMO.getParent();
177 break;
178 }
Bill Wendling637980e2008-05-10 00:12:52 +0000179
Dan Gohman97121ba2009-04-08 00:15:30 +0000180 if (!KillMI || KillMI->getParent() != MBB || KillMI == MI)
Evan Cheng875357d2008-03-13 06:37:55 +0000181 return false;
182
Bill Wendling637980e2008-05-10 00:12:52 +0000183 // If any of the definitions are used by another instruction between the
184 // position and the kill use, then it's not safe to sink it.
185 //
186 // FIXME: This can be sped up if there is an easy way to query whether an
Evan Cheng7543e582008-06-18 07:49:14 +0000187 // instruction is before or after another instruction. Then we can use
Bill Wendling637980e2008-05-10 00:12:52 +0000188 // MachineRegisterInfo def / use instead.
Evan Cheng875357d2008-03-13 06:37:55 +0000189 MachineOperand *KillMO = NULL;
190 MachineBasicBlock::iterator KillPos = KillMI;
191 ++KillPos;
Bill Wendling637980e2008-05-10 00:12:52 +0000192
Evan Cheng7543e582008-06-18 07:49:14 +0000193 unsigned NumVisited = 0;
Evan Cheng875357d2008-03-13 06:37:55 +0000194 for (MachineBasicBlock::iterator I = next(OldPos); I != KillPos; ++I) {
195 MachineInstr *OtherMI = I;
Evan Cheng7543e582008-06-18 07:49:14 +0000196 if (NumVisited > 30) // FIXME: Arbitrary limit to reduce compile time cost.
197 return false;
198 ++NumVisited;
Evan Cheng875357d2008-03-13 06:37:55 +0000199 for (unsigned i = 0, e = OtherMI->getNumOperands(); i != e; ++i) {
200 MachineOperand &MO = OtherMI->getOperand(i);
Dan Gohmand735b802008-10-03 15:45:36 +0000201 if (!MO.isReg())
Evan Cheng875357d2008-03-13 06:37:55 +0000202 continue;
203 unsigned MOReg = MO.getReg();
204 if (!MOReg)
205 continue;
206 if (DefReg == MOReg)
207 return false;
Bill Wendling637980e2008-05-10 00:12:52 +0000208
Evan Cheng875357d2008-03-13 06:37:55 +0000209 if (MO.isKill()) {
210 if (OtherMI == KillMI && MOReg == SavedReg)
Evan Cheng7543e582008-06-18 07:49:14 +0000211 // Save the operand that kills the register. We want to unset the kill
212 // marker if we can sink MI past it.
Evan Cheng875357d2008-03-13 06:37:55 +0000213 KillMO = &MO;
214 else if (UseRegs.count(MOReg))
215 // One of the uses is killed before the destination.
216 return false;
217 }
218 }
219 }
220
Evan Cheng875357d2008-03-13 06:37:55 +0000221 // Update kill and LV information.
222 KillMO->setIsKill(false);
223 KillMO = MI->findRegisterUseOperand(SavedReg, false, TRI);
224 KillMO->setIsKill(true);
Owen Anderson802af112008-07-02 21:28:58 +0000225
Evan Cheng9f1c8312008-07-03 09:09:37 +0000226 if (LV)
227 LV->replaceKillInstruction(SavedReg, KillMI, MI);
Evan Cheng875357d2008-03-13 06:37:55 +0000228
229 // Move instruction to its destination.
230 MBB->remove(MI);
231 MBB->insert(KillPos, MI);
232
233 ++Num3AddrSunk;
234 return true;
235}
236
Evan Cheng7543e582008-06-18 07:49:14 +0000237/// isTwoAddrUse - Return true if the specified MI is using the specified
238/// register as a two-address operand.
239static bool isTwoAddrUse(MachineInstr *UseMI, unsigned Reg) {
240 const TargetInstrDesc &TID = UseMI->getDesc();
241 for (unsigned i = 0, e = TID.getNumOperands(); i != e; ++i) {
242 MachineOperand &MO = UseMI->getOperand(i);
Dan Gohmand735b802008-10-03 15:45:36 +0000243 if (MO.isReg() && MO.getReg() == Reg &&
Evan Chenga24752f2009-03-19 20:30:06 +0000244 (MO.isDef() || UseMI->isRegTiedToDefOperand(i)))
Evan Cheng7543e582008-06-18 07:49:14 +0000245 // Earlier use is a two-address one.
246 return true;
247 }
248 return false;
249}
250
251/// isProfitableToReMat - Return true if the heuristics determines it is likely
252/// to be profitable to re-materialize the definition of Reg rather than copy
253/// the register.
254bool
255TwoAddressInstructionPass::isProfitableToReMat(unsigned Reg,
Evan Cheng870b8072009-03-01 02:03:43 +0000256 const TargetRegisterClass *RC,
257 MachineInstr *MI, MachineInstr *DefMI,
258 MachineBasicBlock *MBB, unsigned Loc) {
Evan Cheng7543e582008-06-18 07:49:14 +0000259 bool OtherUse = false;
260 for (MachineRegisterInfo::use_iterator UI = MRI->use_begin(Reg),
261 UE = MRI->use_end(); UI != UE; ++UI) {
262 MachineOperand &UseMO = UI.getOperand();
Evan Cheng7543e582008-06-18 07:49:14 +0000263 MachineInstr *UseMI = UseMO.getParent();
Evan Cheng601ca4b2008-06-25 01:16:38 +0000264 MachineBasicBlock *UseMBB = UseMI->getParent();
265 if (UseMBB == MBB) {
266 DenseMap<MachineInstr*, unsigned>::iterator DI = DistanceMap.find(UseMI);
267 if (DI != DistanceMap.end() && DI->second == Loc)
268 continue; // Current use.
269 OtherUse = true;
270 // There is at least one other use in the MBB that will clobber the
271 // register.
272 if (isTwoAddrUse(UseMI, Reg))
273 return true;
274 }
Evan Cheng7543e582008-06-18 07:49:14 +0000275 }
Evan Cheng601ca4b2008-06-25 01:16:38 +0000276
277 // If other uses in MBB are not two-address uses, then don't remat.
278 if (OtherUse)
279 return false;
280
281 // No other uses in the same block, remat if it's defined in the same
282 // block so it does not unnecessarily extend the live range.
283 return MBB == DefMI->getParent();
Evan Cheng7543e582008-06-18 07:49:14 +0000284}
285
Evan Chengd498c8f2009-01-25 03:53:59 +0000286/// NoUseAfterLastDef - Return true if there are no intervening uses between the
287/// last instruction in the MBB that defines the specified register and the
288/// two-address instruction which is being processed. It also returns the last
289/// def location by reference
290bool TwoAddressInstructionPass::NoUseAfterLastDef(unsigned Reg,
Evan Cheng870b8072009-03-01 02:03:43 +0000291 MachineBasicBlock *MBB, unsigned Dist,
292 unsigned &LastDef) {
Evan Chengd498c8f2009-01-25 03:53:59 +0000293 LastDef = 0;
294 unsigned LastUse = Dist;
295 for (MachineRegisterInfo::reg_iterator I = MRI->reg_begin(Reg),
296 E = MRI->reg_end(); I != E; ++I) {
297 MachineOperand &MO = I.getOperand();
298 MachineInstr *MI = MO.getParent();
299 if (MI->getParent() != MBB)
300 continue;
301 DenseMap<MachineInstr*, unsigned>::iterator DI = DistanceMap.find(MI);
302 if (DI == DistanceMap.end())
303 continue;
304 if (MO.isUse() && DI->second < LastUse)
305 LastUse = DI->second;
306 if (MO.isDef() && DI->second > LastDef)
307 LastDef = DI->second;
308 }
309
310 return !(LastUse > LastDef && LastUse < Dist);
311}
312
Evan Cheng870b8072009-03-01 02:03:43 +0000313/// isCopyToReg - Return true if the specified MI is a copy instruction or
314/// a extract_subreg instruction. It also returns the source and destination
315/// registers and whether they are physical registers by reference.
316static bool isCopyToReg(MachineInstr &MI, const TargetInstrInfo *TII,
317 unsigned &SrcReg, unsigned &DstReg,
318 bool &IsSrcPhys, bool &IsDstPhys) {
319 SrcReg = 0;
320 DstReg = 0;
321 unsigned SrcSubIdx, DstSubIdx;
322 if (!TII->isMoveInstr(MI, SrcReg, DstReg, SrcSubIdx, DstSubIdx)) {
323 if (MI.getOpcode() == TargetInstrInfo::EXTRACT_SUBREG) {
324 DstReg = MI.getOperand(0).getReg();
325 SrcReg = MI.getOperand(1).getReg();
326 } else if (MI.getOpcode() == TargetInstrInfo::INSERT_SUBREG) {
327 DstReg = MI.getOperand(0).getReg();
328 SrcReg = MI.getOperand(2).getReg();
Dan Gohman97121ba2009-04-08 00:15:30 +0000329 } else if (MI.getOpcode() == TargetInstrInfo::SUBREG_TO_REG) {
330 DstReg = MI.getOperand(0).getReg();
331 SrcReg = MI.getOperand(2).getReg();
Evan Cheng870b8072009-03-01 02:03:43 +0000332 }
333 }
334
335 if (DstReg) {
336 IsSrcPhys = TargetRegisterInfo::isPhysicalRegister(SrcReg);
337 IsDstPhys = TargetRegisterInfo::isPhysicalRegister(DstReg);
338 return true;
339 }
340 return false;
341}
342
Dan Gohman97121ba2009-04-08 00:15:30 +0000343/// isKilled - Test if the given register value, which is used by the given
344/// instruction, is killed by the given instruction. This looks through
345/// coalescable copies to see if the original value is potentially not killed.
346///
347/// For example, in this code:
348///
349/// %reg1034 = copy %reg1024
350/// %reg1035 = copy %reg1025<kill>
351/// %reg1036 = add %reg1034<kill>, %reg1035<kill>
352///
353/// %reg1034 is not considered to be killed, since it is copied from a
354/// register which is not killed. Treating it as not killed lets the
355/// normal heuristics commute the (two-address) add, which lets
356/// coalescing eliminate the extra copy.
357///
358static bool isKilled(MachineInstr &MI, unsigned Reg,
359 const MachineRegisterInfo *MRI,
360 const TargetInstrInfo *TII) {
361 MachineInstr *DefMI = &MI;
362 for (;;) {
363 if (!DefMI->killsRegister(Reg))
364 return false;
365 if (TargetRegisterInfo::isPhysicalRegister(Reg))
366 return true;
367 MachineRegisterInfo::def_iterator Begin = MRI->def_begin(Reg);
368 // If there are multiple defs, we can't do a simple analysis, so just
369 // go with what the kill flag says.
370 if (next(Begin) != MRI->def_end())
371 return true;
372 DefMI = &*Begin;
373 bool IsSrcPhys, IsDstPhys;
374 unsigned SrcReg, DstReg;
375 // If the def is something other than a copy, then it isn't going to
376 // be coalesced, so follow the kill flag.
377 if (!isCopyToReg(*DefMI, TII, SrcReg, DstReg, IsSrcPhys, IsDstPhys))
378 return true;
379 Reg = SrcReg;
380 }
381}
382
Evan Cheng870b8072009-03-01 02:03:43 +0000383/// isTwoAddrUse - Return true if the specified MI uses the specified register
384/// as a two-address use. If so, return the destination register by reference.
385static bool isTwoAddrUse(MachineInstr &MI, unsigned Reg, unsigned &DstReg) {
386 const TargetInstrDesc &TID = MI.getDesc();
Evan Chenge6f350d2009-03-30 21:34:07 +0000387 unsigned NumOps = (MI.getOpcode() == TargetInstrInfo::INLINEASM)
388 ? MI.getNumOperands() : TID.getNumOperands();
389 for (unsigned i = 0; i != NumOps; ++i) {
Evan Cheng870b8072009-03-01 02:03:43 +0000390 const MachineOperand &MO = MI.getOperand(i);
391 if (!MO.isReg() || !MO.isUse() || MO.getReg() != Reg)
392 continue;
Evan Chenga24752f2009-03-19 20:30:06 +0000393 unsigned ti;
394 if (MI.isRegTiedToDefOperand(i, &ti)) {
Evan Cheng870b8072009-03-01 02:03:43 +0000395 DstReg = MI.getOperand(ti).getReg();
396 return true;
397 }
398 }
399 return false;
400}
401
402/// findOnlyInterestingUse - Given a register, if has a single in-basic block
403/// use, return the use instruction if it's a copy or a two-address use.
404static
405MachineInstr *findOnlyInterestingUse(unsigned Reg, MachineBasicBlock *MBB,
406 MachineRegisterInfo *MRI,
407 const TargetInstrInfo *TII,
Evan Cheng87d696a2009-04-14 00:32:25 +0000408 bool &IsCopy,
Evan Cheng870b8072009-03-01 02:03:43 +0000409 unsigned &DstReg, bool &IsDstPhys) {
410 MachineRegisterInfo::use_iterator UI = MRI->use_begin(Reg);
411 if (UI == MRI->use_end())
412 return 0;
413 MachineInstr &UseMI = *UI;
414 if (++UI != MRI->use_end())
415 // More than one use.
416 return 0;
417 if (UseMI.getParent() != MBB)
418 return 0;
419 unsigned SrcReg;
420 bool IsSrcPhys;
Evan Cheng87d696a2009-04-14 00:32:25 +0000421 if (isCopyToReg(UseMI, TII, SrcReg, DstReg, IsSrcPhys, IsDstPhys)) {
422 IsCopy = true;
Evan Cheng870b8072009-03-01 02:03:43 +0000423 return &UseMI;
Evan Cheng87d696a2009-04-14 00:32:25 +0000424 }
Evan Cheng870b8072009-03-01 02:03:43 +0000425 IsDstPhys = false;
Evan Cheng87d696a2009-04-14 00:32:25 +0000426 if (isTwoAddrUse(UseMI, Reg, DstReg)) {
427 IsDstPhys = TargetRegisterInfo::isPhysicalRegister(DstReg);
Evan Cheng870b8072009-03-01 02:03:43 +0000428 return &UseMI;
Evan Cheng87d696a2009-04-14 00:32:25 +0000429 }
Evan Cheng870b8072009-03-01 02:03:43 +0000430 return 0;
431}
432
433/// getMappedReg - Return the physical register the specified virtual register
434/// might be mapped to.
435static unsigned
436getMappedReg(unsigned Reg, DenseMap<unsigned, unsigned> &RegMap) {
437 while (TargetRegisterInfo::isVirtualRegister(Reg)) {
438 DenseMap<unsigned, unsigned>::iterator SI = RegMap.find(Reg);
439 if (SI == RegMap.end())
440 return 0;
441 Reg = SI->second;
442 }
443 if (TargetRegisterInfo::isPhysicalRegister(Reg))
444 return Reg;
445 return 0;
446}
447
448/// regsAreCompatible - Return true if the two registers are equal or aliased.
449///
450static bool
451regsAreCompatible(unsigned RegA, unsigned RegB, const TargetRegisterInfo *TRI) {
452 if (RegA == RegB)
453 return true;
454 if (!RegA || !RegB)
455 return false;
456 return TRI->regsOverlap(RegA, RegB);
457}
458
459
Evan Chengd498c8f2009-01-25 03:53:59 +0000460/// isProfitableToReMat - Return true if it's potentially profitable to commute
461/// the two-address instruction that's being processed.
462bool
463TwoAddressInstructionPass::isProfitableToCommute(unsigned regB, unsigned regC,
Evan Cheng870b8072009-03-01 02:03:43 +0000464 MachineInstr *MI, MachineBasicBlock *MBB,
465 unsigned Dist) {
Evan Chengd498c8f2009-01-25 03:53:59 +0000466 // Determine if it's profitable to commute this two address instruction. In
467 // general, we want no uses between this instruction and the definition of
468 // the two-address register.
469 // e.g.
470 // %reg1028<def> = EXTRACT_SUBREG %reg1027<kill>, 1
471 // %reg1029<def> = MOV8rr %reg1028
472 // %reg1029<def> = SHR8ri %reg1029, 7, %EFLAGS<imp-def,dead>
473 // insert => %reg1030<def> = MOV8rr %reg1028
474 // %reg1030<def> = ADD8rr %reg1028<kill>, %reg1029<kill>, %EFLAGS<imp-def,dead>
475 // In this case, it might not be possible to coalesce the second MOV8rr
476 // instruction if the first one is coalesced. So it would be profitable to
477 // commute it:
478 // %reg1028<def> = EXTRACT_SUBREG %reg1027<kill>, 1
479 // %reg1029<def> = MOV8rr %reg1028
480 // %reg1029<def> = SHR8ri %reg1029, 7, %EFLAGS<imp-def,dead>
481 // insert => %reg1030<def> = MOV8rr %reg1029
482 // %reg1030<def> = ADD8rr %reg1029<kill>, %reg1028<kill>, %EFLAGS<imp-def,dead>
483
484 if (!MI->killsRegister(regC))
485 return false;
486
487 // Ok, we have something like:
488 // %reg1030<def> = ADD8rr %reg1028<kill>, %reg1029<kill>, %EFLAGS<imp-def,dead>
489 // let's see if it's worth commuting it.
490
Evan Cheng870b8072009-03-01 02:03:43 +0000491 // Look for situations like this:
492 // %reg1024<def> = MOV r1
493 // %reg1025<def> = MOV r0
494 // %reg1026<def> = ADD %reg1024, %reg1025
495 // r0 = MOV %reg1026
496 // Commute the ADD to hopefully eliminate an otherwise unavoidable copy.
497 unsigned FromRegB = getMappedReg(regB, SrcRegMap);
498 unsigned FromRegC = getMappedReg(regC, SrcRegMap);
499 unsigned ToRegB = getMappedReg(regB, DstRegMap);
500 unsigned ToRegC = getMappedReg(regC, DstRegMap);
501 if (!regsAreCompatible(FromRegB, ToRegB, TRI) &&
502 (regsAreCompatible(FromRegB, ToRegC, TRI) ||
503 regsAreCompatible(FromRegC, ToRegB, TRI)))
504 return true;
505
Evan Chengd498c8f2009-01-25 03:53:59 +0000506 // If there is a use of regC between its last def (could be livein) and this
507 // instruction, then bail.
508 unsigned LastDefC = 0;
Evan Cheng870b8072009-03-01 02:03:43 +0000509 if (!NoUseAfterLastDef(regC, MBB, Dist, LastDefC))
Evan Chengd498c8f2009-01-25 03:53:59 +0000510 return false;
511
512 // If there is a use of regB between its last def (could be livein) and this
513 // instruction, then go ahead and make this transformation.
514 unsigned LastDefB = 0;
Evan Cheng870b8072009-03-01 02:03:43 +0000515 if (!NoUseAfterLastDef(regB, MBB, Dist, LastDefB))
Evan Chengd498c8f2009-01-25 03:53:59 +0000516 return true;
517
518 // Since there are no intervening uses for both registers, then commute
519 // if the def of regC is closer. Its live interval is shorter.
520 return LastDefB && LastDefC && LastDefC > LastDefB;
521}
522
Evan Cheng81913712009-01-23 23:27:33 +0000523/// CommuteInstruction - Commute a two-address instruction and update the basic
524/// block, distance map, and live variables if needed. Return true if it is
525/// successful.
526bool
527TwoAddressInstructionPass::CommuteInstruction(MachineBasicBlock::iterator &mi,
Evan Cheng870b8072009-03-01 02:03:43 +0000528 MachineFunction::iterator &mbbi,
529 unsigned RegB, unsigned RegC, unsigned Dist) {
Evan Cheng81913712009-01-23 23:27:33 +0000530 MachineInstr *MI = mi;
531 DOUT << "2addr: COMMUTING : " << *MI;
532 MachineInstr *NewMI = TII->commuteInstruction(MI);
533
534 if (NewMI == 0) {
535 DOUT << "2addr: COMMUTING FAILED!\n";
536 return false;
537 }
538
539 DOUT << "2addr: COMMUTED TO: " << *NewMI;
540 // If the instruction changed to commute it, update livevar.
541 if (NewMI != MI) {
542 if (LV)
543 // Update live variables
544 LV->replaceKillInstruction(RegC, MI, NewMI);
545
546 mbbi->insert(mi, NewMI); // Insert the new inst
547 mbbi->erase(mi); // Nuke the old inst.
548 mi = NewMI;
549 DistanceMap.insert(std::make_pair(NewMI, Dist));
550 }
Evan Cheng870b8072009-03-01 02:03:43 +0000551
552 // Update source register map.
553 unsigned FromRegC = getMappedReg(RegC, SrcRegMap);
554 if (FromRegC) {
555 unsigned RegA = MI->getOperand(0).getReg();
556 SrcRegMap[RegA] = FromRegC;
557 }
558
Evan Cheng81913712009-01-23 23:27:33 +0000559 return true;
560}
561
Evan Chenge6f350d2009-03-30 21:34:07 +0000562/// isProfitableToConv3Addr - Return true if it is profitable to convert the
563/// given 2-address instruction to a 3-address one.
564bool
565TwoAddressInstructionPass::isProfitableToConv3Addr(unsigned RegA) {
566 // Look for situations like this:
567 // %reg1024<def> = MOV r1
568 // %reg1025<def> = MOV r0
569 // %reg1026<def> = ADD %reg1024, %reg1025
570 // r2 = MOV %reg1026
571 // Turn ADD into a 3-address instruction to avoid a copy.
572 unsigned FromRegA = getMappedReg(RegA, SrcRegMap);
573 unsigned ToRegA = getMappedReg(RegA, DstRegMap);
574 return (FromRegA && ToRegA && !regsAreCompatible(FromRegA, ToRegA, TRI));
575}
576
577/// ConvertInstTo3Addr - Convert the specified two-address instruction into a
578/// three address one. Return true if this transformation was successful.
579bool
580TwoAddressInstructionPass::ConvertInstTo3Addr(MachineBasicBlock::iterator &mi,
581 MachineBasicBlock::iterator &nmi,
582 MachineFunction::iterator &mbbi,
583 unsigned RegB, unsigned Dist) {
584 MachineInstr *NewMI = TII->convertToThreeAddress(mbbi, mi, LV);
585 if (NewMI) {
586 DOUT << "2addr: CONVERTING 2-ADDR: " << *mi;
587 DOUT << "2addr: TO 3-ADDR: " << *NewMI;
588 bool Sunk = false;
589
590 if (NewMI->findRegisterUseOperand(RegB, false, TRI))
591 // FIXME: Temporary workaround. If the new instruction doesn't
592 // uses RegB, convertToThreeAddress must have created more
593 // then one instruction.
594 Sunk = Sink3AddrInstruction(mbbi, NewMI, RegB, mi);
595
596 mbbi->erase(mi); // Nuke the old inst.
597
598 if (!Sunk) {
599 DistanceMap.insert(std::make_pair(NewMI, Dist));
600 mi = NewMI;
601 nmi = next(mi);
602 }
603 return true;
604 }
605
606 return false;
607}
608
Evan Cheng870b8072009-03-01 02:03:43 +0000609/// ProcessCopy - If the specified instruction is not yet processed, process it
610/// if it's a copy. For a copy instruction, we find the physical registers the
611/// source and destination registers might be mapped to. These are kept in
612/// point-to maps used to determine future optimizations. e.g.
613/// v1024 = mov r0
614/// v1025 = mov r1
615/// v1026 = add v1024, v1025
616/// r1 = mov r1026
617/// If 'add' is a two-address instruction, v1024, v1026 are both potentially
618/// coalesced to r0 (from the input side). v1025 is mapped to r1. v1026 is
619/// potentially joined with r1 on the output side. It's worthwhile to commute
620/// 'add' to eliminate a copy.
621void TwoAddressInstructionPass::ProcessCopy(MachineInstr *MI,
622 MachineBasicBlock *MBB,
623 SmallPtrSet<MachineInstr*, 8> &Processed) {
624 if (Processed.count(MI))
625 return;
626
627 bool IsSrcPhys, IsDstPhys;
628 unsigned SrcReg, DstReg;
629 if (!isCopyToReg(*MI, TII, SrcReg, DstReg, IsSrcPhys, IsDstPhys))
630 return;
631
632 if (IsDstPhys && !IsSrcPhys)
633 DstRegMap.insert(std::make_pair(SrcReg, DstReg));
634 else if (!IsDstPhys && IsSrcPhys) {
Evan Cheng3005ed62009-04-13 20:04:24 +0000635 bool isNew = SrcRegMap.insert(std::make_pair(DstReg, SrcReg)).second;
636 if (!isNew)
637 assert(SrcRegMap[DstReg] == SrcReg &&
638 "Can't map to two src physical registers!");
Evan Cheng870b8072009-03-01 02:03:43 +0000639
640 SmallVector<unsigned, 4> VirtRegPairs;
Evan Cheng87d696a2009-04-14 00:32:25 +0000641 bool IsCopy = false;
Evan Cheng870b8072009-03-01 02:03:43 +0000642 unsigned NewReg = 0;
643 while (MachineInstr *UseMI = findOnlyInterestingUse(DstReg, MBB, MRI,TII,
Evan Cheng87d696a2009-04-14 00:32:25 +0000644 IsCopy, NewReg, IsDstPhys)) {
645 if (IsCopy) {
646 if (!Processed.insert(UseMI))
Evan Cheng870b8072009-03-01 02:03:43 +0000647 break;
648 }
649
650 DenseMap<MachineInstr*, unsigned>::iterator DI = DistanceMap.find(UseMI);
651 if (DI != DistanceMap.end())
652 // Earlier in the same MBB.Reached via a back edge.
653 break;
654
655 if (IsDstPhys) {
656 VirtRegPairs.push_back(NewReg);
657 break;
658 }
659 bool isNew = SrcRegMap.insert(std::make_pair(NewReg, DstReg)).second;
Evan Cheng3005ed62009-04-13 20:04:24 +0000660 if (!isNew)
Evan Cheng87d696a2009-04-14 00:32:25 +0000661 assert(SrcRegMap[NewReg] == DstReg &&
662 "Can't map to two src physical registers!");
Evan Cheng870b8072009-03-01 02:03:43 +0000663 VirtRegPairs.push_back(NewReg);
664 DstReg = NewReg;
665 }
666
667 if (!VirtRegPairs.empty()) {
668 unsigned ToReg = VirtRegPairs.back();
669 VirtRegPairs.pop_back();
670 while (!VirtRegPairs.empty()) {
671 unsigned FromReg = VirtRegPairs.back();
672 VirtRegPairs.pop_back();
673 bool isNew = DstRegMap.insert(std::make_pair(FromReg, ToReg)).second;
Evan Cheng3005ed62009-04-13 20:04:24 +0000674 if (!isNew)
675 assert(DstRegMap[FromReg] == ToReg &&
676 "Can't map to two dst physical registers!");
Evan Cheng870b8072009-03-01 02:03:43 +0000677 ToReg = FromReg;
678 }
679 }
680 }
681
682 Processed.insert(MI);
683}
684
Evan Cheng28c7ce32009-02-21 03:14:25 +0000685/// isSafeToDelete - If the specified instruction does not produce any side
686/// effects and all of its defs are dead, then it's safe to delete.
687static bool isSafeToDelete(MachineInstr *MI, const TargetInstrInfo *TII) {
688 const TargetInstrDesc &TID = MI->getDesc();
689 if (TID.mayStore() || TID.isCall())
690 return false;
691 if (TID.isTerminator() || TID.hasUnmodeledSideEffects())
692 return false;
693
694 for (unsigned i = 0, e = MI->getNumOperands(); i != e; ++i) {
695 MachineOperand &MO = MI->getOperand(i);
696 if (!MO.isReg() || !MO.isDef())
697 continue;
698 if (!MO.isDead())
699 return false;
700 }
701
702 return true;
703}
704
Bill Wendling637980e2008-05-10 00:12:52 +0000705/// runOnMachineFunction - Reduce two-address instructions to two operands.
Alkis Evlogimenos71499de2003-12-18 13:06:04 +0000706///
Chris Lattner163c1e72004-01-31 21:14:04 +0000707bool TwoAddressInstructionPass::runOnMachineFunction(MachineFunction &MF) {
Bill Wendlinga09362e2006-11-28 22:48:48 +0000708 DOUT << "Machine Function\n";
Misha Brukman75fa4e42004-07-22 15:26:23 +0000709 const TargetMachine &TM = MF.getTarget();
Evan Cheng875357d2008-03-13 06:37:55 +0000710 MRI = &MF.getRegInfo();
711 TII = TM.getInstrInfo();
712 TRI = TM.getRegisterInfo();
Duncan Sands1465d612009-01-28 13:14:17 +0000713 LV = getAnalysisIfAvailable<LiveVariables>();
Alkis Evlogimenos71499de2003-12-18 13:06:04 +0000714
Misha Brukman75fa4e42004-07-22 15:26:23 +0000715 bool MadeChange = false;
Alkis Evlogimenos71499de2003-12-18 13:06:04 +0000716
Bill Wendlinga09362e2006-11-28 22:48:48 +0000717 DOUT << "********** REWRITING TWO-ADDR INSTRS **********\n";
718 DOUT << "********** Function: " << MF.getFunction()->getName() << '\n';
Alkis Evlogimenos3a9986f2004-02-18 00:35:06 +0000719
Evan Cheng7543e582008-06-18 07:49:14 +0000720 // ReMatRegs - Keep track of the registers whose def's are remat'ed.
721 BitVector ReMatRegs;
722 ReMatRegs.resize(MRI->getLastVirtReg()+1);
723
Evan Cheng870b8072009-03-01 02:03:43 +0000724 SmallPtrSet<MachineInstr*, 8> Processed;
Misha Brukman75fa4e42004-07-22 15:26:23 +0000725 for (MachineFunction::iterator mbbi = MF.begin(), mbbe = MF.end();
726 mbbi != mbbe; ++mbbi) {
Evan Cheng7543e582008-06-18 07:49:14 +0000727 unsigned Dist = 0;
728 DistanceMap.clear();
Evan Cheng870b8072009-03-01 02:03:43 +0000729 SrcRegMap.clear();
730 DstRegMap.clear();
731 Processed.clear();
Misha Brukman75fa4e42004-07-22 15:26:23 +0000732 for (MachineBasicBlock::iterator mi = mbbi->begin(), me = mbbi->end();
Evan Cheng7a963fa2008-03-27 01:27:25 +0000733 mi != me; ) {
734 MachineBasicBlock::iterator nmi = next(mi);
Chris Lattner749c6f62008-01-07 07:27:27 +0000735 const TargetInstrDesc &TID = mi->getDesc();
Evan Cheng360c2dd2006-11-01 23:06:55 +0000736 bool FirstTied = true;
Bill Wendling637980e2008-05-10 00:12:52 +0000737
Evan Cheng7543e582008-06-18 07:49:14 +0000738 DistanceMap.insert(std::make_pair(mi, ++Dist));
Evan Cheng870b8072009-03-01 02:03:43 +0000739
740 ProcessCopy(&*mi, &*mbbi, Processed);
741
Evan Chengfb112882009-03-23 08:01:15 +0000742 unsigned NumOps = (mi->getOpcode() == TargetInstrInfo::INLINEASM)
743 ? mi->getNumOperands() : TID.getNumOperands();
744 for (unsigned si = 0; si < NumOps; ++si) {
Evan Chenga24752f2009-03-19 20:30:06 +0000745 unsigned ti = 0;
746 if (!mi->isRegTiedToDefOperand(si, &ti))
Evan Cheng360c2dd2006-11-01 23:06:55 +0000747 continue;
Alkis Evlogimenos71499de2003-12-18 13:06:04 +0000748
Evan Cheng360c2dd2006-11-01 23:06:55 +0000749 if (FirstTied) {
750 ++NumTwoAddressInstrs;
Bill Wendlingbcd24982006-12-07 20:28:15 +0000751 DOUT << '\t'; DEBUG(mi->print(*cerr.stream(), &TM));
Evan Cheng360c2dd2006-11-01 23:06:55 +0000752 }
Bill Wendling637980e2008-05-10 00:12:52 +0000753
Evan Cheng360c2dd2006-11-01 23:06:55 +0000754 FirstTied = false;
Alkis Evlogimenos71499de2003-12-18 13:06:04 +0000755
Dan Gohmand735b802008-10-03 15:45:36 +0000756 assert(mi->getOperand(si).isReg() && mi->getOperand(si).getReg() &&
Evan Cheng360c2dd2006-11-01 23:06:55 +0000757 mi->getOperand(si).isUse() && "two address instruction invalid");
Alkis Evlogimenos71499de2003-12-18 13:06:04 +0000758
Bill Wendling637980e2008-05-10 00:12:52 +0000759 // If the two operands are the same we just remove the use
Evan Cheng360c2dd2006-11-01 23:06:55 +0000760 // and mark the def as def&use, otherwise we have to insert a copy.
761 if (mi->getOperand(ti).getReg() != mi->getOperand(si).getReg()) {
Bill Wendling637980e2008-05-10 00:12:52 +0000762 // Rewrite:
Evan Cheng360c2dd2006-11-01 23:06:55 +0000763 // a = b op c
764 // to:
765 // a = b
766 // a = a op c
767 unsigned regA = mi->getOperand(ti).getReg();
768 unsigned regB = mi->getOperand(si).getReg();
769
Evan Chengfb112882009-03-23 08:01:15 +0000770 assert(TargetRegisterInfo::isVirtualRegister(regB) &&
Evan Cheng360c2dd2006-11-01 23:06:55 +0000771 "cannot update physical register live information");
Chris Lattner6b507672004-01-31 21:21:43 +0000772
Chris Lattner1e313632004-07-21 23:17:57 +0000773#ifndef NDEBUG
Evan Cheng360c2dd2006-11-01 23:06:55 +0000774 // First, verify that we don't have a use of a in the instruction (a =
775 // b + a for example) because our transformation will not work. This
776 // should never occur because we are in SSA form.
777 for (unsigned i = 0; i != mi->getNumOperands(); ++i)
Evan Chenga24752f2009-03-19 20:30:06 +0000778 assert(i == ti ||
Dan Gohmand735b802008-10-03 15:45:36 +0000779 !mi->getOperand(i).isReg() ||
Evan Cheng360c2dd2006-11-01 23:06:55 +0000780 mi->getOperand(i).getReg() != regA);
Chris Lattner1e313632004-07-21 23:17:57 +0000781#endif
Alkis Evlogimenos14be6402004-02-04 22:17:40 +0000782
Evan Cheng360c2dd2006-11-01 23:06:55 +0000783 // If this instruction is not the killing user of B, see if we can
784 // rearrange the code to make it so. Making it the killing user will
785 // allow us to coalesce A and B together, eliminating the copy we are
786 // about to insert.
Dan Gohman97121ba2009-04-08 00:15:30 +0000787 if (!isKilled(*mi, regB, MRI, TII)) {
Evan Cheng28c7ce32009-02-21 03:14:25 +0000788 // If regA is dead and the instruction can be deleted, just delete
789 // it so it doesn't clobber regB.
790 if (mi->getOperand(ti).isDead() && isSafeToDelete(mi, TII)) {
791 mbbi->erase(mi); // Nuke the old inst.
792 mi = nmi;
793 ++NumDeletes;
794 break; // Done with this instruction.
795 }
796
Evan Cheng360c2dd2006-11-01 23:06:55 +0000797 // If this instruction is commutative, check to see if C dies. If
798 // so, swap the B and C operands. This makes the live ranges of A
799 // and C joinable.
800 // FIXME: This code also works for A := B op C instructions.
Chris Lattner749c6f62008-01-07 07:27:27 +0000801 if (TID.isCommutable() && mi->getNumOperands() >= 3) {
Dan Gohmand735b802008-10-03 15:45:36 +0000802 assert(mi->getOperand(3-si).isReg() &&
Evan Cheng360c2dd2006-11-01 23:06:55 +0000803 "Not a proper commutative instruction!");
804 unsigned regC = mi->getOperand(3-si).getReg();
Dan Gohman97121ba2009-04-08 00:15:30 +0000805 if (isKilled(*mi, regC, MRI, TII)) {
Evan Cheng870b8072009-03-01 02:03:43 +0000806 if (CommuteInstruction(mi, mbbi, regB, regC, Dist)) {
Evan Cheng360c2dd2006-11-01 23:06:55 +0000807 ++NumCommuted;
808 regB = regC;
809 goto InstructionRearranged;
Misha Brukmanedf128a2005-04-21 22:36:52 +0000810 }
Chris Lattnerc71d6942005-01-19 07:08:42 +0000811 }
Chris Lattnercfa0f2e2005-01-02 02:34:12 +0000812 }
Evan Cheng360c2dd2006-11-01 23:06:55 +0000813
814 // If this instruction is potentially convertible to a true
815 // three-address instruction,
Chris Lattner749c6f62008-01-07 07:27:27 +0000816 if (TID.isConvertibleTo3Addr()) {
Evan Cheng360c2dd2006-11-01 23:06:55 +0000817 // FIXME: This assumes there are no more operands which are tied
818 // to another register.
819#ifndef NDEBUG
Bill Wendling637980e2008-05-10 00:12:52 +0000820 for (unsigned i = si + 1, e = TID.getNumOperands(); i < e; ++i)
Chris Lattner749c6f62008-01-07 07:27:27 +0000821 assert(TID.getOperandConstraint(i, TOI::TIED_TO) == -1);
Evan Cheng360c2dd2006-11-01 23:06:55 +0000822#endif
823
Evan Chenge6f350d2009-03-30 21:34:07 +0000824 if (ConvertInstTo3Addr(mi, nmi, mbbi, regB, Dist)) {
Evan Cheng360c2dd2006-11-01 23:06:55 +0000825 ++NumConvertedTo3Addr;
Bill Wendling637980e2008-05-10 00:12:52 +0000826 break; // Done with this instruction.
Evan Cheng360c2dd2006-11-01 23:06:55 +0000827 }
Evan Chengb9d5e7c2007-10-20 04:01:47 +0000828 }
Chris Lattnercfa0f2e2005-01-02 02:34:12 +0000829 }
Evan Cheng360c2dd2006-11-01 23:06:55 +0000830
Evan Chengd498c8f2009-01-25 03:53:59 +0000831 // If it's profitable to commute the instruction, do so.
832 if (TID.isCommutable() && mi->getNumOperands() >= 3) {
833 unsigned regC = mi->getOperand(3-si).getReg();
Evan Cheng870b8072009-03-01 02:03:43 +0000834 if (isProfitableToCommute(regB, regC, mi, mbbi, Dist))
835 if (CommuteInstruction(mi, mbbi, regB, regC, Dist)) {
Evan Chengd498c8f2009-01-25 03:53:59 +0000836 ++NumAggrCommuted;
837 ++NumCommuted;
838 regB = regC;
Evan Chenge6f350d2009-03-30 21:34:07 +0000839 goto InstructionRearranged;
Evan Chengd498c8f2009-01-25 03:53:59 +0000840 }
841 }
842
Evan Chenge6f350d2009-03-30 21:34:07 +0000843 // If it's profitable to convert the 2-address instruction to a
844 // 3-address one, do so.
845 if (TID.isConvertibleTo3Addr() && isProfitableToConv3Addr(regA)) {
846 if (ConvertInstTo3Addr(mi, nmi, mbbi, regB, Dist)) {
847 ++NumConvertedTo3Addr;
848 break; // Done with this instruction.
849 }
850 }
851
Evan Cheng360c2dd2006-11-01 23:06:55 +0000852 InstructionRearranged:
Evan Chengfb112882009-03-23 08:01:15 +0000853 const TargetRegisterClass* rc = MRI->getRegClass(regB);
Evan Cheng7543e582008-06-18 07:49:14 +0000854 MachineInstr *DefMI = MRI->getVRegDef(regB);
855 // If it's safe and profitable, remat the definition instead of
856 // copying it.
Evan Cheng601ca4b2008-06-25 01:16:38 +0000857 if (DefMI &&
Evan Cheng8763c1c2008-08-27 20:58:54 +0000858 DefMI->getDesc().isAsCheapAsAMove() &&
Evan Chengdf3b9932008-08-27 20:33:50 +0000859 DefMI->isSafeToReMat(TII, regB) &&
Evan Cheng870b8072009-03-01 02:03:43 +0000860 isProfitableToReMat(regB, rc, mi, DefMI, mbbi, Dist)){
Evan Cheng7543e582008-06-18 07:49:14 +0000861 DEBUG(cerr << "2addr: REMATTING : " << *DefMI << "\n");
862 TII->reMaterialize(*mbbi, mi, regA, DefMI);
863 ReMatRegs.set(regB);
864 ++NumReMats;
Bill Wendling48f7f232008-05-26 05:18:34 +0000865 } else {
Dan Gohman6ed0e202009-04-13 15:16:56 +0000866 bool Emitted = TII->copyRegToReg(*mbbi, mi, regA, regB, rc, rc);
867 assert(Emitted && "Unable to issue a copy instruction!\n");
Bill Wendling48f7f232008-05-26 05:18:34 +0000868 }
Evan Cheng360c2dd2006-11-01 23:06:55 +0000869
Evan Chengd498c8f2009-01-25 03:53:59 +0000870 MachineBasicBlock::iterator prevMI = prior(mi);
871 // Update DistanceMap.
872 DistanceMap.insert(std::make_pair(prevMI, Dist));
873 DistanceMap[mi] = ++Dist;
Evan Cheng360c2dd2006-11-01 23:06:55 +0000874
Bill Wendling637980e2008-05-10 00:12:52 +0000875 // Update live variables for regB.
Owen Anderson802af112008-07-02 21:28:58 +0000876 if (LV) {
877 LiveVariables::VarInfo& varInfoB = LV->getVarInfo(regB);
Bill Wendling637980e2008-05-10 00:12:52 +0000878
Owen Anderson802af112008-07-02 21:28:58 +0000879 // regB is used in this BB.
880 varInfoB.UsedBlocks[mbbi->getNumber()] = true;
Bill Wendling637980e2008-05-10 00:12:52 +0000881
Evan Cheng9f1c8312008-07-03 09:09:37 +0000882 if (LV->removeVirtualRegisterKilled(regB, mi))
Evan Chengd498c8f2009-01-25 03:53:59 +0000883 LV->addVirtualRegisterKilled(regB, prevMI);
Evan Cheng360c2dd2006-11-01 23:06:55 +0000884
Evan Cheng9f1c8312008-07-03 09:09:37 +0000885 if (LV->removeVirtualRegisterDead(regB, mi))
Evan Chengd498c8f2009-01-25 03:53:59 +0000886 LV->addVirtualRegisterDead(regB, prevMI);
Owen Anderson802af112008-07-02 21:28:58 +0000887 }
Dan Gohman2d9716f2008-11-12 17:15:19 +0000888
Evan Chengd498c8f2009-01-25 03:53:59 +0000889 DOUT << "\t\tprepend:\t"; DEBUG(prevMI->print(*cerr.stream(), &TM));
Owen Anderson802af112008-07-02 21:28:58 +0000890
Bill Wendling637980e2008-05-10 00:12:52 +0000891 // Replace all occurences of regB with regA.
Evan Cheng360c2dd2006-11-01 23:06:55 +0000892 for (unsigned i = 0, e = mi->getNumOperands(); i != e; ++i) {
Dan Gohmand735b802008-10-03 15:45:36 +0000893 if (mi->getOperand(i).isReg() &&
Evan Cheng360c2dd2006-11-01 23:06:55 +0000894 mi->getOperand(i).getReg() == regB)
895 mi->getOperand(i).setReg(regA);
896 }
Chris Lattnercfa0f2e2005-01-02 02:34:12 +0000897 }
Alkis Evlogimenos14be6402004-02-04 22:17:40 +0000898
Evan Cheng360c2dd2006-11-01 23:06:55 +0000899 assert(mi->getOperand(ti).isDef() && mi->getOperand(si).isUse());
900 mi->getOperand(ti).setReg(mi->getOperand(si).getReg());
901 MadeChange = true;
Alkis Evlogimenos14be6402004-02-04 22:17:40 +0000902
Bill Wendlingbcd24982006-12-07 20:28:15 +0000903 DOUT << "\t\trewrite to:\t"; DEBUG(mi->print(*cerr.stream(), &TM));
Misha Brukman75fa4e42004-07-22 15:26:23 +0000904 }
Bill Wendling637980e2008-05-10 00:12:52 +0000905
Evan Cheng7a963fa2008-03-27 01:27:25 +0000906 mi = nmi;
Misha Brukman75fa4e42004-07-22 15:26:23 +0000907 }
908 }
909
Evan Cheng601ca4b2008-06-25 01:16:38 +0000910 // Some remat'ed instructions are dead.
911 int VReg = ReMatRegs.find_first();
912 while (VReg != -1) {
913 if (MRI->use_empty(VReg)) {
914 MachineInstr *DefMI = MRI->getVRegDef(VReg);
915 DefMI->eraseFromParent();
Bill Wendlinga16157a2008-05-26 05:49:49 +0000916 }
Evan Cheng601ca4b2008-06-25 01:16:38 +0000917 VReg = ReMatRegs.find_next(VReg);
Bill Wendling48f7f232008-05-26 05:18:34 +0000918 }
919
Misha Brukman75fa4e42004-07-22 15:26:23 +0000920 return MadeChange;
Alkis Evlogimenos71499de2003-12-18 13:06:04 +0000921}