[WinEH] Delete the old landingpad implementation of Windows EH
[oota-llvm.git] / lib / CodeGen / AsmPrinter / WinException.cpp
1 //===-- CodeGen/AsmPrinter/WinException.cpp - Dwarf Exception Impl ------===//
2 //
3 //                     The LLVM Compiler Infrastructure
4 //
5 // This file is distributed under the University of Illinois Open Source
6 // License. See LICENSE.TXT for details.
7 //
8 //===----------------------------------------------------------------------===//
9 //
10 // This file contains support for writing Win64 exception info into asm files.
11 //
12 //===----------------------------------------------------------------------===//
13
14 #include "WinException.h"
15 #include "llvm/ADT/SmallString.h"
16 #include "llvm/ADT/StringExtras.h"
17 #include "llvm/ADT/Twine.h"
18 #include "llvm/CodeGen/AsmPrinter.h"
19 #include "llvm/CodeGen/MachineFrameInfo.h"
20 #include "llvm/CodeGen/MachineFunction.h"
21 #include "llvm/CodeGen/MachineModuleInfo.h"
22 #include "llvm/CodeGen/WinEHFuncInfo.h"
23 #include "llvm/IR/DataLayout.h"
24 #include "llvm/IR/Mangler.h"
25 #include "llvm/IR/Module.h"
26 #include "llvm/MC/MCAsmInfo.h"
27 #include "llvm/MC/MCContext.h"
28 #include "llvm/MC/MCExpr.h"
29 #include "llvm/MC/MCSection.h"
30 #include "llvm/MC/MCStreamer.h"
31 #include "llvm/MC/MCSymbol.h"
32 #include "llvm/MC/MCWin64EH.h"
33 #include "llvm/Support/COFF.h"
34 #include "llvm/Support/Dwarf.h"
35 #include "llvm/Support/ErrorHandling.h"
36 #include "llvm/Support/FormattedStream.h"
37 #include "llvm/Target/TargetFrameLowering.h"
38 #include "llvm/Target/TargetLoweringObjectFile.h"
39 #include "llvm/Target/TargetOptions.h"
40 #include "llvm/Target/TargetRegisterInfo.h"
41 #include "llvm/Target/TargetSubtargetInfo.h"
42 using namespace llvm;
43
44 WinException::WinException(AsmPrinter *A) : EHStreamer(A) {
45   // MSVC's EH tables are always composed of 32-bit words.  All known 64-bit
46   // platforms use an imagerel32 relocation to refer to symbols.
47   useImageRel32 = (A->getDataLayout().getPointerSizeInBits() == 64);
48 }
49
50 WinException::~WinException() {}
51
52 /// endModule - Emit all exception information that should come after the
53 /// content.
54 void WinException::endModule() {
55   auto &OS = *Asm->OutStreamer;
56   const Module *M = MMI->getModule();
57   for (const Function &F : *M)
58     if (F.hasFnAttribute("safeseh"))
59       OS.EmitCOFFSafeSEH(Asm->getSymbol(&F));
60 }
61
62 void WinException::beginFunction(const MachineFunction *MF) {
63   shouldEmitMoves = shouldEmitPersonality = shouldEmitLSDA = false;
64
65   // If any landing pads survive, we need an EH table.
66   bool hasLandingPads = !MMI->getLandingPads().empty();
67   bool hasEHFunclets = MMI->hasEHFunclets();
68
69   const Function *F = MF->getFunction();
70   const Function *ParentF = MMI->getWinEHParent(F);
71
72   shouldEmitMoves = Asm->needsSEHMoves();
73
74   const TargetLoweringObjectFile &TLOF = Asm->getObjFileLowering();
75   unsigned PerEncoding = TLOF.getPersonalityEncoding();
76   const Function *Per = nullptr;
77   if (F->hasPersonalityFn())
78     Per = dyn_cast<Function>(F->getPersonalityFn()->stripPointerCasts());
79
80   bool forceEmitPersonality =
81     F->hasPersonalityFn() && !isNoOpWithoutInvoke(classifyEHPersonality(Per)) &&
82     F->needsUnwindTableEntry();
83
84   shouldEmitPersonality =
85       forceEmitPersonality || ((hasLandingPads || hasEHFunclets) &&
86                                PerEncoding != dwarf::DW_EH_PE_omit && Per);
87
88   unsigned LSDAEncoding = TLOF.getLSDAEncoding();
89   shouldEmitLSDA = shouldEmitPersonality &&
90     LSDAEncoding != dwarf::DW_EH_PE_omit;
91
92   // If we're not using CFI, we don't want the CFI or the personality, but we
93   // might want EH tables if we had EH pads.
94   // FIXME: If WinEHPrepare outlined something, we should emit the LSDA. Remove
95   // this once WinEHPrepare stops doing that.
96   if (!Asm->MAI->usesWindowsCFI()) {
97     shouldEmitLSDA =
98         hasEHFunclets || (F->hasFnAttribute("wineh-parent") && F == ParentF);
99     shouldEmitPersonality = false;
100     return;
101   }
102
103   beginFunclet(MF->front(), Asm->CurrentFnSym);
104 }
105
106 /// endFunction - Gather and emit post-function exception information.
107 ///
108 void WinException::endFunction(const MachineFunction *MF) {
109   if (!shouldEmitPersonality && !shouldEmitMoves && !shouldEmitLSDA)
110     return;
111
112   const Function *F = MF->getFunction();
113   EHPersonality Per = EHPersonality::Unknown;
114   if (F->hasPersonalityFn())
115     Per = classifyEHPersonality(F->getPersonalityFn());
116
117   // Get rid of any dead landing pads if we're not using funclets. In funclet
118   // schemes, the landing pad is not actually reachable. It only exists so
119   // that we can emit the right table data.
120   if (!isFuncletEHPersonality(Per))
121     MMI->TidyLandingPads();
122
123   endFunclet();
124
125   // endFunclet will emit the necessary .xdata tables for x64 SEH.
126   if (Per == EHPersonality::MSVC_Win64SEH && MMI->hasEHFunclets())
127     return;
128
129   if (shouldEmitPersonality || shouldEmitLSDA) {
130     Asm->OutStreamer->PushSection();
131
132     // Just switch sections to the right xdata section. This use of CurrentFnSym
133     // assumes that we only emit the LSDA when ending the parent function.
134     MCSection *XData = WinEH::UnwindEmitter::getXDataSection(Asm->CurrentFnSym,
135                                                              Asm->OutContext);
136     Asm->OutStreamer->SwitchSection(XData);
137
138     // Emit the tables appropriate to the personality function in use. If we
139     // don't recognize the personality, assume it uses an Itanium-style LSDA.
140     if (Per == EHPersonality::MSVC_Win64SEH)
141       emitCSpecificHandlerTable(MF);
142     else if (Per == EHPersonality::MSVC_X86SEH)
143       emitExceptHandlerTable(MF);
144     else if (Per == EHPersonality::MSVC_CXX)
145       emitCXXFrameHandler3Table(MF);
146     else
147       emitExceptionTable();
148
149     Asm->OutStreamer->PopSection();
150   }
151 }
152
153 /// Retreive the MCSymbol for a GlobalValue or MachineBasicBlock. GlobalValues
154 /// are used in the old WinEH scheme, and they will be removed eventually.
155 static MCSymbol *getMCSymbolForMBBOrGV(AsmPrinter *Asm, ValueOrMBB Handler) {
156   if (!Handler)
157     return nullptr;
158   if (Handler.is<const MachineBasicBlock *>()) {
159     auto *MBB = Handler.get<const MachineBasicBlock *>();
160     assert(MBB->isEHFuncletEntry());
161
162     // Give catches and cleanups a name based off of their parent function and
163     // their funclet entry block's number.
164     const MachineFunction *MF = MBB->getParent();
165     const Function *F = MF->getFunction();
166     StringRef FuncLinkageName = GlobalValue::getRealLinkageName(F->getName());
167     MCContext &Ctx = MF->getContext();
168     StringRef HandlerPrefix = MBB->isCleanupFuncletEntry() ? "dtor" : "catch";
169     return Ctx.getOrCreateSymbol("?" + HandlerPrefix + "$" +
170                                  Twine(MBB->getNumber()) + "@?0?" +
171                                  FuncLinkageName + "@4HA");
172   }
173   return Asm->getSymbol(cast<GlobalValue>(Handler.get<const Value *>()));
174 }
175
176 void WinException::beginFunclet(const MachineBasicBlock &MBB,
177                                 MCSymbol *Sym) {
178   CurrentFuncletEntry = &MBB;
179
180   const Function *F = Asm->MF->getFunction();
181   // If a symbol was not provided for the funclet, invent one.
182   if (!Sym) {
183     Sym = getMCSymbolForMBBOrGV(Asm, &MBB);
184
185     // Describe our funclet symbol as a function with internal linkage.
186     Asm->OutStreamer->BeginCOFFSymbolDef(Sym);
187     Asm->OutStreamer->EmitCOFFSymbolStorageClass(COFF::IMAGE_SYM_CLASS_STATIC);
188     Asm->OutStreamer->EmitCOFFSymbolType(COFF::IMAGE_SYM_DTYPE_FUNCTION
189                                          << COFF::SCT_COMPLEX_TYPE_SHIFT);
190     Asm->OutStreamer->EndCOFFSymbolDef();
191
192     // We want our funclet's entry point to be aligned such that no nops will be
193     // present after the label.
194     Asm->EmitAlignment(std::max(Asm->MF->getAlignment(), MBB.getAlignment()),
195                        F);
196
197     // Now that we've emitted the alignment directive, point at our funclet.
198     Asm->OutStreamer->EmitLabel(Sym);
199   }
200
201   // Mark 'Sym' as starting our funclet.
202   if (shouldEmitMoves || shouldEmitPersonality)
203     Asm->OutStreamer->EmitWinCFIStartProc(Sym);
204
205   if (shouldEmitPersonality) {
206     const TargetLoweringObjectFile &TLOF = Asm->getObjFileLowering();
207     const Function *PerFn = nullptr;
208
209     // Determine which personality routine we are using for this funclet.
210     if (F->hasPersonalityFn())
211       PerFn = dyn_cast<Function>(F->getPersonalityFn()->stripPointerCasts());
212     const MCSymbol *PersHandlerSym =
213         TLOF.getCFIPersonalitySymbol(PerFn, *Asm->Mang, Asm->TM, MMI);
214
215     // Classify the personality routine so that we may reason about it.
216     EHPersonality Per = EHPersonality::Unknown;
217     if (F->hasPersonalityFn())
218       Per = classifyEHPersonality(F->getPersonalityFn());
219
220     // Do not emit a .seh_handler directive if it is a C++ cleanup funclet.
221     if (Per != EHPersonality::MSVC_CXX ||
222         !CurrentFuncletEntry->isCleanupFuncletEntry())
223       Asm->OutStreamer->EmitWinEHHandler(PersHandlerSym, true, true);
224   }
225 }
226
227 void WinException::endFunclet() {
228   // No funclet to process?  Great, we have nothing to do.
229   if (!CurrentFuncletEntry)
230     return;
231
232   if (shouldEmitMoves || shouldEmitPersonality) {
233     const Function *F = Asm->MF->getFunction();
234     EHPersonality Per = EHPersonality::Unknown;
235     if (F->hasPersonalityFn())
236       Per = classifyEHPersonality(F->getPersonalityFn());
237
238     // The .seh_handlerdata directive implicitly switches section, push the
239     // current section so that we may return to it.
240     Asm->OutStreamer->PushSection();
241
242     // Emit an UNWIND_INFO struct describing the prologue.
243     Asm->OutStreamer->EmitWinEHHandlerData();
244
245     if (Per == EHPersonality::MSVC_CXX && shouldEmitPersonality &&
246         !CurrentFuncletEntry->isCleanupFuncletEntry()) {
247       // If this is a C++ catch funclet (or the parent function),
248       // emit a reference to the LSDA for the parent function.
249       StringRef FuncLinkageName = GlobalValue::getRealLinkageName(F->getName());
250       MCSymbol *FuncInfoXData = Asm->OutContext.getOrCreateSymbol(
251           Twine("$cppxdata$", FuncLinkageName));
252       Asm->OutStreamer->EmitValue(create32bitRef(FuncInfoXData), 4);
253     } else if (Per == EHPersonality::MSVC_Win64SEH && MMI->hasEHFunclets() &&
254                !CurrentFuncletEntry->isEHFuncletEntry()) {
255       // If this is the parent function in Win64 SEH, emit the LSDA immediately
256       // following .seh_handlerdata.
257       emitCSpecificHandlerTable(Asm->MF);
258     }
259
260     // Switch back to the previous section now that we are done writing to
261     // .xdata.
262     Asm->OutStreamer->PopSection();
263
264     // Emit a .seh_endproc directive to mark the end of the function.
265     Asm->OutStreamer->EmitWinCFIEndProc();
266   }
267
268   // Let's make sure we don't try to end the same funclet twice.
269   CurrentFuncletEntry = nullptr;
270 }
271
272 const MCExpr *WinException::create32bitRef(const MCSymbol *Value) {
273   if (!Value)
274     return MCConstantExpr::create(0, Asm->OutContext);
275   return MCSymbolRefExpr::create(Value, useImageRel32
276                                             ? MCSymbolRefExpr::VK_COFF_IMGREL32
277                                             : MCSymbolRefExpr::VK_None,
278                                  Asm->OutContext);
279 }
280
281 const MCExpr *WinException::create32bitRef(const Value *V) {
282   if (!V)
283     return MCConstantExpr::create(0, Asm->OutContext);
284   // FIXME: Delete the GlobalValue case once the new IR is fully functional.
285   if (const auto *GV = dyn_cast<GlobalValue>(V))
286     return create32bitRef(Asm->getSymbol(GV));
287   return create32bitRef(MMI->getAddrLabelSymbol(cast<BasicBlock>(V)));
288 }
289
290 const MCExpr *WinException::getLabelPlusOne(MCSymbol *Label) {
291   return MCBinaryExpr::createAdd(create32bitRef(Label),
292                                  MCConstantExpr::create(1, Asm->OutContext),
293                                  Asm->OutContext);
294 }
295
296 int WinException::getFrameIndexOffset(int FrameIndex) {
297   const TargetFrameLowering &TFI = *Asm->MF->getSubtarget().getFrameLowering();
298   unsigned UnusedReg;
299   if (Asm->MAI->usesWindowsCFI())
300     return TFI.getFrameIndexReferenceFromSP(*Asm->MF, FrameIndex, UnusedReg);
301   return TFI.getFrameIndexReference(*Asm->MF, FrameIndex, UnusedReg);
302 }
303
304 namespace {
305 /// Information describing an invoke range.
306 struct InvokeRange {
307   MCSymbol *BeginLabel = nullptr;
308   MCSymbol *EndLabel = nullptr;
309   int State = -1;
310
311   /// If we saw a potentially throwing call between this range and the last
312   /// range.
313   bool SawPotentiallyThrowing = false;
314 };
315
316 /// Iterator over the begin/end label pairs of invokes within a basic block.
317 class InvokeLabelIterator {
318 public:
319   InvokeLabelIterator(WinEHFuncInfo &EHInfo,
320                       MachineBasicBlock::const_iterator MBBI,
321                       MachineBasicBlock::const_iterator MBBIEnd)
322       : EHInfo(EHInfo), MBBI(MBBI), MBBIEnd(MBBIEnd) {
323     scan();
324   }
325
326   // Iterator methods.
327   bool operator==(const InvokeLabelIterator &o) const { return MBBI == o.MBBI; }
328   bool operator!=(const InvokeLabelIterator &o) const { return MBBI != o.MBBI; }
329   InvokeRange &operator*() { return CurRange; }
330   InvokeRange *operator->() { return &CurRange; }
331   InvokeLabelIterator &operator++() { return scan(); }
332
333 private:
334   // Scan forward to find the next invoke range, or hit the end iterator.
335   InvokeLabelIterator &scan();
336
337   WinEHFuncInfo &EHInfo;
338   MachineBasicBlock::const_iterator MBBI;
339   MachineBasicBlock::const_iterator MBBIEnd;
340   InvokeRange CurRange;
341 };
342 } // end anonymous namespace
343
344 /// Invoke label range iteration logic. Increment MBBI until we find the next
345 /// EH_LABEL pair, and then update MBBI to point after the end label.
346 InvokeLabelIterator &InvokeLabelIterator::scan() {
347   // Reset our state.
348   CurRange = InvokeRange{};
349
350   for (const MachineInstr &MI : make_range(MBBI, MBBIEnd)) {
351     // Remember if we had to cross a potentially throwing call instruction that
352     // must unwind to caller.
353     if (MI.isCall()) {
354       CurRange.SawPotentiallyThrowing |=
355           !EHStreamer::callToNoUnwindFunction(&MI);
356       continue;
357     }
358     // Find the next EH_LABEL instruction.
359     if (!MI.isEHLabel())
360       continue;
361
362     // If this is a begin label, break out with the state and end label.
363     // Otherwise this is probably a CFI EH_LABEL that we should continue past.
364     MCSymbol *Label = MI.getOperand(0).getMCSymbol();
365     auto StateAndEnd = EHInfo.InvokeToStateMap.find(Label);
366     if (StateAndEnd == EHInfo.InvokeToStateMap.end())
367       continue;
368     MBBI = MachineBasicBlock::const_iterator(&MI);
369     CurRange.BeginLabel = Label;
370     CurRange.EndLabel = StateAndEnd->second.second;
371     CurRange.State = StateAndEnd->second.first;
372     break;
373   }
374
375   // If we didn't find a begin label, we are done, return the end iterator.
376   if (!CurRange.BeginLabel) {
377     MBBI = MBBIEnd;
378     return *this;
379   }
380
381   // If this is a begin label, update MBBI to point past the end label.
382   for (; MBBI != MBBIEnd; ++MBBI)
383     if (MBBI->isEHLabel() &&
384         MBBI->getOperand(0).getMCSymbol() == CurRange.EndLabel)
385       break;
386   return *this;
387 }
388
389 /// Utility for making a range for all the invoke ranges.
390 static iterator_range<InvokeLabelIterator>
391 invoke_ranges(WinEHFuncInfo &EHInfo, const MachineBasicBlock &MBB) {
392   return make_range(InvokeLabelIterator(EHInfo, MBB.begin(), MBB.end()),
393                     InvokeLabelIterator(EHInfo, MBB.end(), MBB.end()));
394 }
395
396 /// Emit the language-specific data that __C_specific_handler expects.  This
397 /// handler lives in the x64 Microsoft C runtime and allows catching or cleaning
398 /// up after faults with __try, __except, and __finally.  The typeinfo values
399 /// are not really RTTI data, but pointers to filter functions that return an
400 /// integer (1, 0, or -1) indicating how to handle the exception. For __finally
401 /// blocks and other cleanups, the landing pad label is zero, and the filter
402 /// function is actually a cleanup handler with the same prototype.  A catch-all
403 /// entry is modeled with a null filter function field and a non-zero landing
404 /// pad label.
405 ///
406 /// Possible filter function return values:
407 ///   EXCEPTION_EXECUTE_HANDLER (1):
408 ///     Jump to the landing pad label after cleanups.
409 ///   EXCEPTION_CONTINUE_SEARCH (0):
410 ///     Continue searching this table or continue unwinding.
411 ///   EXCEPTION_CONTINUE_EXECUTION (-1):
412 ///     Resume execution at the trapping PC.
413 ///
414 /// Inferred table structure:
415 ///   struct Table {
416 ///     int NumEntries;
417 ///     struct Entry {
418 ///       imagerel32 LabelStart;
419 ///       imagerel32 LabelEnd;
420 ///       imagerel32 FilterOrFinally;  // One means catch-all.
421 ///       imagerel32 LabelLPad;        // Zero means __finally.
422 ///     } Entries[NumEntries];
423 ///   };
424 void WinException::emitCSpecificHandlerTable(const MachineFunction *MF) {
425   auto &OS = *Asm->OutStreamer;
426   MCContext &Ctx = Asm->OutContext;
427
428   WinEHFuncInfo &FuncInfo = MMI->getWinEHFuncInfo(MF->getFunction());
429
430   // Remember what state we were in the last time we found a begin try label.
431   // This allows us to coalesce many nearby invokes with the same state into
432   // one entry.
433   int LastEHState = -1;
434   MCSymbol *LastBeginLabel = nullptr;
435   MCSymbol *LastEndLabel = nullptr;
436
437   // Use the assembler to compute the number of table entries through label
438   // difference and division.
439   MCSymbol *TableBegin =
440       Ctx.createTempSymbol("lsda_begin", /*AlwaysAddSuffix=*/true);
441   MCSymbol *TableEnd =
442       Ctx.createTempSymbol("lsda_end", /*AlwaysAddSuffix=*/true);
443   const MCExpr *LabelDiff =
444       MCBinaryExpr::createSub(MCSymbolRefExpr::create(TableEnd, Ctx),
445                               MCSymbolRefExpr::create(TableBegin, Ctx), Ctx);
446   const MCExpr *EntrySize = MCConstantExpr::create(16, Ctx);
447   const MCExpr *EntryCount = MCBinaryExpr::createDiv(LabelDiff, EntrySize, Ctx);
448   OS.EmitValue(EntryCount, 4);
449
450   OS.EmitLabel(TableBegin);
451
452   // Iterate over all the invoke try ranges. Unlike MSVC, LLVM currently only
453   // models exceptions from invokes. LLVM also allows arbitrary reordering of
454   // the code, so our tables end up looking a bit different. Rather than
455   // trying to match MSVC's tables exactly, we emit a denormalized table.  For
456   // each range of invokes in the same state, we emit table entries for all
457   // the actions that would be taken in that state. This means our tables are
458   // slightly bigger, which is OK.
459   for (const auto &MBB : *MF) {
460     // Break out before we enter into a finally funclet.
461     // FIXME: We need to emit separate EH tables for cleanups.
462     if (MBB.isEHFuncletEntry() && &MBB != MF->begin())
463       break;
464
465     for (InvokeRange &I : invoke_ranges(FuncInfo, MBB)) {
466       // If this invoke is in the same state as the last invoke and there were
467       // no non-throwing calls between it, extend the range to include both
468       // and continue.
469       if (!I.SawPotentiallyThrowing && I.State == LastEHState) {
470         LastEndLabel = I.EndLabel;
471         continue;
472       }
473
474       // If this invoke ends a previous one, emit all the actions for this
475       // state.
476       if (LastEHState != -1)
477         emitSEHActionsForRange(FuncInfo, LastBeginLabel, LastEndLabel,
478                                LastEHState);
479
480       LastBeginLabel = I.BeginLabel;
481       LastEndLabel = I.EndLabel;
482       LastEHState = I.State;
483     }
484   }
485
486   // Hitting the end of the function causes us to emit the range for the
487   // previous invoke.
488   if (LastEndLabel)
489     emitSEHActionsForRange(FuncInfo, LastBeginLabel, LastEndLabel, LastEHState);
490
491   OS.EmitLabel(TableEnd);
492 }
493
494 void WinException::emitSEHActionsForRange(WinEHFuncInfo &FuncInfo,
495                                           MCSymbol *BeginLabel,
496                                           MCSymbol *EndLabel, int State) {
497   auto &OS = *Asm->OutStreamer;
498   MCContext &Ctx = Asm->OutContext;
499
500   assert(BeginLabel && EndLabel);
501   while (State != -1) {
502     SEHUnwindMapEntry &UME = FuncInfo.SEHUnwindMap[State];
503     const MCExpr *FilterOrFinally;
504     const MCExpr *ExceptOrNull;
505     auto *Handler = UME.Handler.get<MachineBasicBlock *>();
506     if (UME.IsFinally) {
507       FilterOrFinally = create32bitRef(getMCSymbolForMBBOrGV(Asm, Handler));
508       ExceptOrNull = MCConstantExpr::create(0, Ctx);
509     } else {
510       // For an except, the filter can be 1 (catch-all) or a function
511       // label.
512       FilterOrFinally = UME.Filter ? create32bitRef(UME.Filter)
513                                    : MCConstantExpr::create(1, Ctx);
514       ExceptOrNull = create32bitRef(Handler->getSymbol());
515     }
516
517     OS.EmitValue(getLabelPlusOne(BeginLabel), 4);
518     OS.EmitValue(getLabelPlusOne(EndLabel), 4);
519     OS.EmitValue(FilterOrFinally, 4);
520     OS.EmitValue(ExceptOrNull, 4);
521
522     assert(UME.ToState < State && "states should decrease");
523     State = UME.ToState;
524   }
525 }
526
527 void WinException::emitCXXFrameHandler3Table(const MachineFunction *MF) {
528   const Function *F = MF->getFunction();
529   auto &OS = *Asm->OutStreamer;
530   WinEHFuncInfo &FuncInfo = MMI->getWinEHFuncInfo(F);
531
532   StringRef FuncLinkageName = GlobalValue::getRealLinkageName(F->getName());
533
534   SmallVector<std::pair<const MCExpr *, int>, 4> IPToStateTable;
535   MCSymbol *FuncInfoXData = nullptr;
536   if (shouldEmitPersonality) {
537     // If we're 64-bit, emit a pointer to the C++ EH data, and build a map from
538     // IPs to state numbers.
539     FuncInfoXData =
540         Asm->OutContext.getOrCreateSymbol(Twine("$cppxdata$", FuncLinkageName));
541     computeIP2StateTable(MF, FuncInfo, IPToStateTable);
542   } else {
543     FuncInfoXData = Asm->OutContext.getOrCreateLSDASymbol(FuncLinkageName);
544     emitEHRegistrationOffsetLabel(FuncInfo, FuncLinkageName);
545   }
546
547   int UnwindHelpOffset = 0;
548   if (Asm->MAI->usesWindowsCFI())
549     UnwindHelpOffset = getFrameIndexOffset(FuncInfo.UnwindHelpFrameIdx);
550
551   MCSymbol *UnwindMapXData = nullptr;
552   MCSymbol *TryBlockMapXData = nullptr;
553   MCSymbol *IPToStateXData = nullptr;
554   if (!FuncInfo.CxxUnwindMap.empty())
555     UnwindMapXData = Asm->OutContext.getOrCreateSymbol(
556         Twine("$stateUnwindMap$", FuncLinkageName));
557   if (!FuncInfo.TryBlockMap.empty())
558     TryBlockMapXData =
559         Asm->OutContext.getOrCreateSymbol(Twine("$tryMap$", FuncLinkageName));
560   if (!IPToStateTable.empty())
561     IPToStateXData =
562         Asm->OutContext.getOrCreateSymbol(Twine("$ip2state$", FuncLinkageName));
563
564   // FuncInfo {
565   //   uint32_t           MagicNumber
566   //   int32_t            MaxState;
567   //   UnwindMapEntry    *UnwindMap;
568   //   uint32_t           NumTryBlocks;
569   //   TryBlockMapEntry  *TryBlockMap;
570   //   uint32_t           IPMapEntries; // always 0 for x86
571   //   IPToStateMapEntry *IPToStateMap; // always 0 for x86
572   //   uint32_t           UnwindHelp;   // non-x86 only
573   //   ESTypeList        *ESTypeList;
574   //   int32_t            EHFlags;
575   // }
576   // EHFlags & 1 -> Synchronous exceptions only, no async exceptions.
577   // EHFlags & 2 -> ???
578   // EHFlags & 4 -> The function is noexcept(true), unwinding can't continue.
579   OS.EmitValueToAlignment(4);
580   OS.EmitLabel(FuncInfoXData);
581   OS.EmitIntValue(0x19930522, 4);                      // MagicNumber
582   OS.EmitIntValue(FuncInfo.CxxUnwindMap.size(), 4);       // MaxState
583   OS.EmitValue(create32bitRef(UnwindMapXData), 4);     // UnwindMap
584   OS.EmitIntValue(FuncInfo.TryBlockMap.size(), 4);     // NumTryBlocks
585   OS.EmitValue(create32bitRef(TryBlockMapXData), 4);   // TryBlockMap
586   OS.EmitIntValue(IPToStateTable.size(), 4);           // IPMapEntries
587   OS.EmitValue(create32bitRef(IPToStateXData), 4);     // IPToStateMap
588   if (Asm->MAI->usesWindowsCFI())
589     OS.EmitIntValue(UnwindHelpOffset, 4);              // UnwindHelp
590   OS.EmitIntValue(0, 4);                               // ESTypeList
591   OS.EmitIntValue(1, 4);                               // EHFlags
592
593   // UnwindMapEntry {
594   //   int32_t ToState;
595   //   void  (*Action)();
596   // };
597   if (UnwindMapXData) {
598     OS.EmitLabel(UnwindMapXData);
599     for (const CxxUnwindMapEntry &UME : FuncInfo.CxxUnwindMap) {
600       MCSymbol *CleanupSym = getMCSymbolForMBBOrGV(Asm, UME.Cleanup);
601       OS.EmitIntValue(UME.ToState, 4);             // ToState
602       OS.EmitValue(create32bitRef(CleanupSym), 4); // Action
603     }
604   }
605
606   // TryBlockMap {
607   //   int32_t      TryLow;
608   //   int32_t      TryHigh;
609   //   int32_t      CatchHigh;
610   //   int32_t      NumCatches;
611   //   HandlerType *HandlerArray;
612   // };
613   if (TryBlockMapXData) {
614     OS.EmitLabel(TryBlockMapXData);
615     SmallVector<MCSymbol *, 1> HandlerMaps;
616     for (size_t I = 0, E = FuncInfo.TryBlockMap.size(); I != E; ++I) {
617       WinEHTryBlockMapEntry &TBME = FuncInfo.TryBlockMap[I];
618
619       MCSymbol *HandlerMapXData = nullptr;
620       if (!TBME.HandlerArray.empty())
621         HandlerMapXData =
622             Asm->OutContext.getOrCreateSymbol(Twine("$handlerMap$")
623                                                   .concat(Twine(I))
624                                                   .concat("$")
625                                                   .concat(FuncLinkageName));
626       HandlerMaps.push_back(HandlerMapXData);
627
628       // TBMEs should form intervals.
629       assert(0 <= TBME.TryLow && "bad trymap interval");
630       assert(TBME.TryLow <= TBME.TryHigh && "bad trymap interval");
631       assert(TBME.TryHigh < TBME.CatchHigh && "bad trymap interval");
632       assert(TBME.CatchHigh < int(FuncInfo.CxxUnwindMap.size()) &&
633              "bad trymap interval");
634
635       OS.EmitIntValue(TBME.TryLow, 4);                    // TryLow
636       OS.EmitIntValue(TBME.TryHigh, 4);                   // TryHigh
637       OS.EmitIntValue(TBME.CatchHigh, 4);                 // CatchHigh
638       OS.EmitIntValue(TBME.HandlerArray.size(), 4);       // NumCatches
639       OS.EmitValue(create32bitRef(HandlerMapXData), 4);   // HandlerArray
640     }
641
642     for (size_t I = 0, E = FuncInfo.TryBlockMap.size(); I != E; ++I) {
643       WinEHTryBlockMapEntry &TBME = FuncInfo.TryBlockMap[I];
644       MCSymbol *HandlerMapXData = HandlerMaps[I];
645       if (!HandlerMapXData)
646         continue;
647       // HandlerType {
648       //   int32_t         Adjectives;
649       //   TypeDescriptor *Type;
650       //   int32_t         CatchObjOffset;
651       //   void          (*Handler)();
652       //   int32_t         ParentFrameOffset; // x64 only
653       // };
654       OS.EmitLabel(HandlerMapXData);
655       for (const WinEHHandlerType &HT : TBME.HandlerArray) {
656         // Get the frame escape label with the offset of the catch object. If
657         // the index is -1, then there is no catch object, and we should emit an
658         // offset of zero, indicating that no copy will occur.
659         const MCExpr *FrameAllocOffsetRef = nullptr;
660         if (HT.CatchObjRecoverIdx >= 0) {
661           MCSymbol *FrameAllocOffset =
662               Asm->OutContext.getOrCreateFrameAllocSymbol(
663                   FuncLinkageName, HT.CatchObjRecoverIdx);
664           FrameAllocOffsetRef = MCSymbolRefExpr::create(
665               FrameAllocOffset, MCSymbolRefExpr::VK_None, Asm->OutContext);
666         } else if (HT.CatchObj.FrameIndex != INT_MAX) {
667           int Offset = getFrameIndexOffset(HT.CatchObj.FrameIndex);
668           // For 32-bit, the catch object offset is relative to the end of the
669           // EH registration node. For 64-bit, it's relative to SP at the end of
670           // the prologue.
671           if (!shouldEmitPersonality) {
672             assert(FuncInfo.EHRegNodeEndOffset != INT_MAX);
673             Offset += FuncInfo.EHRegNodeEndOffset;
674           }
675           FrameAllocOffsetRef = MCConstantExpr::create(Offset, Asm->OutContext);
676         } else {
677           FrameAllocOffsetRef = MCConstantExpr::create(0, Asm->OutContext);
678         }
679
680         MCSymbol *HandlerSym = getMCSymbolForMBBOrGV(Asm, HT.Handler);
681
682         OS.EmitIntValue(HT.Adjectives, 4);                  // Adjectives
683         OS.EmitValue(create32bitRef(HT.TypeDescriptor), 4); // Type
684         OS.EmitValue(FrameAllocOffsetRef, 4);               // CatchObjOffset
685         OS.EmitValue(create32bitRef(HandlerSym), 4);        // Handler
686
687         if (shouldEmitPersonality) {
688           // With the new IR, this is always 16 + 8 + getMaxCallFrameSize().
689           // Keep this in sync with X86FrameLowering::emitPrologue.
690           int ParentFrameOffset =
691               16 + 8 + MF->getFrameInfo()->getMaxCallFrameSize();
692           OS.EmitIntValue(ParentFrameOffset, 4); // ParentFrameOffset
693         }
694       }
695     }
696   }
697
698   // IPToStateMapEntry {
699   //   void   *IP;
700   //   int32_t State;
701   // };
702   if (IPToStateXData) {
703     OS.EmitLabel(IPToStateXData);
704     for (auto &IPStatePair : IPToStateTable) {
705       OS.EmitValue(IPStatePair.first, 4);     // IP
706       OS.EmitIntValue(IPStatePair.second, 4); // State
707     }
708   }
709 }
710
711 void WinException::computeIP2StateTable(
712     const MachineFunction *MF, WinEHFuncInfo &FuncInfo,
713     SmallVectorImpl<std::pair<const MCExpr *, int>> &IPToStateTable) {
714   // Remember what state we were in the last time we found a begin try label.
715   // This allows us to coalesce many nearby invokes with the same state into one
716   // entry.
717   int LastEHState = -1;
718   MCSymbol *LastEndLabel = Asm->getFunctionBegin();
719   assert(LastEndLabel && "need local function start label");
720
721   // Indicate that all calls from the prologue to the first invoke unwind to
722   // caller. We handle this as a special case since other ranges starting at end
723   // labels need to use LtmpN+1.
724   IPToStateTable.push_back(std::make_pair(create32bitRef(LastEndLabel), -1));
725
726   for (const auto &MBB : *MF) {
727     // FIXME: Do we need to emit entries for funclet base states?
728
729     for (InvokeRange &I : invoke_ranges(FuncInfo, MBB)) {
730       assert(I.BeginLabel && I.EndLabel);
731       // If there was a potentially throwing call between this begin label and
732       // the last end label, we need an extra base state entry to indicate that
733       // those calls unwind directly to the caller.
734       if (I.SawPotentiallyThrowing && LastEHState != -1) {
735         IPToStateTable.push_back(
736             std::make_pair(getLabelPlusOne(LastEndLabel), -1));
737         LastEHState = -1;
738       }
739
740       // Emit an entry indicating that PCs after 'Label' have this EH state.
741       if (I.State != LastEHState)
742         IPToStateTable.push_back(
743             std::make_pair(getLabelPlusOne(I.BeginLabel), I.State));
744       LastEHState = I.State;
745       LastEndLabel = I.EndLabel;
746     }
747   }
748
749   if (LastEndLabel != Asm->getFunctionBegin()) {
750     // Indicate that all calls from the last invoke until the epilogue unwind to
751     // caller. This also ensures that we have at least one ip2state entry, if
752     // somehow all invokes were deleted during CodeGen.
753     IPToStateTable.push_back(std::make_pair(getLabelPlusOne(LastEndLabel), -1));
754   }
755 }
756
757 void WinException::emitEHRegistrationOffsetLabel(const WinEHFuncInfo &FuncInfo,
758                                                  StringRef FLinkageName) {
759   // Outlined helpers called by the EH runtime need to know the offset of the EH
760   // registration in order to recover the parent frame pointer. Now that we know
761   // we've code generated the parent, we can emit the label assignment that
762   // those helpers use to get the offset of the registration node.
763   assert(FuncInfo.EHRegNodeEscapeIndex != INT_MAX &&
764          "no EH reg node localescape index");
765   MCSymbol *ParentFrameOffset =
766       Asm->OutContext.getOrCreateParentFrameOffsetSymbol(FLinkageName);
767   MCSymbol *RegistrationOffsetSym = Asm->OutContext.getOrCreateFrameAllocSymbol(
768       FLinkageName, FuncInfo.EHRegNodeEscapeIndex);
769   const MCExpr *RegistrationOffsetSymRef =
770       MCSymbolRefExpr::create(RegistrationOffsetSym, Asm->OutContext);
771   Asm->OutStreamer->EmitAssignment(ParentFrameOffset, RegistrationOffsetSymRef);
772 }
773
774 /// Emit the language-specific data that _except_handler3 and 4 expect. This is
775 /// functionally equivalent to the __C_specific_handler table, except it is
776 /// indexed by state number instead of IP.
777 void WinException::emitExceptHandlerTable(const MachineFunction *MF) {
778   MCStreamer &OS = *Asm->OutStreamer;
779   const Function *F = MF->getFunction();
780   StringRef FLinkageName = GlobalValue::getRealLinkageName(F->getName());
781
782   WinEHFuncInfo &FuncInfo = MMI->getWinEHFuncInfo(F);
783   emitEHRegistrationOffsetLabel(FuncInfo, FLinkageName);
784
785   // Emit the __ehtable label that we use for llvm.x86.seh.lsda.
786   MCSymbol *LSDALabel = Asm->OutContext.getOrCreateLSDASymbol(FLinkageName);
787   OS.EmitValueToAlignment(4);
788   OS.EmitLabel(LSDALabel);
789
790   const Function *Per =
791       dyn_cast<Function>(F->getPersonalityFn()->stripPointerCasts());
792   StringRef PerName = Per->getName();
793   int BaseState = -1;
794   if (PerName == "_except_handler4") {
795     // The LSDA for _except_handler4 starts with this struct, followed by the
796     // scope table:
797     //
798     // struct EH4ScopeTable {
799     //   int32_t GSCookieOffset;
800     //   int32_t GSCookieXOROffset;
801     //   int32_t EHCookieOffset;
802     //   int32_t EHCookieXOROffset;
803     //   ScopeTableEntry ScopeRecord[];
804     // };
805     //
806     // Only the EHCookieOffset field appears to vary, and it appears to be the
807     // offset from the final saved SP value to the retaddr.
808     OS.EmitIntValue(-2, 4);
809     OS.EmitIntValue(0, 4);
810     // FIXME: Calculate.
811     OS.EmitIntValue(9999, 4);
812     OS.EmitIntValue(0, 4);
813     BaseState = -2;
814   }
815
816   assert(!FuncInfo.SEHUnwindMap.empty());
817   for (SEHUnwindMapEntry &UME : FuncInfo.SEHUnwindMap) {
818     MCSymbol *ExceptOrFinally =
819         UME.Handler.get<MachineBasicBlock *>()->getSymbol();
820     // -1 is usually the base state for "unwind to caller", but for
821     // _except_handler4 it's -2. Do that replacement here if necessary.
822     int ToState = UME.ToState == -1 ? BaseState : UME.ToState;
823     OS.EmitIntValue(ToState, 4);                      // ToState
824     OS.EmitValue(create32bitRef(UME.Filter), 4);      // Filter
825     OS.EmitValue(create32bitRef(ExceptOrFinally), 4); // Except/Finally
826   }
827 }