1 //===--- CGStmtOpenMP.cpp - Emit LLVM Code from Statements ----------------===//
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 contains code to emit OpenMP nodes as LLVM code.
11 //
12 //===----------------------------------------------------------------------===//
13 
14 #include "CGCleanup.h"
15 #include "CGOpenMPRuntime.h"
16 #include "CodeGenFunction.h"
17 #include "CodeGenModule.h"
18 #include "TargetInfo.h"
19 #include "clang/AST/Stmt.h"
20 #include "clang/AST/StmtOpenMP.h"
21 #include "clang/AST/DeclOpenMP.h"
22 #include "llvm/IR/CallSite.h"
23 using namespace clang;
24 using namespace CodeGen;
25 
26 namespace {
27 /// Lexical scope for OpenMP executable constructs, that handles correct codegen
28 /// for captured expressions.
29 class OMPLexicalScope : public CodeGenFunction::LexicalScope {
30   void emitPreInitStmt(CodeGenFunction &CGF, const OMPExecutableDirective &S) {
31     for (const auto *C : S.clauses()) {
32       if (auto *CPI = OMPClauseWithPreInit::get(C)) {
33         if (auto *PreInit = cast_or_null<DeclStmt>(CPI->getPreInitStmt())) {
34           for (const auto *I : PreInit->decls()) {
35             if (!I->hasAttr<OMPCaptureNoInitAttr>())
36               CGF.EmitVarDecl(cast<VarDecl>(*I));
37             else {
38               CodeGenFunction::AutoVarEmission Emission =
39                   CGF.EmitAutoVarAlloca(cast<VarDecl>(*I));
40               CGF.EmitAutoVarCleanups(Emission);
41             }
42           }
43         }
44       }
45     }
46   }
47   CodeGenFunction::OMPPrivateScope InlinedShareds;
48 
49   static bool isCapturedVar(CodeGenFunction &CGF, const VarDecl *VD) {
50     return CGF.LambdaCaptureFields.lookup(VD) ||
51            (CGF.CapturedStmtInfo && CGF.CapturedStmtInfo->lookup(VD)) ||
52            (CGF.CurCodeDecl && isa<BlockDecl>(CGF.CurCodeDecl));
53   }
54 
55 public:
56   OMPLexicalScope(CodeGenFunction &CGF, const OMPExecutableDirective &S,
57                   bool AsInlined = false, bool EmitPreInitStmt = true)
58       : CodeGenFunction::LexicalScope(CGF, S.getSourceRange()),
59         InlinedShareds(CGF) {
60     if (EmitPreInitStmt)
61       emitPreInitStmt(CGF, S);
62     if (AsInlined) {
63       if (S.hasAssociatedStmt()) {
64         auto *CS = cast<CapturedStmt>(S.getAssociatedStmt());
65         for (auto &C : CS->captures()) {
66           if (C.capturesVariable() || C.capturesVariableByCopy()) {
67             auto *VD = C.getCapturedVar();
68             assert(VD == VD->getCanonicalDecl() &&
69                         "Canonical decl must be captured.");
70             DeclRefExpr DRE(const_cast<VarDecl *>(VD),
71                             isCapturedVar(CGF, VD) ||
72                                 (CGF.CapturedStmtInfo &&
73                                  InlinedShareds.isGlobalVarCaptured(VD)),
74                             VD->getType().getNonReferenceType(), VK_LValue,
75                             SourceLocation());
76             InlinedShareds.addPrivate(VD, [&CGF, &DRE]() -> Address {
77               return CGF.EmitLValue(&DRE).getAddress();
78             });
79           }
80         }
81         (void)InlinedShareds.Privatize();
82       }
83     }
84   }
85 };
86 
87 /// Lexical scope for OpenMP parallel construct, that handles correct codegen
88 /// for captured expressions.
89 class OMPParallelScope final : public OMPLexicalScope {
90   bool EmitPreInitStmt(const OMPExecutableDirective &S) {
91     OpenMPDirectiveKind Kind = S.getDirectiveKind();
92     return !(isOpenMPTargetExecutionDirective(Kind) ||
93              isOpenMPLoopBoundSharingDirective(Kind)) &&
94            isOpenMPParallelDirective(Kind);
95   }
96 
97 public:
98   OMPParallelScope(CodeGenFunction &CGF, const OMPExecutableDirective &S)
99       : OMPLexicalScope(CGF, S,
100                         /*AsInlined=*/false,
101                         /*EmitPreInitStmt=*/EmitPreInitStmt(S)) {}
102 };
103 
104 /// Lexical scope for OpenMP teams construct, that handles correct codegen
105 /// for captured expressions.
106 class OMPTeamsScope final : public OMPLexicalScope {
107   bool EmitPreInitStmt(const OMPExecutableDirective &S) {
108     OpenMPDirectiveKind Kind = S.getDirectiveKind();
109     return !isOpenMPTargetExecutionDirective(Kind) &&
110            isOpenMPTeamsDirective(Kind);
111   }
112 
113 public:
114   OMPTeamsScope(CodeGenFunction &CGF, const OMPExecutableDirective &S)
115       : OMPLexicalScope(CGF, S,
116                         /*AsInlined=*/false,
117                         /*EmitPreInitStmt=*/EmitPreInitStmt(S)) {}
118 };
119 
120 /// Private scope for OpenMP loop-based directives, that supports capturing
121 /// of used expression from loop statement.
122 class OMPLoopScope : public CodeGenFunction::RunCleanupsScope {
123   void emitPreInitStmt(CodeGenFunction &CGF, const OMPLoopDirective &S) {
124     if (auto *LD = dyn_cast<OMPLoopDirective>(&S)) {
125       if (auto *PreInits = cast_or_null<DeclStmt>(LD->getPreInits())) {
126         for (const auto *I : PreInits->decls())
127           CGF.EmitVarDecl(cast<VarDecl>(*I));
128       }
129     }
130   }
131 
132 public:
133   OMPLoopScope(CodeGenFunction &CGF, const OMPLoopDirective &S)
134       : CodeGenFunction::RunCleanupsScope(CGF) {
135     emitPreInitStmt(CGF, S);
136   }
137 };
138 
139 } // namespace
140 
141 LValue CodeGenFunction::EmitOMPSharedLValue(const Expr *E) {
142   if (auto *OrigDRE = dyn_cast<DeclRefExpr>(E)) {
143     if (auto *OrigVD = dyn_cast<VarDecl>(OrigDRE->getDecl())) {
144       OrigVD = OrigVD->getCanonicalDecl();
145       bool IsCaptured =
146           LambdaCaptureFields.lookup(OrigVD) ||
147           (CapturedStmtInfo && CapturedStmtInfo->lookup(OrigVD)) ||
148           (CurCodeDecl && isa<BlockDecl>(CurCodeDecl));
149       DeclRefExpr DRE(const_cast<VarDecl *>(OrigVD), IsCaptured,
150                       OrigDRE->getType(), VK_LValue, OrigDRE->getExprLoc());
151       return EmitLValue(&DRE);
152     }
153   }
154   return EmitLValue(E);
155 }
156 
157 llvm::Value *CodeGenFunction::getTypeSize(QualType Ty) {
158   auto &C = getContext();
159   llvm::Value *Size = nullptr;
160   auto SizeInChars = C.getTypeSizeInChars(Ty);
161   if (SizeInChars.isZero()) {
162     // getTypeSizeInChars() returns 0 for a VLA.
163     while (auto *VAT = C.getAsVariableArrayType(Ty)) {
164       llvm::Value *ArraySize;
165       std::tie(ArraySize, Ty) = getVLASize(VAT);
166       Size = Size ? Builder.CreateNUWMul(Size, ArraySize) : ArraySize;
167     }
168     SizeInChars = C.getTypeSizeInChars(Ty);
169     if (SizeInChars.isZero())
170       return llvm::ConstantInt::get(SizeTy, /*V=*/0);
171     Size = Builder.CreateNUWMul(Size, CGM.getSize(SizeInChars));
172   } else
173     Size = CGM.getSize(SizeInChars);
174   return Size;
175 }
176 
177 void CodeGenFunction::GenerateOpenMPCapturedVars(
178     const CapturedStmt &S, SmallVectorImpl<llvm::Value *> &CapturedVars) {
179   const RecordDecl *RD = S.getCapturedRecordDecl();
180   auto CurField = RD->field_begin();
181   auto CurCap = S.captures().begin();
182   for (CapturedStmt::const_capture_init_iterator I = S.capture_init_begin(),
183                                                  E = S.capture_init_end();
184        I != E; ++I, ++CurField, ++CurCap) {
185     if (CurField->hasCapturedVLAType()) {
186       auto VAT = CurField->getCapturedVLAType();
187       auto *Val = VLASizeMap[VAT->getSizeExpr()];
188       CapturedVars.push_back(Val);
189     } else if (CurCap->capturesThis())
190       CapturedVars.push_back(CXXThisValue);
191     else if (CurCap->capturesVariableByCopy()) {
192       llvm::Value *CV =
193           EmitLoadOfLValue(EmitLValue(*I), SourceLocation()).getScalarVal();
194 
195       // If the field is not a pointer, we need to save the actual value
196       // and load it as a void pointer.
197       if (!CurField->getType()->isAnyPointerType()) {
198         auto &Ctx = getContext();
199         auto DstAddr = CreateMemTemp(
200             Ctx.getUIntPtrType(),
201             Twine(CurCap->getCapturedVar()->getName()) + ".casted");
202         LValue DstLV = MakeAddrLValue(DstAddr, Ctx.getUIntPtrType());
203 
204         auto *SrcAddrVal = EmitScalarConversion(
205             DstAddr.getPointer(), Ctx.getPointerType(Ctx.getUIntPtrType()),
206             Ctx.getPointerType(CurField->getType()), SourceLocation());
207         LValue SrcLV =
208             MakeNaturalAlignAddrLValue(SrcAddrVal, CurField->getType());
209 
210         // Store the value using the source type pointer.
211         EmitStoreThroughLValue(RValue::get(CV), SrcLV);
212 
213         // Load the value using the destination type pointer.
214         CV = EmitLoadOfLValue(DstLV, SourceLocation()).getScalarVal();
215       }
216       CapturedVars.push_back(CV);
217     } else {
218       assert(CurCap->capturesVariable() && "Expected capture by reference.");
219       CapturedVars.push_back(EmitLValue(*I).getAddress().getPointer());
220     }
221   }
222 }
223 
224 static Address castValueFromUintptr(CodeGenFunction &CGF, QualType DstType,
225                                     StringRef Name, LValue AddrLV,
226                                     bool isReferenceType = false) {
227   ASTContext &Ctx = CGF.getContext();
228 
229   auto *CastedPtr = CGF.EmitScalarConversion(
230       AddrLV.getAddress().getPointer(), Ctx.getUIntPtrType(),
231       Ctx.getPointerType(DstType), SourceLocation());
232   auto TmpAddr =
233       CGF.MakeNaturalAlignAddrLValue(CastedPtr, Ctx.getPointerType(DstType))
234           .getAddress();
235 
236   // If we are dealing with references we need to return the address of the
237   // reference instead of the reference of the value.
238   if (isReferenceType) {
239     QualType RefType = Ctx.getLValueReferenceType(DstType);
240     auto *RefVal = TmpAddr.getPointer();
241     TmpAddr = CGF.CreateMemTemp(RefType, Twine(Name) + ".ref");
242     auto TmpLVal = CGF.MakeAddrLValue(TmpAddr, RefType);
243     CGF.EmitStoreThroughLValue(RValue::get(RefVal), TmpLVal, /*isInit*/ true);
244   }
245 
246   return TmpAddr;
247 }
248 
249 static QualType getCanonicalParamType(ASTContext &C, QualType T) {
250   if (T->isLValueReferenceType()) {
251     return C.getLValueReferenceType(
252         getCanonicalParamType(C, T.getNonReferenceType()),
253         /*SpelledAsLValue=*/false);
254   }
255   if (T->isPointerType())
256     return C.getPointerType(getCanonicalParamType(C, T->getPointeeType()));
257   return C.getCanonicalParamType(T);
258 }
259 
260 namespace {
261   /// Contains required data for proper outlined function codegen.
262   struct FunctionOptions {
263     /// Captured statement for which the function is generated.
264     const CapturedStmt *S = nullptr;
265     /// true if cast to/from  UIntPtr is required for variables captured by
266     /// value.
267     const bool UIntPtrCastRequired = true;
268     /// true if only casted arguments must be registered as local args or VLA
269     /// sizes.
270     const bool RegisterCastedArgsOnly = false;
271     /// Name of the generated function.
272     const StringRef FunctionName;
273     explicit FunctionOptions(const CapturedStmt *S, bool UIntPtrCastRequired,
274                              bool RegisterCastedArgsOnly,
275                              StringRef FunctionName)
276         : S(S), UIntPtrCastRequired(UIntPtrCastRequired),
277           RegisterCastedArgsOnly(UIntPtrCastRequired && RegisterCastedArgsOnly),
278           FunctionName(FunctionName) {}
279   };
280 }
281 
282 static llvm::Function *emitOutlinedFunctionPrologue(
283     CodeGenFunction &CGF, FunctionArgList &Args,
284     llvm::MapVector<const Decl *, std::pair<const VarDecl *, Address>>
285         &LocalAddrs,
286     llvm::DenseMap<const Decl *, std::pair<const Expr *, llvm::Value *>>
287         &VLASizes,
288     llvm::Value *&CXXThisValue, const FunctionOptions &FO) {
289   const CapturedDecl *CD = FO.S->getCapturedDecl();
290   const RecordDecl *RD = FO.S->getCapturedRecordDecl();
291   assert(CD->hasBody() && "missing CapturedDecl body");
292 
293   CXXThisValue = nullptr;
294   // Build the argument list.
295   CodeGenModule &CGM = CGF.CGM;
296   ASTContext &Ctx = CGM.getContext();
297   FunctionArgList TargetArgs;
298   Args.append(CD->param_begin(),
299               std::next(CD->param_begin(), CD->getContextParamPosition()));
300   TargetArgs.append(
301       CD->param_begin(),
302       std::next(CD->param_begin(), CD->getContextParamPosition()));
303   auto I = FO.S->captures().begin();
304   for (auto *FD : RD->fields()) {
305     QualType ArgType = FD->getType();
306     IdentifierInfo *II = nullptr;
307     VarDecl *CapVar = nullptr;
308 
309     // If this is a capture by copy and the type is not a pointer, the outlined
310     // function argument type should be uintptr and the value properly casted to
311     // uintptr. This is necessary given that the runtime library is only able to
312     // deal with pointers. We can pass in the same way the VLA type sizes to the
313     // outlined function.
314     if ((I->capturesVariableByCopy() && !ArgType->isAnyPointerType()) ||
315         I->capturesVariableArrayType()) {
316       if (FO.UIntPtrCastRequired)
317         ArgType = Ctx.getUIntPtrType();
318     }
319 
320     if (I->capturesVariable() || I->capturesVariableByCopy()) {
321       CapVar = I->getCapturedVar();
322       II = CapVar->getIdentifier();
323     } else if (I->capturesThis())
324       II = &Ctx.Idents.get("this");
325     else {
326       assert(I->capturesVariableArrayType());
327       II = &Ctx.Idents.get("vla");
328     }
329     if (ArgType->isVariablyModifiedType())
330       ArgType = getCanonicalParamType(Ctx, ArgType.getNonReferenceType());
331     auto *Arg =
332         ImplicitParamDecl::Create(Ctx, /*DC=*/nullptr, FD->getLocation(), II,
333                                   ArgType, ImplicitParamDecl::Other);
334     Args.emplace_back(Arg);
335     // Do not cast arguments if we emit function with non-original types.
336     TargetArgs.emplace_back(
337         FO.UIntPtrCastRequired
338             ? Arg
339             : CGM.getOpenMPRuntime().translateParameter(FD, Arg));
340     ++I;
341   }
342   Args.append(
343       std::next(CD->param_begin(), CD->getContextParamPosition() + 1),
344       CD->param_end());
345   TargetArgs.append(
346       std::next(CD->param_begin(), CD->getContextParamPosition() + 1),
347       CD->param_end());
348 
349   // Create the function declaration.
350   FunctionType::ExtInfo ExtInfo;
351   const CGFunctionInfo &FuncInfo =
352       CGM.getTypes().arrangeBuiltinFunctionDeclaration(Ctx.VoidTy, TargetArgs);
353   llvm::FunctionType *FuncLLVMTy = CGM.getTypes().GetFunctionType(FuncInfo);
354 
355   llvm::Function *F =
356       llvm::Function::Create(FuncLLVMTy, llvm::GlobalValue::InternalLinkage,
357                              FO.FunctionName, &CGM.getModule());
358   CGM.SetInternalFunctionAttributes(CD, F, FuncInfo);
359   if (CD->isNothrow())
360     F->setDoesNotThrow();
361 
362   // Generate the function.
363   CGF.StartFunction(CD, Ctx.VoidTy, F, FuncInfo, TargetArgs,
364                     FO.S->getLocStart(), CD->getBody()->getLocStart());
365   unsigned Cnt = CD->getContextParamPosition();
366   I = FO.S->captures().begin();
367   for (auto *FD : RD->fields()) {
368     // Do not map arguments if we emit function with non-original types.
369     Address LocalAddr(Address::invalid());
370     if (!FO.UIntPtrCastRequired && Args[Cnt] != TargetArgs[Cnt]) {
371       LocalAddr = CGM.getOpenMPRuntime().getParameterAddress(CGF, Args[Cnt],
372                                                              TargetArgs[Cnt]);
373     } else {
374       LocalAddr = CGF.GetAddrOfLocalVar(Args[Cnt]);
375     }
376     // If we are capturing a pointer by copy we don't need to do anything, just
377     // use the value that we get from the arguments.
378     if (I->capturesVariableByCopy() && FD->getType()->isAnyPointerType()) {
379       const VarDecl *CurVD = I->getCapturedVar();
380       // If the variable is a reference we need to materialize it here.
381       if (CurVD->getType()->isReferenceType()) {
382         Address RefAddr = CGF.CreateMemTemp(
383             CurVD->getType(), CGM.getPointerAlign(), ".materialized_ref");
384         CGF.EmitStoreOfScalar(LocalAddr.getPointer(), RefAddr,
385                               /*Volatile=*/false, CurVD->getType());
386         LocalAddr = RefAddr;
387       }
388       if (!FO.RegisterCastedArgsOnly)
389         LocalAddrs.insert({Args[Cnt], {CurVD, LocalAddr}});
390       ++Cnt;
391       ++I;
392       continue;
393     }
394 
395     LValueBaseInfo BaseInfo(AlignmentSource::Decl, false);
396     LValue ArgLVal =
397         CGF.MakeAddrLValue(LocalAddr, Args[Cnt]->getType(), BaseInfo);
398     if (FD->hasCapturedVLAType()) {
399       if (FO.UIntPtrCastRequired) {
400         ArgLVal = CGF.MakeAddrLValue(castValueFromUintptr(CGF, FD->getType(),
401                                                           Args[Cnt]->getName(),
402                                                           ArgLVal),
403                                      FD->getType(), BaseInfo);
404       }
405       auto *ExprArg =
406           CGF.EmitLoadOfLValue(ArgLVal, SourceLocation()).getScalarVal();
407       auto VAT = FD->getCapturedVLAType();
408       VLASizes.insert({Args[Cnt], {VAT->getSizeExpr(), ExprArg}});
409     } else if (I->capturesVariable()) {
410       auto *Var = I->getCapturedVar();
411       QualType VarTy = Var->getType();
412       Address ArgAddr = ArgLVal.getAddress();
413       if (!VarTy->isReferenceType()) {
414         if (ArgLVal.getType()->isLValueReferenceType()) {
415           ArgAddr = CGF.EmitLoadOfReference(
416               ArgAddr, ArgLVal.getType()->castAs<ReferenceType>());
417         } else if (!VarTy->isVariablyModifiedType() || !VarTy->isPointerType()) {
418           assert(ArgLVal.getType()->isPointerType());
419           ArgAddr = CGF.EmitLoadOfPointer(
420               ArgAddr, ArgLVal.getType()->castAs<PointerType>());
421         }
422       }
423       if (!FO.RegisterCastedArgsOnly) {
424         LocalAddrs.insert(
425             {Args[Cnt],
426              {Var, Address(ArgAddr.getPointer(), Ctx.getDeclAlign(Var))}});
427       }
428     } else if (I->capturesVariableByCopy()) {
429       assert(!FD->getType()->isAnyPointerType() &&
430              "Not expecting a captured pointer.");
431       auto *Var = I->getCapturedVar();
432       QualType VarTy = Var->getType();
433       LocalAddrs.insert(
434           {Args[Cnt],
435            {Var,
436             FO.UIntPtrCastRequired
437                 ? castValueFromUintptr(CGF, FD->getType(), Args[Cnt]->getName(),
438                                        ArgLVal, VarTy->isReferenceType())
439                 : ArgLVal.getAddress()}});
440     } else {
441       // If 'this' is captured, load it into CXXThisValue.
442       assert(I->capturesThis());
443       CXXThisValue = CGF.EmitLoadOfLValue(ArgLVal, Args[Cnt]->getLocation())
444                          .getScalarVal();
445       LocalAddrs.insert({Args[Cnt], {nullptr, ArgLVal.getAddress()}});
446     }
447     ++Cnt;
448     ++I;
449   }
450 
451   return F;
452 }
453 
454 llvm::Function *
455 CodeGenFunction::GenerateOpenMPCapturedStmtFunction(const CapturedStmt &S) {
456   assert(
457       CapturedStmtInfo &&
458       "CapturedStmtInfo should be set when generating the captured function");
459   const CapturedDecl *CD = S.getCapturedDecl();
460   // Build the argument list.
461   bool NeedWrapperFunction =
462       getDebugInfo() &&
463       CGM.getCodeGenOpts().getDebugInfo() >= codegenoptions::LimitedDebugInfo;
464   FunctionArgList Args;
465   llvm::MapVector<const Decl *, std::pair<const VarDecl *, Address>> LocalAddrs;
466   llvm::DenseMap<const Decl *, std::pair<const Expr *, llvm::Value *>> VLASizes;
467   SmallString<256> Buffer;
468   llvm::raw_svector_ostream Out(Buffer);
469   Out << CapturedStmtInfo->getHelperName();
470   if (NeedWrapperFunction)
471     Out << "_debug__";
472   FunctionOptions FO(&S, !NeedWrapperFunction, /*RegisterCastedArgsOnly=*/false,
473                      Out.str());
474   llvm::Function *F = emitOutlinedFunctionPrologue(*this, Args, LocalAddrs,
475                                                    VLASizes, CXXThisValue, FO);
476   for (const auto &LocalAddrPair : LocalAddrs) {
477     if (LocalAddrPair.second.first) {
478       setAddrOfLocalVar(LocalAddrPair.second.first,
479                         LocalAddrPair.second.second);
480     }
481   }
482   for (const auto &VLASizePair : VLASizes)
483     VLASizeMap[VLASizePair.second.first] = VLASizePair.second.second;
484   PGO.assignRegionCounters(GlobalDecl(CD), F);
485   CapturedStmtInfo->EmitBody(*this, CD->getBody());
486   FinishFunction(CD->getBodyRBrace());
487   if (!NeedWrapperFunction)
488     return F;
489 
490   FunctionOptions WrapperFO(&S, /*UIntPtrCastRequired=*/true,
491                             /*RegisterCastedArgsOnly=*/true,
492                             CapturedStmtInfo->getHelperName());
493   CodeGenFunction WrapperCGF(CGM, /*suppressNewContext=*/true);
494   Args.clear();
495   LocalAddrs.clear();
496   VLASizes.clear();
497   llvm::Function *WrapperF =
498       emitOutlinedFunctionPrologue(WrapperCGF, Args, LocalAddrs, VLASizes,
499                                    WrapperCGF.CXXThisValue, WrapperFO);
500   LValueBaseInfo BaseInfo(AlignmentSource::Decl, false);
501   llvm::SmallVector<llvm::Value *, 4> CallArgs;
502   for (const auto *Arg : Args) {
503     llvm::Value *CallArg;
504     auto I = LocalAddrs.find(Arg);
505     if (I != LocalAddrs.end()) {
506       LValue LV =
507           WrapperCGF.MakeAddrLValue(I->second.second, Arg->getType(), BaseInfo);
508       CallArg = WrapperCGF.EmitLoadOfScalar(LV, SourceLocation());
509     } else {
510       auto EI = VLASizes.find(Arg);
511       if (EI != VLASizes.end())
512         CallArg = EI->second.second;
513       else {
514         LValue LV = WrapperCGF.MakeAddrLValue(WrapperCGF.GetAddrOfLocalVar(Arg),
515                                               Arg->getType(), BaseInfo);
516         CallArg = WrapperCGF.EmitLoadOfScalar(LV, SourceLocation());
517       }
518     }
519     CallArgs.emplace_back(CallArg);
520   }
521   CGM.getOpenMPRuntime().emitOutlinedFunctionCall(WrapperCGF, S.getLocStart(),
522                                                   F, CallArgs);
523   WrapperCGF.FinishFunction();
524   return WrapperF;
525 }
526 
527 //===----------------------------------------------------------------------===//
528 //                              OpenMP Directive Emission
529 //===----------------------------------------------------------------------===//
530 void CodeGenFunction::EmitOMPAggregateAssign(
531     Address DestAddr, Address SrcAddr, QualType OriginalType,
532     const llvm::function_ref<void(Address, Address)> &CopyGen) {
533   // Perform element-by-element initialization.
534   QualType ElementTy;
535 
536   // Drill down to the base element type on both arrays.
537   auto ArrayTy = OriginalType->getAsArrayTypeUnsafe();
538   auto NumElements = emitArrayLength(ArrayTy, ElementTy, DestAddr);
539   SrcAddr = Builder.CreateElementBitCast(SrcAddr, DestAddr.getElementType());
540 
541   auto SrcBegin = SrcAddr.getPointer();
542   auto DestBegin = DestAddr.getPointer();
543   // Cast from pointer to array type to pointer to single element.
544   auto DestEnd = Builder.CreateGEP(DestBegin, NumElements);
545   // The basic structure here is a while-do loop.
546   auto BodyBB = createBasicBlock("omp.arraycpy.body");
547   auto DoneBB = createBasicBlock("omp.arraycpy.done");
548   auto IsEmpty =
549       Builder.CreateICmpEQ(DestBegin, DestEnd, "omp.arraycpy.isempty");
550   Builder.CreateCondBr(IsEmpty, DoneBB, BodyBB);
551 
552   // Enter the loop body, making that address the current address.
553   auto EntryBB = Builder.GetInsertBlock();
554   EmitBlock(BodyBB);
555 
556   CharUnits ElementSize = getContext().getTypeSizeInChars(ElementTy);
557 
558   llvm::PHINode *SrcElementPHI =
559     Builder.CreatePHI(SrcBegin->getType(), 2, "omp.arraycpy.srcElementPast");
560   SrcElementPHI->addIncoming(SrcBegin, EntryBB);
561   Address SrcElementCurrent =
562       Address(SrcElementPHI,
563               SrcAddr.getAlignment().alignmentOfArrayElement(ElementSize));
564 
565   llvm::PHINode *DestElementPHI =
566     Builder.CreatePHI(DestBegin->getType(), 2, "omp.arraycpy.destElementPast");
567   DestElementPHI->addIncoming(DestBegin, EntryBB);
568   Address DestElementCurrent =
569     Address(DestElementPHI,
570             DestAddr.getAlignment().alignmentOfArrayElement(ElementSize));
571 
572   // Emit copy.
573   CopyGen(DestElementCurrent, SrcElementCurrent);
574 
575   // Shift the address forward by one element.
576   auto DestElementNext = Builder.CreateConstGEP1_32(
577       DestElementPHI, /*Idx0=*/1, "omp.arraycpy.dest.element");
578   auto SrcElementNext = Builder.CreateConstGEP1_32(
579       SrcElementPHI, /*Idx0=*/1, "omp.arraycpy.src.element");
580   // Check whether we've reached the end.
581   auto Done =
582       Builder.CreateICmpEQ(DestElementNext, DestEnd, "omp.arraycpy.done");
583   Builder.CreateCondBr(Done, DoneBB, BodyBB);
584   DestElementPHI->addIncoming(DestElementNext, Builder.GetInsertBlock());
585   SrcElementPHI->addIncoming(SrcElementNext, Builder.GetInsertBlock());
586 
587   // Done.
588   EmitBlock(DoneBB, /*IsFinished=*/true);
589 }
590 
591 void CodeGenFunction::EmitOMPCopy(QualType OriginalType, Address DestAddr,
592                                   Address SrcAddr, const VarDecl *DestVD,
593                                   const VarDecl *SrcVD, const Expr *Copy) {
594   if (OriginalType->isArrayType()) {
595     auto *BO = dyn_cast<BinaryOperator>(Copy);
596     if (BO && BO->getOpcode() == BO_Assign) {
597       // Perform simple memcpy for simple copying.
598       EmitAggregateAssign(DestAddr, SrcAddr, OriginalType);
599     } else {
600       // For arrays with complex element types perform element by element
601       // copying.
602       EmitOMPAggregateAssign(
603           DestAddr, SrcAddr, OriginalType,
604           [this, Copy, SrcVD, DestVD](Address DestElement, Address SrcElement) {
605             // Working with the single array element, so have to remap
606             // destination and source variables to corresponding array
607             // elements.
608             CodeGenFunction::OMPPrivateScope Remap(*this);
609             Remap.addPrivate(DestVD, [DestElement]() -> Address {
610               return DestElement;
611             });
612             Remap.addPrivate(
613                 SrcVD, [SrcElement]() -> Address { return SrcElement; });
614             (void)Remap.Privatize();
615             EmitIgnoredExpr(Copy);
616           });
617     }
618   } else {
619     // Remap pseudo source variable to private copy.
620     CodeGenFunction::OMPPrivateScope Remap(*this);
621     Remap.addPrivate(SrcVD, [SrcAddr]() -> Address { return SrcAddr; });
622     Remap.addPrivate(DestVD, [DestAddr]() -> Address { return DestAddr; });
623     (void)Remap.Privatize();
624     // Emit copying of the whole variable.
625     EmitIgnoredExpr(Copy);
626   }
627 }
628 
629 bool CodeGenFunction::EmitOMPFirstprivateClause(const OMPExecutableDirective &D,
630                                                 OMPPrivateScope &PrivateScope) {
631   if (!HaveInsertPoint())
632     return false;
633   bool FirstprivateIsLastprivate = false;
634   llvm::DenseSet<const VarDecl *> Lastprivates;
635   for (const auto *C : D.getClausesOfKind<OMPLastprivateClause>()) {
636     for (const auto *D : C->varlists())
637       Lastprivates.insert(
638           cast<VarDecl>(cast<DeclRefExpr>(D)->getDecl())->getCanonicalDecl());
639   }
640   llvm::DenseSet<const VarDecl *> EmittedAsFirstprivate;
641   CGCapturedStmtInfo CapturesInfo(cast<CapturedStmt>(*D.getAssociatedStmt()));
642   for (const auto *C : D.getClausesOfKind<OMPFirstprivateClause>()) {
643     auto IRef = C->varlist_begin();
644     auto InitsRef = C->inits().begin();
645     for (auto IInit : C->private_copies()) {
646       auto *OrigVD = cast<VarDecl>(cast<DeclRefExpr>(*IRef)->getDecl());
647       bool ThisFirstprivateIsLastprivate =
648           Lastprivates.count(OrigVD->getCanonicalDecl()) > 0;
649       auto *CapFD = CapturesInfo.lookup(OrigVD);
650       auto *FD = CapturedStmtInfo->lookup(OrigVD);
651       if (!ThisFirstprivateIsLastprivate && FD && (FD == CapFD) &&
652           !FD->getType()->isReferenceType()) {
653         EmittedAsFirstprivate.insert(OrigVD->getCanonicalDecl());
654         ++IRef;
655         ++InitsRef;
656         continue;
657       }
658       FirstprivateIsLastprivate =
659           FirstprivateIsLastprivate || ThisFirstprivateIsLastprivate;
660       if (EmittedAsFirstprivate.insert(OrigVD->getCanonicalDecl()).second) {
661         auto *VD = cast<VarDecl>(cast<DeclRefExpr>(IInit)->getDecl());
662         auto *VDInit = cast<VarDecl>(cast<DeclRefExpr>(*InitsRef)->getDecl());
663         bool IsRegistered;
664         DeclRefExpr DRE(const_cast<VarDecl *>(OrigVD),
665                         /*RefersToEnclosingVariableOrCapture=*/FD != nullptr,
666                         (*IRef)->getType(), VK_LValue, (*IRef)->getExprLoc());
667         Address OriginalAddr = EmitLValue(&DRE).getAddress();
668         QualType Type = VD->getType();
669         if (Type->isArrayType()) {
670           // Emit VarDecl with copy init for arrays.
671           // Get the address of the original variable captured in current
672           // captured region.
673           IsRegistered = PrivateScope.addPrivate(OrigVD, [&]() -> Address {
674             auto Emission = EmitAutoVarAlloca(*VD);
675             auto *Init = VD->getInit();
676             if (!isa<CXXConstructExpr>(Init) || isTrivialInitializer(Init)) {
677               // Perform simple memcpy.
678               EmitAggregateAssign(Emission.getAllocatedAddress(), OriginalAddr,
679                                   Type);
680             } else {
681               EmitOMPAggregateAssign(
682                   Emission.getAllocatedAddress(), OriginalAddr, Type,
683                   [this, VDInit, Init](Address DestElement,
684                                        Address SrcElement) {
685                     // Clean up any temporaries needed by the initialization.
686                     RunCleanupsScope InitScope(*this);
687                     // Emit initialization for single element.
688                     setAddrOfLocalVar(VDInit, SrcElement);
689                     EmitAnyExprToMem(Init, DestElement,
690                                      Init->getType().getQualifiers(),
691                                      /*IsInitializer*/ false);
692                     LocalDeclMap.erase(VDInit);
693                   });
694             }
695             EmitAutoVarCleanups(Emission);
696             return Emission.getAllocatedAddress();
697           });
698         } else {
699           IsRegistered = PrivateScope.addPrivate(OrigVD, [&]() -> Address {
700             // Emit private VarDecl with copy init.
701             // Remap temp VDInit variable to the address of the original
702             // variable
703             // (for proper handling of captured global variables).
704             setAddrOfLocalVar(VDInit, OriginalAddr);
705             EmitDecl(*VD);
706             LocalDeclMap.erase(VDInit);
707             return GetAddrOfLocalVar(VD);
708           });
709         }
710         assert(IsRegistered &&
711                "firstprivate var already registered as private");
712         // Silence the warning about unused variable.
713         (void)IsRegistered;
714       }
715       ++IRef;
716       ++InitsRef;
717     }
718   }
719   return FirstprivateIsLastprivate && !EmittedAsFirstprivate.empty();
720 }
721 
722 void CodeGenFunction::EmitOMPPrivateClause(
723     const OMPExecutableDirective &D,
724     CodeGenFunction::OMPPrivateScope &PrivateScope) {
725   if (!HaveInsertPoint())
726     return;
727   llvm::DenseSet<const VarDecl *> EmittedAsPrivate;
728   for (const auto *C : D.getClausesOfKind<OMPPrivateClause>()) {
729     auto IRef = C->varlist_begin();
730     for (auto IInit : C->private_copies()) {
731       auto *OrigVD = cast<VarDecl>(cast<DeclRefExpr>(*IRef)->getDecl());
732       if (EmittedAsPrivate.insert(OrigVD->getCanonicalDecl()).second) {
733         auto VD = cast<VarDecl>(cast<DeclRefExpr>(IInit)->getDecl());
734         bool IsRegistered =
735             PrivateScope.addPrivate(OrigVD, [&]() -> Address {
736               // Emit private VarDecl with copy init.
737               EmitDecl(*VD);
738               return GetAddrOfLocalVar(VD);
739             });
740         assert(IsRegistered && "private var already registered as private");
741         // Silence the warning about unused variable.
742         (void)IsRegistered;
743       }
744       ++IRef;
745     }
746   }
747 }
748 
749 bool CodeGenFunction::EmitOMPCopyinClause(const OMPExecutableDirective &D) {
750   if (!HaveInsertPoint())
751     return false;
752   // threadprivate_var1 = master_threadprivate_var1;
753   // operator=(threadprivate_var2, master_threadprivate_var2);
754   // ...
755   // __kmpc_barrier(&loc, global_tid);
756   llvm::DenseSet<const VarDecl *> CopiedVars;
757   llvm::BasicBlock *CopyBegin = nullptr, *CopyEnd = nullptr;
758   for (const auto *C : D.getClausesOfKind<OMPCopyinClause>()) {
759     auto IRef = C->varlist_begin();
760     auto ISrcRef = C->source_exprs().begin();
761     auto IDestRef = C->destination_exprs().begin();
762     for (auto *AssignOp : C->assignment_ops()) {
763       auto *VD = cast<VarDecl>(cast<DeclRefExpr>(*IRef)->getDecl());
764       QualType Type = VD->getType();
765       if (CopiedVars.insert(VD->getCanonicalDecl()).second) {
766         // Get the address of the master variable. If we are emitting code with
767         // TLS support, the address is passed from the master as field in the
768         // captured declaration.
769         Address MasterAddr = Address::invalid();
770         if (getLangOpts().OpenMPUseTLS &&
771             getContext().getTargetInfo().isTLSSupported()) {
772           assert(CapturedStmtInfo->lookup(VD) &&
773                  "Copyin threadprivates should have been captured!");
774           DeclRefExpr DRE(const_cast<VarDecl *>(VD), true, (*IRef)->getType(),
775                           VK_LValue, (*IRef)->getExprLoc());
776           MasterAddr = EmitLValue(&DRE).getAddress();
777           LocalDeclMap.erase(VD);
778         } else {
779           MasterAddr =
780             Address(VD->isStaticLocal() ? CGM.getStaticLocalDeclAddress(VD)
781                                         : CGM.GetAddrOfGlobal(VD),
782                     getContext().getDeclAlign(VD));
783         }
784         // Get the address of the threadprivate variable.
785         Address PrivateAddr = EmitLValue(*IRef).getAddress();
786         if (CopiedVars.size() == 1) {
787           // At first check if current thread is a master thread. If it is, no
788           // need to copy data.
789           CopyBegin = createBasicBlock("copyin.not.master");
790           CopyEnd = createBasicBlock("copyin.not.master.end");
791           Builder.CreateCondBr(
792               Builder.CreateICmpNE(
793                   Builder.CreatePtrToInt(MasterAddr.getPointer(), CGM.IntPtrTy),
794                   Builder.CreatePtrToInt(PrivateAddr.getPointer(), CGM.IntPtrTy)),
795               CopyBegin, CopyEnd);
796           EmitBlock(CopyBegin);
797         }
798         auto *SrcVD = cast<VarDecl>(cast<DeclRefExpr>(*ISrcRef)->getDecl());
799         auto *DestVD = cast<VarDecl>(cast<DeclRefExpr>(*IDestRef)->getDecl());
800         EmitOMPCopy(Type, PrivateAddr, MasterAddr, DestVD, SrcVD, AssignOp);
801       }
802       ++IRef;
803       ++ISrcRef;
804       ++IDestRef;
805     }
806   }
807   if (CopyEnd) {
808     // Exit out of copying procedure for non-master thread.
809     EmitBlock(CopyEnd, /*IsFinished=*/true);
810     return true;
811   }
812   return false;
813 }
814 
815 bool CodeGenFunction::EmitOMPLastprivateClauseInit(
816     const OMPExecutableDirective &D, OMPPrivateScope &PrivateScope) {
817   if (!HaveInsertPoint())
818     return false;
819   bool HasAtLeastOneLastprivate = false;
820   llvm::DenseSet<const VarDecl *> SIMDLCVs;
821   if (isOpenMPSimdDirective(D.getDirectiveKind())) {
822     auto *LoopDirective = cast<OMPLoopDirective>(&D);
823     for (auto *C : LoopDirective->counters()) {
824       SIMDLCVs.insert(
825           cast<VarDecl>(cast<DeclRefExpr>(C)->getDecl())->getCanonicalDecl());
826     }
827   }
828   llvm::DenseSet<const VarDecl *> AlreadyEmittedVars;
829   for (const auto *C : D.getClausesOfKind<OMPLastprivateClause>()) {
830     HasAtLeastOneLastprivate = true;
831     if (isOpenMPTaskLoopDirective(D.getDirectiveKind()))
832       break;
833     auto IRef = C->varlist_begin();
834     auto IDestRef = C->destination_exprs().begin();
835     for (auto *IInit : C->private_copies()) {
836       // Keep the address of the original variable for future update at the end
837       // of the loop.
838       auto *OrigVD = cast<VarDecl>(cast<DeclRefExpr>(*IRef)->getDecl());
839       // Taskloops do not require additional initialization, it is done in
840       // runtime support library.
841       if (AlreadyEmittedVars.insert(OrigVD->getCanonicalDecl()).second) {
842         auto *DestVD = cast<VarDecl>(cast<DeclRefExpr>(*IDestRef)->getDecl());
843         PrivateScope.addPrivate(DestVD, [this, OrigVD, IRef]() -> Address {
844           DeclRefExpr DRE(
845               const_cast<VarDecl *>(OrigVD),
846               /*RefersToEnclosingVariableOrCapture=*/CapturedStmtInfo->lookup(
847                   OrigVD) != nullptr,
848               (*IRef)->getType(), VK_LValue, (*IRef)->getExprLoc());
849           return EmitLValue(&DRE).getAddress();
850         });
851         // Check if the variable is also a firstprivate: in this case IInit is
852         // not generated. Initialization of this variable will happen in codegen
853         // for 'firstprivate' clause.
854         if (IInit && !SIMDLCVs.count(OrigVD->getCanonicalDecl())) {
855           auto *VD = cast<VarDecl>(cast<DeclRefExpr>(IInit)->getDecl());
856           bool IsRegistered = PrivateScope.addPrivate(OrigVD, [&]() -> Address {
857             // Emit private VarDecl with copy init.
858             EmitDecl(*VD);
859             return GetAddrOfLocalVar(VD);
860           });
861           assert(IsRegistered &&
862                  "lastprivate var already registered as private");
863           (void)IsRegistered;
864         }
865       }
866       ++IRef;
867       ++IDestRef;
868     }
869   }
870   return HasAtLeastOneLastprivate;
871 }
872 
873 void CodeGenFunction::EmitOMPLastprivateClauseFinal(
874     const OMPExecutableDirective &D, bool NoFinals,
875     llvm::Value *IsLastIterCond) {
876   if (!HaveInsertPoint())
877     return;
878   // Emit following code:
879   // if (<IsLastIterCond>) {
880   //   orig_var1 = private_orig_var1;
881   //   ...
882   //   orig_varn = private_orig_varn;
883   // }
884   llvm::BasicBlock *ThenBB = nullptr;
885   llvm::BasicBlock *DoneBB = nullptr;
886   if (IsLastIterCond) {
887     ThenBB = createBasicBlock(".omp.lastprivate.then");
888     DoneBB = createBasicBlock(".omp.lastprivate.done");
889     Builder.CreateCondBr(IsLastIterCond, ThenBB, DoneBB);
890     EmitBlock(ThenBB);
891   }
892   llvm::DenseSet<const VarDecl *> AlreadyEmittedVars;
893   llvm::DenseMap<const VarDecl *, const Expr *> LoopCountersAndUpdates;
894   if (auto *LoopDirective = dyn_cast<OMPLoopDirective>(&D)) {
895     auto IC = LoopDirective->counters().begin();
896     for (auto F : LoopDirective->finals()) {
897       auto *D =
898           cast<VarDecl>(cast<DeclRefExpr>(*IC)->getDecl())->getCanonicalDecl();
899       if (NoFinals)
900         AlreadyEmittedVars.insert(D);
901       else
902         LoopCountersAndUpdates[D] = F;
903       ++IC;
904     }
905   }
906   for (const auto *C : D.getClausesOfKind<OMPLastprivateClause>()) {
907     auto IRef = C->varlist_begin();
908     auto ISrcRef = C->source_exprs().begin();
909     auto IDestRef = C->destination_exprs().begin();
910     for (auto *AssignOp : C->assignment_ops()) {
911       auto *PrivateVD = cast<VarDecl>(cast<DeclRefExpr>(*IRef)->getDecl());
912       QualType Type = PrivateVD->getType();
913       auto *CanonicalVD = PrivateVD->getCanonicalDecl();
914       if (AlreadyEmittedVars.insert(CanonicalVD).second) {
915         // If lastprivate variable is a loop control variable for loop-based
916         // directive, update its value before copyin back to original
917         // variable.
918         if (auto *FinalExpr = LoopCountersAndUpdates.lookup(CanonicalVD))
919           EmitIgnoredExpr(FinalExpr);
920         auto *SrcVD = cast<VarDecl>(cast<DeclRefExpr>(*ISrcRef)->getDecl());
921         auto *DestVD = cast<VarDecl>(cast<DeclRefExpr>(*IDestRef)->getDecl());
922         // Get the address of the original variable.
923         Address OriginalAddr = GetAddrOfLocalVar(DestVD);
924         // Get the address of the private variable.
925         Address PrivateAddr = GetAddrOfLocalVar(PrivateVD);
926         if (auto RefTy = PrivateVD->getType()->getAs<ReferenceType>())
927           PrivateAddr =
928               Address(Builder.CreateLoad(PrivateAddr),
929                       getNaturalTypeAlignment(RefTy->getPointeeType()));
930         EmitOMPCopy(Type, OriginalAddr, PrivateAddr, DestVD, SrcVD, AssignOp);
931       }
932       ++IRef;
933       ++ISrcRef;
934       ++IDestRef;
935     }
936     if (auto *PostUpdate = C->getPostUpdateExpr())
937       EmitIgnoredExpr(PostUpdate);
938   }
939   if (IsLastIterCond)
940     EmitBlock(DoneBB, /*IsFinished=*/true);
941 }
942 
943 void CodeGenFunction::EmitOMPReductionClauseInit(
944     const OMPExecutableDirective &D,
945     CodeGenFunction::OMPPrivateScope &PrivateScope) {
946   if (!HaveInsertPoint())
947     return;
948   SmallVector<const Expr *, 4> Shareds;
949   SmallVector<const Expr *, 4> Privates;
950   SmallVector<const Expr *, 4> ReductionOps;
951   SmallVector<const Expr *, 4> LHSs;
952   SmallVector<const Expr *, 4> RHSs;
953   for (const auto *C : D.getClausesOfKind<OMPReductionClause>()) {
954     auto IPriv = C->privates().begin();
955     auto IRed = C->reduction_ops().begin();
956     auto ILHS = C->lhs_exprs().begin();
957     auto IRHS = C->rhs_exprs().begin();
958     for (const auto *Ref : C->varlists()) {
959       Shareds.emplace_back(Ref);
960       Privates.emplace_back(*IPriv);
961       ReductionOps.emplace_back(*IRed);
962       LHSs.emplace_back(*ILHS);
963       RHSs.emplace_back(*IRHS);
964       std::advance(IPriv, 1);
965       std::advance(IRed, 1);
966       std::advance(ILHS, 1);
967       std::advance(IRHS, 1);
968     }
969   }
970   ReductionCodeGen RedCG(Shareds, Privates, ReductionOps);
971   unsigned Count = 0;
972   auto ILHS = LHSs.begin();
973   auto IRHS = RHSs.begin();
974   auto IPriv = Privates.begin();
975   for (const auto *IRef : Shareds) {
976     auto *PrivateVD = cast<VarDecl>(cast<DeclRefExpr>(*IPriv)->getDecl());
977     // Emit private VarDecl with reduction init.
978     RedCG.emitSharedLValue(*this, Count);
979     RedCG.emitAggregateType(*this, Count);
980     auto Emission = EmitAutoVarAlloca(*PrivateVD);
981     RedCG.emitInitialization(*this, Count, Emission.getAllocatedAddress(),
982                              RedCG.getSharedLValue(Count),
983                              [&Emission](CodeGenFunction &CGF) {
984                                CGF.EmitAutoVarInit(Emission);
985                                return true;
986                              });
987     EmitAutoVarCleanups(Emission);
988     Address BaseAddr = RedCG.adjustPrivateAddress(
989         *this, Count, Emission.getAllocatedAddress());
990     bool IsRegistered = PrivateScope.addPrivate(
991         RedCG.getBaseDecl(Count), [BaseAddr]() -> Address { return BaseAddr; });
992     assert(IsRegistered && "private var already registered as private");
993     // Silence the warning about unused variable.
994     (void)IsRegistered;
995 
996     auto *LHSVD = cast<VarDecl>(cast<DeclRefExpr>(*ILHS)->getDecl());
997     auto *RHSVD = cast<VarDecl>(cast<DeclRefExpr>(*IRHS)->getDecl());
998     if (isa<OMPArraySectionExpr>(IRef)) {
999       // Store the address of the original variable associated with the LHS
1000       // implicit variable.
1001       PrivateScope.addPrivate(LHSVD, [&RedCG, Count]() -> Address {
1002         return RedCG.getSharedLValue(Count).getAddress();
1003       });
1004       PrivateScope.addPrivate(RHSVD, [this, PrivateVD]() -> Address {
1005         return GetAddrOfLocalVar(PrivateVD);
1006       });
1007     } else if (isa<ArraySubscriptExpr>(IRef)) {
1008       // Store the address of the original variable associated with the LHS
1009       // implicit variable.
1010       PrivateScope.addPrivate(LHSVD, [&RedCG, Count]() -> Address {
1011         return RedCG.getSharedLValue(Count).getAddress();
1012       });
1013       PrivateScope.addPrivate(RHSVD, [this, PrivateVD, RHSVD]() -> Address {
1014         return Builder.CreateElementBitCast(GetAddrOfLocalVar(PrivateVD),
1015                                             ConvertTypeForMem(RHSVD->getType()),
1016                                             "rhs.begin");
1017       });
1018     } else {
1019       QualType Type = PrivateVD->getType();
1020       bool IsArray = getContext().getAsArrayType(Type) != nullptr;
1021       Address OriginalAddr = RedCG.getSharedLValue(Count).getAddress();
1022       // Store the address of the original variable associated with the LHS
1023       // implicit variable.
1024       if (IsArray) {
1025         OriginalAddr = Builder.CreateElementBitCast(
1026             OriginalAddr, ConvertTypeForMem(LHSVD->getType()), "lhs.begin");
1027       }
1028       PrivateScope.addPrivate(
1029           LHSVD, [OriginalAddr]() -> Address { return OriginalAddr; });
1030       PrivateScope.addPrivate(
1031           RHSVD, [this, PrivateVD, RHSVD, IsArray]() -> Address {
1032             return IsArray
1033                        ? Builder.CreateElementBitCast(
1034                              GetAddrOfLocalVar(PrivateVD),
1035                              ConvertTypeForMem(RHSVD->getType()), "rhs.begin")
1036                        : GetAddrOfLocalVar(PrivateVD);
1037           });
1038     }
1039     ++ILHS;
1040     ++IRHS;
1041     ++IPriv;
1042     ++Count;
1043   }
1044 }
1045 
1046 void CodeGenFunction::EmitOMPReductionClauseFinal(
1047     const OMPExecutableDirective &D, const OpenMPDirectiveKind ReductionKind) {
1048   if (!HaveInsertPoint())
1049     return;
1050   llvm::SmallVector<const Expr *, 8> Privates;
1051   llvm::SmallVector<const Expr *, 8> LHSExprs;
1052   llvm::SmallVector<const Expr *, 8> RHSExprs;
1053   llvm::SmallVector<const Expr *, 8> ReductionOps;
1054   bool HasAtLeastOneReduction = false;
1055   for (const auto *C : D.getClausesOfKind<OMPReductionClause>()) {
1056     HasAtLeastOneReduction = true;
1057     Privates.append(C->privates().begin(), C->privates().end());
1058     LHSExprs.append(C->lhs_exprs().begin(), C->lhs_exprs().end());
1059     RHSExprs.append(C->rhs_exprs().begin(), C->rhs_exprs().end());
1060     ReductionOps.append(C->reduction_ops().begin(), C->reduction_ops().end());
1061   }
1062   if (HasAtLeastOneReduction) {
1063     bool WithNowait = D.getSingleClause<OMPNowaitClause>() ||
1064                       isOpenMPParallelDirective(D.getDirectiveKind()) ||
1065                       D.getDirectiveKind() == OMPD_simd;
1066     bool SimpleReduction = D.getDirectiveKind() == OMPD_simd;
1067     // Emit nowait reduction if nowait clause is present or directive is a
1068     // parallel directive (it always has implicit barrier).
1069     CGM.getOpenMPRuntime().emitReduction(
1070         *this, D.getLocEnd(), Privates, LHSExprs, RHSExprs, ReductionOps,
1071         {WithNowait, SimpleReduction, ReductionKind});
1072   }
1073 }
1074 
1075 static void emitPostUpdateForReductionClause(
1076     CodeGenFunction &CGF, const OMPExecutableDirective &D,
1077     const llvm::function_ref<llvm::Value *(CodeGenFunction &)> &CondGen) {
1078   if (!CGF.HaveInsertPoint())
1079     return;
1080   llvm::BasicBlock *DoneBB = nullptr;
1081   for (const auto *C : D.getClausesOfKind<OMPReductionClause>()) {
1082     if (auto *PostUpdate = C->getPostUpdateExpr()) {
1083       if (!DoneBB) {
1084         if (auto *Cond = CondGen(CGF)) {
1085           // If the first post-update expression is found, emit conditional
1086           // block if it was requested.
1087           auto *ThenBB = CGF.createBasicBlock(".omp.reduction.pu");
1088           DoneBB = CGF.createBasicBlock(".omp.reduction.pu.done");
1089           CGF.Builder.CreateCondBr(Cond, ThenBB, DoneBB);
1090           CGF.EmitBlock(ThenBB);
1091         }
1092       }
1093       CGF.EmitIgnoredExpr(PostUpdate);
1094     }
1095   }
1096   if (DoneBB)
1097     CGF.EmitBlock(DoneBB, /*IsFinished=*/true);
1098 }
1099 
1100 namespace {
1101 /// Codegen lambda for appending distribute lower and upper bounds to outlined
1102 /// parallel function. This is necessary for combined constructs such as
1103 /// 'distribute parallel for'
1104 typedef llvm::function_ref<void(CodeGenFunction &,
1105                                 const OMPExecutableDirective &,
1106                                 llvm::SmallVectorImpl<llvm::Value *> &)>
1107     CodeGenBoundParametersTy;
1108 } // anonymous namespace
1109 
1110 static void emitCommonOMPParallelDirective(
1111     CodeGenFunction &CGF, const OMPExecutableDirective &S,
1112     OpenMPDirectiveKind InnermostKind, const RegionCodeGenTy &CodeGen,
1113     const CodeGenBoundParametersTy &CodeGenBoundParameters) {
1114   const CapturedStmt *CS = S.getCapturedStmt(OMPD_parallel);
1115   auto OutlinedFn = CGF.CGM.getOpenMPRuntime().emitParallelOutlinedFunction(
1116       S, *CS->getCapturedDecl()->param_begin(), InnermostKind, CodeGen);
1117   if (const auto *NumThreadsClause = S.getSingleClause<OMPNumThreadsClause>()) {
1118     CodeGenFunction::RunCleanupsScope NumThreadsScope(CGF);
1119     auto NumThreads = CGF.EmitScalarExpr(NumThreadsClause->getNumThreads(),
1120                                          /*IgnoreResultAssign*/ true);
1121     CGF.CGM.getOpenMPRuntime().emitNumThreadsClause(
1122         CGF, NumThreads, NumThreadsClause->getLocStart());
1123   }
1124   if (const auto *ProcBindClause = S.getSingleClause<OMPProcBindClause>()) {
1125     CodeGenFunction::RunCleanupsScope ProcBindScope(CGF);
1126     CGF.CGM.getOpenMPRuntime().emitProcBindClause(
1127         CGF, ProcBindClause->getProcBindKind(), ProcBindClause->getLocStart());
1128   }
1129   const Expr *IfCond = nullptr;
1130   for (const auto *C : S.getClausesOfKind<OMPIfClause>()) {
1131     if (C->getNameModifier() == OMPD_unknown ||
1132         C->getNameModifier() == OMPD_parallel) {
1133       IfCond = C->getCondition();
1134       break;
1135     }
1136   }
1137 
1138   OMPParallelScope Scope(CGF, S);
1139   llvm::SmallVector<llvm::Value *, 16> CapturedVars;
1140   // Combining 'distribute' with 'for' requires sharing each 'distribute' chunk
1141   // lower and upper bounds with the pragma 'for' chunking mechanism.
1142   // The following lambda takes care of appending the lower and upper bound
1143   // parameters when necessary
1144   CodeGenBoundParameters(CGF, S, CapturedVars);
1145   CGF.GenerateOpenMPCapturedVars(*CS, CapturedVars);
1146   CGF.CGM.getOpenMPRuntime().emitParallelCall(CGF, S.getLocStart(), OutlinedFn,
1147                                               CapturedVars, IfCond);
1148 }
1149 
1150 static void emitEmptyBoundParameters(CodeGenFunction &,
1151                                      const OMPExecutableDirective &,
1152                                      llvm::SmallVectorImpl<llvm::Value *> &) {}
1153 
1154 void CodeGenFunction::EmitOMPParallelDirective(const OMPParallelDirective &S) {
1155   // Emit parallel region as a standalone region.
1156   auto &&CodeGen = [&S](CodeGenFunction &CGF, PrePostActionTy &) {
1157     OMPPrivateScope PrivateScope(CGF);
1158     bool Copyins = CGF.EmitOMPCopyinClause(S);
1159     (void)CGF.EmitOMPFirstprivateClause(S, PrivateScope);
1160     if (Copyins) {
1161       // Emit implicit barrier to synchronize threads and avoid data races on
1162       // propagation master's thread values of threadprivate variables to local
1163       // instances of that variables of all other implicit threads.
1164       CGF.CGM.getOpenMPRuntime().emitBarrierCall(
1165           CGF, S.getLocStart(), OMPD_unknown, /*EmitChecks=*/false,
1166           /*ForceSimpleCall=*/true);
1167     }
1168     CGF.EmitOMPPrivateClause(S, PrivateScope);
1169     CGF.EmitOMPReductionClauseInit(S, PrivateScope);
1170     (void)PrivateScope.Privatize();
1171     CGF.EmitStmt(cast<CapturedStmt>(S.getAssociatedStmt())->getCapturedStmt());
1172     CGF.EmitOMPReductionClauseFinal(S, /*ReductionKind=*/OMPD_parallel);
1173   };
1174   emitCommonOMPParallelDirective(*this, S, OMPD_parallel, CodeGen,
1175                                  emitEmptyBoundParameters);
1176   emitPostUpdateForReductionClause(
1177       *this, S, [](CodeGenFunction &) -> llvm::Value * { return nullptr; });
1178 }
1179 
1180 void CodeGenFunction::EmitOMPLoopBody(const OMPLoopDirective &D,
1181                                       JumpDest LoopExit) {
1182   RunCleanupsScope BodyScope(*this);
1183   // Update counters values on current iteration.
1184   for (auto I : D.updates()) {
1185     EmitIgnoredExpr(I);
1186   }
1187   // Update the linear variables.
1188   for (const auto *C : D.getClausesOfKind<OMPLinearClause>()) {
1189     for (auto *U : C->updates())
1190       EmitIgnoredExpr(U);
1191   }
1192 
1193   // On a continue in the body, jump to the end.
1194   auto Continue = getJumpDestInCurrentScope("omp.body.continue");
1195   BreakContinueStack.push_back(BreakContinue(LoopExit, Continue));
1196   // Emit loop body.
1197   EmitStmt(D.getBody());
1198   // The end (updates/cleanups).
1199   EmitBlock(Continue.getBlock());
1200   BreakContinueStack.pop_back();
1201 }
1202 
1203 void CodeGenFunction::EmitOMPInnerLoop(
1204     const Stmt &S, bool RequiresCleanup, const Expr *LoopCond,
1205     const Expr *IncExpr,
1206     const llvm::function_ref<void(CodeGenFunction &)> &BodyGen,
1207     const llvm::function_ref<void(CodeGenFunction &)> &PostIncGen) {
1208   auto LoopExit = getJumpDestInCurrentScope("omp.inner.for.end");
1209 
1210   // Start the loop with a block that tests the condition.
1211   auto CondBlock = createBasicBlock("omp.inner.for.cond");
1212   EmitBlock(CondBlock);
1213   const SourceRange &R = S.getSourceRange();
1214   LoopStack.push(CondBlock, SourceLocToDebugLoc(R.getBegin()),
1215                  SourceLocToDebugLoc(R.getEnd()));
1216 
1217   // If there are any cleanups between here and the loop-exit scope,
1218   // create a block to stage a loop exit along.
1219   auto ExitBlock = LoopExit.getBlock();
1220   if (RequiresCleanup)
1221     ExitBlock = createBasicBlock("omp.inner.for.cond.cleanup");
1222 
1223   auto LoopBody = createBasicBlock("omp.inner.for.body");
1224 
1225   // Emit condition.
1226   EmitBranchOnBoolExpr(LoopCond, LoopBody, ExitBlock, getProfileCount(&S));
1227   if (ExitBlock != LoopExit.getBlock()) {
1228     EmitBlock(ExitBlock);
1229     EmitBranchThroughCleanup(LoopExit);
1230   }
1231 
1232   EmitBlock(LoopBody);
1233   incrementProfileCounter(&S);
1234 
1235   // Create a block for the increment.
1236   auto Continue = getJumpDestInCurrentScope("omp.inner.for.inc");
1237   BreakContinueStack.push_back(BreakContinue(LoopExit, Continue));
1238 
1239   BodyGen(*this);
1240 
1241   // Emit "IV = IV + 1" and a back-edge to the condition block.
1242   EmitBlock(Continue.getBlock());
1243   EmitIgnoredExpr(IncExpr);
1244   PostIncGen(*this);
1245   BreakContinueStack.pop_back();
1246   EmitBranch(CondBlock);
1247   LoopStack.pop();
1248   // Emit the fall-through block.
1249   EmitBlock(LoopExit.getBlock());
1250 }
1251 
1252 bool CodeGenFunction::EmitOMPLinearClauseInit(const OMPLoopDirective &D) {
1253   if (!HaveInsertPoint())
1254     return false;
1255   // Emit inits for the linear variables.
1256   bool HasLinears = false;
1257   for (const auto *C : D.getClausesOfKind<OMPLinearClause>()) {
1258     for (auto *Init : C->inits()) {
1259       HasLinears = true;
1260       auto *VD = cast<VarDecl>(cast<DeclRefExpr>(Init)->getDecl());
1261       if (auto *Ref = dyn_cast<DeclRefExpr>(VD->getInit()->IgnoreImpCasts())) {
1262         AutoVarEmission Emission = EmitAutoVarAlloca(*VD);
1263         auto *OrigVD = cast<VarDecl>(Ref->getDecl());
1264         DeclRefExpr DRE(const_cast<VarDecl *>(OrigVD),
1265                         CapturedStmtInfo->lookup(OrigVD) != nullptr,
1266                         VD->getInit()->getType(), VK_LValue,
1267                         VD->getInit()->getExprLoc());
1268         EmitExprAsInit(&DRE, VD, MakeAddrLValue(Emission.getAllocatedAddress(),
1269                                                 VD->getType()),
1270                        /*capturedByInit=*/false);
1271         EmitAutoVarCleanups(Emission);
1272       } else
1273         EmitVarDecl(*VD);
1274     }
1275     // Emit the linear steps for the linear clauses.
1276     // If a step is not constant, it is pre-calculated before the loop.
1277     if (auto CS = cast_or_null<BinaryOperator>(C->getCalcStep()))
1278       if (auto SaveRef = cast<DeclRefExpr>(CS->getLHS())) {
1279         EmitVarDecl(*cast<VarDecl>(SaveRef->getDecl()));
1280         // Emit calculation of the linear step.
1281         EmitIgnoredExpr(CS);
1282       }
1283   }
1284   return HasLinears;
1285 }
1286 
1287 void CodeGenFunction::EmitOMPLinearClauseFinal(
1288     const OMPLoopDirective &D,
1289     const llvm::function_ref<llvm::Value *(CodeGenFunction &)> &CondGen) {
1290   if (!HaveInsertPoint())
1291     return;
1292   llvm::BasicBlock *DoneBB = nullptr;
1293   // Emit the final values of the linear variables.
1294   for (const auto *C : D.getClausesOfKind<OMPLinearClause>()) {
1295     auto IC = C->varlist_begin();
1296     for (auto *F : C->finals()) {
1297       if (!DoneBB) {
1298         if (auto *Cond = CondGen(*this)) {
1299           // If the first post-update expression is found, emit conditional
1300           // block if it was requested.
1301           auto *ThenBB = createBasicBlock(".omp.linear.pu");
1302           DoneBB = createBasicBlock(".omp.linear.pu.done");
1303           Builder.CreateCondBr(Cond, ThenBB, DoneBB);
1304           EmitBlock(ThenBB);
1305         }
1306       }
1307       auto *OrigVD = cast<VarDecl>(cast<DeclRefExpr>(*IC)->getDecl());
1308       DeclRefExpr DRE(const_cast<VarDecl *>(OrigVD),
1309                       CapturedStmtInfo->lookup(OrigVD) != nullptr,
1310                       (*IC)->getType(), VK_LValue, (*IC)->getExprLoc());
1311       Address OrigAddr = EmitLValue(&DRE).getAddress();
1312       CodeGenFunction::OMPPrivateScope VarScope(*this);
1313       VarScope.addPrivate(OrigVD, [OrigAddr]() -> Address { return OrigAddr; });
1314       (void)VarScope.Privatize();
1315       EmitIgnoredExpr(F);
1316       ++IC;
1317     }
1318     if (auto *PostUpdate = C->getPostUpdateExpr())
1319       EmitIgnoredExpr(PostUpdate);
1320   }
1321   if (DoneBB)
1322     EmitBlock(DoneBB, /*IsFinished=*/true);
1323 }
1324 
1325 static void emitAlignedClause(CodeGenFunction &CGF,
1326                               const OMPExecutableDirective &D) {
1327   if (!CGF.HaveInsertPoint())
1328     return;
1329   for (const auto *Clause : D.getClausesOfKind<OMPAlignedClause>()) {
1330     unsigned ClauseAlignment = 0;
1331     if (auto AlignmentExpr = Clause->getAlignment()) {
1332       auto AlignmentCI =
1333           cast<llvm::ConstantInt>(CGF.EmitScalarExpr(AlignmentExpr));
1334       ClauseAlignment = static_cast<unsigned>(AlignmentCI->getZExtValue());
1335     }
1336     for (auto E : Clause->varlists()) {
1337       unsigned Alignment = ClauseAlignment;
1338       if (Alignment == 0) {
1339         // OpenMP [2.8.1, Description]
1340         // If no optional parameter is specified, implementation-defined default
1341         // alignments for SIMD instructions on the target platforms are assumed.
1342         Alignment =
1343             CGF.getContext()
1344                 .toCharUnitsFromBits(CGF.getContext().getOpenMPDefaultSimdAlign(
1345                     E->getType()->getPointeeType()))
1346                 .getQuantity();
1347       }
1348       assert((Alignment == 0 || llvm::isPowerOf2_32(Alignment)) &&
1349              "alignment is not power of 2");
1350       if (Alignment != 0) {
1351         llvm::Value *PtrValue = CGF.EmitScalarExpr(E);
1352         CGF.EmitAlignmentAssumption(PtrValue, Alignment);
1353       }
1354     }
1355   }
1356 }
1357 
1358 void CodeGenFunction::EmitOMPPrivateLoopCounters(
1359     const OMPLoopDirective &S, CodeGenFunction::OMPPrivateScope &LoopScope) {
1360   if (!HaveInsertPoint())
1361     return;
1362   auto I = S.private_counters().begin();
1363   for (auto *E : S.counters()) {
1364     auto *VD = cast<VarDecl>(cast<DeclRefExpr>(E)->getDecl());
1365     auto *PrivateVD = cast<VarDecl>(cast<DeclRefExpr>(*I)->getDecl());
1366     (void)LoopScope.addPrivate(VD, [&]() -> Address {
1367       // Emit var without initialization.
1368       if (!LocalDeclMap.count(PrivateVD)) {
1369         auto VarEmission = EmitAutoVarAlloca(*PrivateVD);
1370         EmitAutoVarCleanups(VarEmission);
1371       }
1372       DeclRefExpr DRE(const_cast<VarDecl *>(PrivateVD),
1373                       /*RefersToEnclosingVariableOrCapture=*/false,
1374                       (*I)->getType(), VK_LValue, (*I)->getExprLoc());
1375       return EmitLValue(&DRE).getAddress();
1376     });
1377     if (LocalDeclMap.count(VD) || CapturedStmtInfo->lookup(VD) ||
1378         VD->hasGlobalStorage()) {
1379       (void)LoopScope.addPrivate(PrivateVD, [&]() -> Address {
1380         DeclRefExpr DRE(const_cast<VarDecl *>(VD),
1381                         LocalDeclMap.count(VD) || CapturedStmtInfo->lookup(VD),
1382                         E->getType(), VK_LValue, E->getExprLoc());
1383         return EmitLValue(&DRE).getAddress();
1384       });
1385     }
1386     ++I;
1387   }
1388 }
1389 
1390 static void emitPreCond(CodeGenFunction &CGF, const OMPLoopDirective &S,
1391                         const Expr *Cond, llvm::BasicBlock *TrueBlock,
1392                         llvm::BasicBlock *FalseBlock, uint64_t TrueCount) {
1393   if (!CGF.HaveInsertPoint())
1394     return;
1395   {
1396     CodeGenFunction::OMPPrivateScope PreCondScope(CGF);
1397     CGF.EmitOMPPrivateLoopCounters(S, PreCondScope);
1398     (void)PreCondScope.Privatize();
1399     // Get initial values of real counters.
1400     for (auto I : S.inits()) {
1401       CGF.EmitIgnoredExpr(I);
1402     }
1403   }
1404   // Check that loop is executed at least one time.
1405   CGF.EmitBranchOnBoolExpr(Cond, TrueBlock, FalseBlock, TrueCount);
1406 }
1407 
1408 void CodeGenFunction::EmitOMPLinearClause(
1409     const OMPLoopDirective &D, CodeGenFunction::OMPPrivateScope &PrivateScope) {
1410   if (!HaveInsertPoint())
1411     return;
1412   llvm::DenseSet<const VarDecl *> SIMDLCVs;
1413   if (isOpenMPSimdDirective(D.getDirectiveKind())) {
1414     auto *LoopDirective = cast<OMPLoopDirective>(&D);
1415     for (auto *C : LoopDirective->counters()) {
1416       SIMDLCVs.insert(
1417           cast<VarDecl>(cast<DeclRefExpr>(C)->getDecl())->getCanonicalDecl());
1418     }
1419   }
1420   for (const auto *C : D.getClausesOfKind<OMPLinearClause>()) {
1421     auto CurPrivate = C->privates().begin();
1422     for (auto *E : C->varlists()) {
1423       auto *VD = cast<VarDecl>(cast<DeclRefExpr>(E)->getDecl());
1424       auto *PrivateVD =
1425           cast<VarDecl>(cast<DeclRefExpr>(*CurPrivate)->getDecl());
1426       if (!SIMDLCVs.count(VD->getCanonicalDecl())) {
1427         bool IsRegistered = PrivateScope.addPrivate(VD, [&]() -> Address {
1428           // Emit private VarDecl with copy init.
1429           EmitVarDecl(*PrivateVD);
1430           return GetAddrOfLocalVar(PrivateVD);
1431         });
1432         assert(IsRegistered && "linear var already registered as private");
1433         // Silence the warning about unused variable.
1434         (void)IsRegistered;
1435       } else
1436         EmitVarDecl(*PrivateVD);
1437       ++CurPrivate;
1438     }
1439   }
1440 }
1441 
1442 static void emitSimdlenSafelenClause(CodeGenFunction &CGF,
1443                                      const OMPExecutableDirective &D,
1444                                      bool IsMonotonic) {
1445   if (!CGF.HaveInsertPoint())
1446     return;
1447   if (const auto *C = D.getSingleClause<OMPSimdlenClause>()) {
1448     RValue Len = CGF.EmitAnyExpr(C->getSimdlen(), AggValueSlot::ignored(),
1449                                  /*ignoreResult=*/true);
1450     llvm::ConstantInt *Val = cast<llvm::ConstantInt>(Len.getScalarVal());
1451     CGF.LoopStack.setVectorizeWidth(Val->getZExtValue());
1452     // In presence of finite 'safelen', it may be unsafe to mark all
1453     // the memory instructions parallel, because loop-carried
1454     // dependences of 'safelen' iterations are possible.
1455     if (!IsMonotonic)
1456       CGF.LoopStack.setParallel(!D.getSingleClause<OMPSafelenClause>());
1457   } else if (const auto *C = D.getSingleClause<OMPSafelenClause>()) {
1458     RValue Len = CGF.EmitAnyExpr(C->getSafelen(), AggValueSlot::ignored(),
1459                                  /*ignoreResult=*/true);
1460     llvm::ConstantInt *Val = cast<llvm::ConstantInt>(Len.getScalarVal());
1461     CGF.LoopStack.setVectorizeWidth(Val->getZExtValue());
1462     // In presence of finite 'safelen', it may be unsafe to mark all
1463     // the memory instructions parallel, because loop-carried
1464     // dependences of 'safelen' iterations are possible.
1465     CGF.LoopStack.setParallel(false);
1466   }
1467 }
1468 
1469 void CodeGenFunction::EmitOMPSimdInit(const OMPLoopDirective &D,
1470                                       bool IsMonotonic) {
1471   // Walk clauses and process safelen/lastprivate.
1472   LoopStack.setParallel(!IsMonotonic);
1473   LoopStack.setVectorizeEnable(true);
1474   emitSimdlenSafelenClause(*this, D, IsMonotonic);
1475 }
1476 
1477 void CodeGenFunction::EmitOMPSimdFinal(
1478     const OMPLoopDirective &D,
1479     const llvm::function_ref<llvm::Value *(CodeGenFunction &)> &CondGen) {
1480   if (!HaveInsertPoint())
1481     return;
1482   llvm::BasicBlock *DoneBB = nullptr;
1483   auto IC = D.counters().begin();
1484   auto IPC = D.private_counters().begin();
1485   for (auto F : D.finals()) {
1486     auto *OrigVD = cast<VarDecl>(cast<DeclRefExpr>((*IC))->getDecl());
1487     auto *PrivateVD = cast<VarDecl>(cast<DeclRefExpr>((*IPC))->getDecl());
1488     auto *CED = dyn_cast<OMPCapturedExprDecl>(OrigVD);
1489     if (LocalDeclMap.count(OrigVD) || CapturedStmtInfo->lookup(OrigVD) ||
1490         OrigVD->hasGlobalStorage() || CED) {
1491       if (!DoneBB) {
1492         if (auto *Cond = CondGen(*this)) {
1493           // If the first post-update expression is found, emit conditional
1494           // block if it was requested.
1495           auto *ThenBB = createBasicBlock(".omp.final.then");
1496           DoneBB = createBasicBlock(".omp.final.done");
1497           Builder.CreateCondBr(Cond, ThenBB, DoneBB);
1498           EmitBlock(ThenBB);
1499         }
1500       }
1501       Address OrigAddr = Address::invalid();
1502       if (CED)
1503         OrigAddr = EmitLValue(CED->getInit()->IgnoreImpCasts()).getAddress();
1504       else {
1505         DeclRefExpr DRE(const_cast<VarDecl *>(PrivateVD),
1506                         /*RefersToEnclosingVariableOrCapture=*/false,
1507                         (*IPC)->getType(), VK_LValue, (*IPC)->getExprLoc());
1508         OrigAddr = EmitLValue(&DRE).getAddress();
1509       }
1510       OMPPrivateScope VarScope(*this);
1511       VarScope.addPrivate(OrigVD,
1512                           [OrigAddr]() -> Address { return OrigAddr; });
1513       (void)VarScope.Privatize();
1514       EmitIgnoredExpr(F);
1515     }
1516     ++IC;
1517     ++IPC;
1518   }
1519   if (DoneBB)
1520     EmitBlock(DoneBB, /*IsFinished=*/true);
1521 }
1522 
1523 static void emitOMPLoopBodyWithStopPoint(CodeGenFunction &CGF,
1524                                          const OMPLoopDirective &S,
1525                                          CodeGenFunction::JumpDest LoopExit) {
1526   CGF.EmitOMPLoopBody(S, LoopExit);
1527   CGF.EmitStopPoint(&S);
1528 }
1529 
1530 void CodeGenFunction::EmitOMPSimdDirective(const OMPSimdDirective &S) {
1531   auto &&CodeGen = [&S](CodeGenFunction &CGF, PrePostActionTy &) {
1532     OMPLoopScope PreInitScope(CGF, S);
1533     // if (PreCond) {
1534     //   for (IV in 0..LastIteration) BODY;
1535     //   <Final counter/linear vars updates>;
1536     // }
1537     //
1538 
1539     // Emit: if (PreCond) - begin.
1540     // If the condition constant folds and can be elided, avoid emitting the
1541     // whole loop.
1542     bool CondConstant;
1543     llvm::BasicBlock *ContBlock = nullptr;
1544     if (CGF.ConstantFoldsToSimpleInteger(S.getPreCond(), CondConstant)) {
1545       if (!CondConstant)
1546         return;
1547     } else {
1548       auto *ThenBlock = CGF.createBasicBlock("simd.if.then");
1549       ContBlock = CGF.createBasicBlock("simd.if.end");
1550       emitPreCond(CGF, S, S.getPreCond(), ThenBlock, ContBlock,
1551                   CGF.getProfileCount(&S));
1552       CGF.EmitBlock(ThenBlock);
1553       CGF.incrementProfileCounter(&S);
1554     }
1555 
1556     // Emit the loop iteration variable.
1557     const Expr *IVExpr = S.getIterationVariable();
1558     const VarDecl *IVDecl = cast<VarDecl>(cast<DeclRefExpr>(IVExpr)->getDecl());
1559     CGF.EmitVarDecl(*IVDecl);
1560     CGF.EmitIgnoredExpr(S.getInit());
1561 
1562     // Emit the iterations count variable.
1563     // If it is not a variable, Sema decided to calculate iterations count on
1564     // each iteration (e.g., it is foldable into a constant).
1565     if (auto LIExpr = dyn_cast<DeclRefExpr>(S.getLastIteration())) {
1566       CGF.EmitVarDecl(*cast<VarDecl>(LIExpr->getDecl()));
1567       // Emit calculation of the iterations count.
1568       CGF.EmitIgnoredExpr(S.getCalcLastIteration());
1569     }
1570 
1571     CGF.EmitOMPSimdInit(S);
1572 
1573     emitAlignedClause(CGF, S);
1574     (void)CGF.EmitOMPLinearClauseInit(S);
1575     {
1576       OMPPrivateScope LoopScope(CGF);
1577       CGF.EmitOMPPrivateLoopCounters(S, LoopScope);
1578       CGF.EmitOMPLinearClause(S, LoopScope);
1579       CGF.EmitOMPPrivateClause(S, LoopScope);
1580       CGF.EmitOMPReductionClauseInit(S, LoopScope);
1581       bool HasLastprivateClause =
1582           CGF.EmitOMPLastprivateClauseInit(S, LoopScope);
1583       (void)LoopScope.Privatize();
1584       CGF.EmitOMPInnerLoop(S, LoopScope.requiresCleanups(), S.getCond(),
1585                            S.getInc(),
1586                            [&S](CodeGenFunction &CGF) {
1587                              CGF.EmitOMPLoopBody(S, JumpDest());
1588                              CGF.EmitStopPoint(&S);
1589                            },
1590                            [](CodeGenFunction &) {});
1591       CGF.EmitOMPSimdFinal(
1592           S, [](CodeGenFunction &) -> llvm::Value * { return nullptr; });
1593       // Emit final copy of the lastprivate variables at the end of loops.
1594       if (HasLastprivateClause)
1595         CGF.EmitOMPLastprivateClauseFinal(S, /*NoFinals=*/true);
1596       CGF.EmitOMPReductionClauseFinal(S, /*ReductionKind=*/OMPD_simd);
1597       emitPostUpdateForReductionClause(
1598           CGF, S, [](CodeGenFunction &) -> llvm::Value * { return nullptr; });
1599     }
1600     CGF.EmitOMPLinearClauseFinal(
1601         S, [](CodeGenFunction &) -> llvm::Value * { return nullptr; });
1602     // Emit: if (PreCond) - end.
1603     if (ContBlock) {
1604       CGF.EmitBranch(ContBlock);
1605       CGF.EmitBlock(ContBlock, true);
1606     }
1607   };
1608   OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
1609   CGM.getOpenMPRuntime().emitInlinedDirective(*this, OMPD_simd, CodeGen);
1610 }
1611 
1612 void CodeGenFunction::EmitOMPOuterLoop(
1613     bool DynamicOrOrdered, bool IsMonotonic, const OMPLoopDirective &S,
1614     CodeGenFunction::OMPPrivateScope &LoopScope,
1615     const CodeGenFunction::OMPLoopArguments &LoopArgs,
1616     const CodeGenFunction::CodeGenLoopTy &CodeGenLoop,
1617     const CodeGenFunction::CodeGenOrderedTy &CodeGenOrdered) {
1618   auto &RT = CGM.getOpenMPRuntime();
1619 
1620   const Expr *IVExpr = S.getIterationVariable();
1621   const unsigned IVSize = getContext().getTypeSize(IVExpr->getType());
1622   const bool IVSigned = IVExpr->getType()->hasSignedIntegerRepresentation();
1623 
1624   auto LoopExit = getJumpDestInCurrentScope("omp.dispatch.end");
1625 
1626   // Start the loop with a block that tests the condition.
1627   auto CondBlock = createBasicBlock("omp.dispatch.cond");
1628   EmitBlock(CondBlock);
1629   const SourceRange &R = S.getSourceRange();
1630   LoopStack.push(CondBlock, SourceLocToDebugLoc(R.getBegin()),
1631                  SourceLocToDebugLoc(R.getEnd()));
1632 
1633   llvm::Value *BoolCondVal = nullptr;
1634   if (!DynamicOrOrdered) {
1635     // UB = min(UB, GlobalUB) or
1636     // UB = min(UB, PrevUB) for combined loop sharing constructs (e.g.
1637     // 'distribute parallel for')
1638     EmitIgnoredExpr(LoopArgs.EUB);
1639     // IV = LB
1640     EmitIgnoredExpr(LoopArgs.Init);
1641     // IV < UB
1642     BoolCondVal = EvaluateExprAsBool(LoopArgs.Cond);
1643   } else {
1644     BoolCondVal =
1645         RT.emitForNext(*this, S.getLocStart(), IVSize, IVSigned, LoopArgs.IL,
1646                        LoopArgs.LB, LoopArgs.UB, LoopArgs.ST);
1647   }
1648 
1649   // If there are any cleanups between here and the loop-exit scope,
1650   // create a block to stage a loop exit along.
1651   auto ExitBlock = LoopExit.getBlock();
1652   if (LoopScope.requiresCleanups())
1653     ExitBlock = createBasicBlock("omp.dispatch.cleanup");
1654 
1655   auto LoopBody = createBasicBlock("omp.dispatch.body");
1656   Builder.CreateCondBr(BoolCondVal, LoopBody, ExitBlock);
1657   if (ExitBlock != LoopExit.getBlock()) {
1658     EmitBlock(ExitBlock);
1659     EmitBranchThroughCleanup(LoopExit);
1660   }
1661   EmitBlock(LoopBody);
1662 
1663   // Emit "IV = LB" (in case of static schedule, we have already calculated new
1664   // LB for loop condition and emitted it above).
1665   if (DynamicOrOrdered)
1666     EmitIgnoredExpr(LoopArgs.Init);
1667 
1668   // Create a block for the increment.
1669   auto Continue = getJumpDestInCurrentScope("omp.dispatch.inc");
1670   BreakContinueStack.push_back(BreakContinue(LoopExit, Continue));
1671 
1672   // Generate !llvm.loop.parallel metadata for loads and stores for loops
1673   // with dynamic/guided scheduling and without ordered clause.
1674   if (!isOpenMPSimdDirective(S.getDirectiveKind()))
1675     LoopStack.setParallel(!IsMonotonic);
1676   else
1677     EmitOMPSimdInit(S, IsMonotonic);
1678 
1679   SourceLocation Loc = S.getLocStart();
1680 
1681   // when 'distribute' is not combined with a 'for':
1682   // while (idx <= UB) { BODY; ++idx; }
1683   // when 'distribute' is combined with a 'for'
1684   // (e.g. 'distribute parallel for')
1685   // while (idx <= UB) { <CodeGen rest of pragma>; idx += ST; }
1686   EmitOMPInnerLoop(
1687       S, LoopScope.requiresCleanups(), LoopArgs.Cond, LoopArgs.IncExpr,
1688       [&S, LoopExit, &CodeGenLoop](CodeGenFunction &CGF) {
1689         CodeGenLoop(CGF, S, LoopExit);
1690       },
1691       [IVSize, IVSigned, Loc, &CodeGenOrdered](CodeGenFunction &CGF) {
1692         CodeGenOrdered(CGF, Loc, IVSize, IVSigned);
1693       });
1694 
1695   EmitBlock(Continue.getBlock());
1696   BreakContinueStack.pop_back();
1697   if (!DynamicOrOrdered) {
1698     // Emit "LB = LB + Stride", "UB = UB + Stride".
1699     EmitIgnoredExpr(LoopArgs.NextLB);
1700     EmitIgnoredExpr(LoopArgs.NextUB);
1701   }
1702 
1703   EmitBranch(CondBlock);
1704   LoopStack.pop();
1705   // Emit the fall-through block.
1706   EmitBlock(LoopExit.getBlock());
1707 
1708   // Tell the runtime we are done.
1709   auto &&CodeGen = [DynamicOrOrdered, &S](CodeGenFunction &CGF) {
1710     if (!DynamicOrOrdered)
1711       CGF.CGM.getOpenMPRuntime().emitForStaticFinish(CGF, S.getLocEnd(),
1712                                                      S.getDirectiveKind());
1713   };
1714   OMPCancelStack.emitExit(*this, S.getDirectiveKind(), CodeGen);
1715 }
1716 
1717 void CodeGenFunction::EmitOMPForOuterLoop(
1718     const OpenMPScheduleTy &ScheduleKind, bool IsMonotonic,
1719     const OMPLoopDirective &S, OMPPrivateScope &LoopScope, bool Ordered,
1720     const OMPLoopArguments &LoopArgs,
1721     const CodeGenDispatchBoundsTy &CGDispatchBounds) {
1722   auto &RT = CGM.getOpenMPRuntime();
1723 
1724   // Dynamic scheduling of the outer loop (dynamic, guided, auto, runtime).
1725   const bool DynamicOrOrdered =
1726       Ordered || RT.isDynamic(ScheduleKind.Schedule);
1727 
1728   assert((Ordered ||
1729           !RT.isStaticNonchunked(ScheduleKind.Schedule,
1730                                  LoopArgs.Chunk != nullptr)) &&
1731          "static non-chunked schedule does not need outer loop");
1732 
1733   // Emit outer loop.
1734   //
1735   // OpenMP [2.7.1, Loop Construct, Description, table 2-1]
1736   // When schedule(dynamic,chunk_size) is specified, the iterations are
1737   // distributed to threads in the team in chunks as the threads request them.
1738   // Each thread executes a chunk of iterations, then requests another chunk,
1739   // until no chunks remain to be distributed. Each chunk contains chunk_size
1740   // iterations, except for the last chunk to be distributed, which may have
1741   // fewer iterations. When no chunk_size is specified, it defaults to 1.
1742   //
1743   // When schedule(guided,chunk_size) is specified, the iterations are assigned
1744   // to threads in the team in chunks as the executing threads request them.
1745   // Each thread executes a chunk of iterations, then requests another chunk,
1746   // until no chunks remain to be assigned. For a chunk_size of 1, the size of
1747   // each chunk is proportional to the number of unassigned iterations divided
1748   // by the number of threads in the team, decreasing to 1. For a chunk_size
1749   // with value k (greater than 1), the size of each chunk is determined in the
1750   // same way, with the restriction that the chunks do not contain fewer than k
1751   // iterations (except for the last chunk to be assigned, which may have fewer
1752   // than k iterations).
1753   //
1754   // When schedule(auto) is specified, the decision regarding scheduling is
1755   // delegated to the compiler and/or runtime system. The programmer gives the
1756   // implementation the freedom to choose any possible mapping of iterations to
1757   // threads in the team.
1758   //
1759   // When schedule(runtime) is specified, the decision regarding scheduling is
1760   // deferred until run time, and the schedule and chunk size are taken from the
1761   // run-sched-var ICV. If the ICV is set to auto, the schedule is
1762   // implementation defined
1763   //
1764   // while(__kmpc_dispatch_next(&LB, &UB)) {
1765   //   idx = LB;
1766   //   while (idx <= UB) { BODY; ++idx;
1767   //   __kmpc_dispatch_fini_(4|8)[u](); // For ordered loops only.
1768   //   } // inner loop
1769   // }
1770   //
1771   // OpenMP [2.7.1, Loop Construct, Description, table 2-1]
1772   // When schedule(static, chunk_size) is specified, iterations are divided into
1773   // chunks of size chunk_size, and the chunks are assigned to the threads in
1774   // the team in a round-robin fashion in the order of the thread number.
1775   //
1776   // while(UB = min(UB, GlobalUB), idx = LB, idx < UB) {
1777   //   while (idx <= UB) { BODY; ++idx; } // inner loop
1778   //   LB = LB + ST;
1779   //   UB = UB + ST;
1780   // }
1781   //
1782 
1783   const Expr *IVExpr = S.getIterationVariable();
1784   const unsigned IVSize = getContext().getTypeSize(IVExpr->getType());
1785   const bool IVSigned = IVExpr->getType()->hasSignedIntegerRepresentation();
1786 
1787   if (DynamicOrOrdered) {
1788     auto DispatchBounds = CGDispatchBounds(*this, S, LoopArgs.LB, LoopArgs.UB);
1789     llvm::Value *LBVal = DispatchBounds.first;
1790     llvm::Value *UBVal = DispatchBounds.second;
1791     CGOpenMPRuntime::DispatchRTInput DipatchRTInputValues = {LBVal, UBVal,
1792                                                              LoopArgs.Chunk};
1793     RT.emitForDispatchInit(*this, S.getLocStart(), ScheduleKind, IVSize,
1794                            IVSigned, Ordered, DipatchRTInputValues);
1795   } else {
1796     CGOpenMPRuntime::StaticRTInput StaticInit(
1797         IVSize, IVSigned, Ordered, LoopArgs.IL, LoopArgs.LB, LoopArgs.UB,
1798         LoopArgs.ST, LoopArgs.Chunk);
1799     RT.emitForStaticInit(*this, S.getLocStart(), S.getDirectiveKind(),
1800                          ScheduleKind, StaticInit);
1801   }
1802 
1803   auto &&CodeGenOrdered = [Ordered](CodeGenFunction &CGF, SourceLocation Loc,
1804                                     const unsigned IVSize,
1805                                     const bool IVSigned) {
1806     if (Ordered) {
1807       CGF.CGM.getOpenMPRuntime().emitForOrderedIterationEnd(CGF, Loc, IVSize,
1808                                                             IVSigned);
1809     }
1810   };
1811 
1812   OMPLoopArguments OuterLoopArgs(LoopArgs.LB, LoopArgs.UB, LoopArgs.ST,
1813                                  LoopArgs.IL, LoopArgs.Chunk, LoopArgs.EUB);
1814   OuterLoopArgs.IncExpr = S.getInc();
1815   OuterLoopArgs.Init = S.getInit();
1816   OuterLoopArgs.Cond = S.getCond();
1817   OuterLoopArgs.NextLB = S.getNextLowerBound();
1818   OuterLoopArgs.NextUB = S.getNextUpperBound();
1819   EmitOMPOuterLoop(DynamicOrOrdered, IsMonotonic, S, LoopScope, OuterLoopArgs,
1820                    emitOMPLoopBodyWithStopPoint, CodeGenOrdered);
1821 }
1822 
1823 static void emitEmptyOrdered(CodeGenFunction &, SourceLocation Loc,
1824                              const unsigned IVSize, const bool IVSigned) {}
1825 
1826 void CodeGenFunction::EmitOMPDistributeOuterLoop(
1827     OpenMPDistScheduleClauseKind ScheduleKind, const OMPLoopDirective &S,
1828     OMPPrivateScope &LoopScope, const OMPLoopArguments &LoopArgs,
1829     const CodeGenLoopTy &CodeGenLoopContent) {
1830 
1831   auto &RT = CGM.getOpenMPRuntime();
1832 
1833   // Emit outer loop.
1834   // Same behavior as a OMPForOuterLoop, except that schedule cannot be
1835   // dynamic
1836   //
1837 
1838   const Expr *IVExpr = S.getIterationVariable();
1839   const unsigned IVSize = getContext().getTypeSize(IVExpr->getType());
1840   const bool IVSigned = IVExpr->getType()->hasSignedIntegerRepresentation();
1841 
1842   CGOpenMPRuntime::StaticRTInput StaticInit(
1843       IVSize, IVSigned, /* Ordered = */ false, LoopArgs.IL, LoopArgs.LB,
1844       LoopArgs.UB, LoopArgs.ST, LoopArgs.Chunk);
1845   RT.emitDistributeStaticInit(*this, S.getLocStart(), ScheduleKind, StaticInit);
1846 
1847   // for combined 'distribute' and 'for' the increment expression of distribute
1848   // is store in DistInc. For 'distribute' alone, it is in Inc.
1849   Expr *IncExpr;
1850   if (isOpenMPLoopBoundSharingDirective(S.getDirectiveKind()))
1851     IncExpr = S.getDistInc();
1852   else
1853     IncExpr = S.getInc();
1854 
1855   // this routine is shared by 'omp distribute parallel for' and
1856   // 'omp distribute': select the right EUB expression depending on the
1857   // directive
1858   OMPLoopArguments OuterLoopArgs;
1859   OuterLoopArgs.LB = LoopArgs.LB;
1860   OuterLoopArgs.UB = LoopArgs.UB;
1861   OuterLoopArgs.ST = LoopArgs.ST;
1862   OuterLoopArgs.IL = LoopArgs.IL;
1863   OuterLoopArgs.Chunk = LoopArgs.Chunk;
1864   OuterLoopArgs.EUB = isOpenMPLoopBoundSharingDirective(S.getDirectiveKind())
1865                           ? S.getCombinedEnsureUpperBound()
1866                           : S.getEnsureUpperBound();
1867   OuterLoopArgs.IncExpr = IncExpr;
1868   OuterLoopArgs.Init = isOpenMPLoopBoundSharingDirective(S.getDirectiveKind())
1869                            ? S.getCombinedInit()
1870                            : S.getInit();
1871   OuterLoopArgs.Cond = isOpenMPLoopBoundSharingDirective(S.getDirectiveKind())
1872                            ? S.getCombinedCond()
1873                            : S.getCond();
1874   OuterLoopArgs.NextLB = isOpenMPLoopBoundSharingDirective(S.getDirectiveKind())
1875                              ? S.getCombinedNextLowerBound()
1876                              : S.getNextLowerBound();
1877   OuterLoopArgs.NextUB = isOpenMPLoopBoundSharingDirective(S.getDirectiveKind())
1878                              ? S.getCombinedNextUpperBound()
1879                              : S.getNextUpperBound();
1880 
1881   EmitOMPOuterLoop(/* DynamicOrOrdered = */ false, /* IsMonotonic = */ false, S,
1882                    LoopScope, OuterLoopArgs, CodeGenLoopContent,
1883                    emitEmptyOrdered);
1884 }
1885 
1886 /// Emit a helper variable and return corresponding lvalue.
1887 static LValue EmitOMPHelperVar(CodeGenFunction &CGF,
1888                                const DeclRefExpr *Helper) {
1889   auto VDecl = cast<VarDecl>(Helper->getDecl());
1890   CGF.EmitVarDecl(*VDecl);
1891   return CGF.EmitLValue(Helper);
1892 }
1893 
1894 static std::pair<LValue, LValue>
1895 emitDistributeParallelForInnerBounds(CodeGenFunction &CGF,
1896                                      const OMPExecutableDirective &S) {
1897   const OMPLoopDirective &LS = cast<OMPLoopDirective>(S);
1898   LValue LB =
1899       EmitOMPHelperVar(CGF, cast<DeclRefExpr>(LS.getLowerBoundVariable()));
1900   LValue UB =
1901       EmitOMPHelperVar(CGF, cast<DeclRefExpr>(LS.getUpperBoundVariable()));
1902 
1903   // When composing 'distribute' with 'for' (e.g. as in 'distribute
1904   // parallel for') we need to use the 'distribute'
1905   // chunk lower and upper bounds rather than the whole loop iteration
1906   // space. These are parameters to the outlined function for 'parallel'
1907   // and we copy the bounds of the previous schedule into the
1908   // the current ones.
1909   LValue PrevLB = CGF.EmitLValue(LS.getPrevLowerBoundVariable());
1910   LValue PrevUB = CGF.EmitLValue(LS.getPrevUpperBoundVariable());
1911   llvm::Value *PrevLBVal = CGF.EmitLoadOfScalar(PrevLB, SourceLocation());
1912   PrevLBVal = CGF.EmitScalarConversion(
1913       PrevLBVal, LS.getPrevLowerBoundVariable()->getType(),
1914       LS.getIterationVariable()->getType(), SourceLocation());
1915   llvm::Value *PrevUBVal = CGF.EmitLoadOfScalar(PrevUB, SourceLocation());
1916   PrevUBVal = CGF.EmitScalarConversion(
1917       PrevUBVal, LS.getPrevUpperBoundVariable()->getType(),
1918       LS.getIterationVariable()->getType(), SourceLocation());
1919 
1920   CGF.EmitStoreOfScalar(PrevLBVal, LB);
1921   CGF.EmitStoreOfScalar(PrevUBVal, UB);
1922 
1923   return {LB, UB};
1924 }
1925 
1926 /// if the 'for' loop has a dispatch schedule (e.g. dynamic, guided) then
1927 /// we need to use the LB and UB expressions generated by the worksharing
1928 /// code generation support, whereas in non combined situations we would
1929 /// just emit 0 and the LastIteration expression
1930 /// This function is necessary due to the difference of the LB and UB
1931 /// types for the RT emission routines for 'for_static_init' and
1932 /// 'for_dispatch_init'
1933 static std::pair<llvm::Value *, llvm::Value *>
1934 emitDistributeParallelForDispatchBounds(CodeGenFunction &CGF,
1935                                         const OMPExecutableDirective &S,
1936                                         Address LB, Address UB) {
1937   const OMPLoopDirective &LS = cast<OMPLoopDirective>(S);
1938   const Expr *IVExpr = LS.getIterationVariable();
1939   // when implementing a dynamic schedule for a 'for' combined with a
1940   // 'distribute' (e.g. 'distribute parallel for'), the 'for' loop
1941   // is not normalized as each team only executes its own assigned
1942   // distribute chunk
1943   QualType IteratorTy = IVExpr->getType();
1944   llvm::Value *LBVal = CGF.EmitLoadOfScalar(LB, /*Volatile=*/false, IteratorTy,
1945                                             SourceLocation());
1946   llvm::Value *UBVal = CGF.EmitLoadOfScalar(UB, /*Volatile=*/false, IteratorTy,
1947                                             SourceLocation());
1948   return {LBVal, UBVal};
1949 }
1950 
1951 static void emitDistributeParallelForDistributeInnerBoundParams(
1952     CodeGenFunction &CGF, const OMPExecutableDirective &S,
1953     llvm::SmallVectorImpl<llvm::Value *> &CapturedVars) {
1954   const auto &Dir = cast<OMPLoopDirective>(S);
1955   LValue LB =
1956       CGF.EmitLValue(cast<DeclRefExpr>(Dir.getCombinedLowerBoundVariable()));
1957   auto LBCast = CGF.Builder.CreateIntCast(
1958       CGF.Builder.CreateLoad(LB.getAddress()), CGF.SizeTy, /*isSigned=*/false);
1959   CapturedVars.push_back(LBCast);
1960   LValue UB =
1961       CGF.EmitLValue(cast<DeclRefExpr>(Dir.getCombinedUpperBoundVariable()));
1962 
1963   auto UBCast = CGF.Builder.CreateIntCast(
1964       CGF.Builder.CreateLoad(UB.getAddress()), CGF.SizeTy, /*isSigned=*/false);
1965   CapturedVars.push_back(UBCast);
1966 }
1967 
1968 static void
1969 emitInnerParallelForWhenCombined(CodeGenFunction &CGF,
1970                                  const OMPLoopDirective &S,
1971                                  CodeGenFunction::JumpDest LoopExit) {
1972   auto &&CGInlinedWorksharingLoop = [&S](CodeGenFunction &CGF,
1973                                          PrePostActionTy &) {
1974     CGF.EmitOMPWorksharingLoop(S, S.getPrevEnsureUpperBound(),
1975                                emitDistributeParallelForInnerBounds,
1976                                emitDistributeParallelForDispatchBounds);
1977   };
1978 
1979   emitCommonOMPParallelDirective(
1980       CGF, S, OMPD_for, CGInlinedWorksharingLoop,
1981       emitDistributeParallelForDistributeInnerBoundParams);
1982 }
1983 
1984 void CodeGenFunction::EmitOMPDistributeParallelForDirective(
1985     const OMPDistributeParallelForDirective &S) {
1986   auto &&CodeGen = [&S](CodeGenFunction &CGF, PrePostActionTy &) {
1987     CGF.EmitOMPDistributeLoop(S, emitInnerParallelForWhenCombined,
1988                               S.getDistInc());
1989   };
1990   OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
1991   OMPCancelStackRAII CancelRegion(*this, OMPD_distribute_parallel_for,
1992                                   /*HasCancel=*/false);
1993   CGM.getOpenMPRuntime().emitInlinedDirective(*this, OMPD_distribute, CodeGen,
1994                                               /*HasCancel=*/false);
1995 }
1996 
1997 void CodeGenFunction::EmitOMPDistributeParallelForSimdDirective(
1998     const OMPDistributeParallelForSimdDirective &S) {
1999   OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
2000   CGM.getOpenMPRuntime().emitInlinedDirective(
2001       *this, OMPD_distribute_parallel_for_simd,
2002       [&S](CodeGenFunction &CGF, PrePostActionTy &) {
2003         OMPLoopScope PreInitScope(CGF, S);
2004         CGF.EmitStmt(
2005             cast<CapturedStmt>(S.getAssociatedStmt())->getCapturedStmt());
2006       });
2007 }
2008 
2009 void CodeGenFunction::EmitOMPDistributeSimdDirective(
2010     const OMPDistributeSimdDirective &S) {
2011   OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
2012   CGM.getOpenMPRuntime().emitInlinedDirective(
2013       *this, OMPD_distribute_simd,
2014       [&S](CodeGenFunction &CGF, PrePostActionTy &) {
2015         OMPLoopScope PreInitScope(CGF, S);
2016         CGF.EmitStmt(
2017             cast<CapturedStmt>(S.getAssociatedStmt())->getCapturedStmt());
2018       });
2019 }
2020 
2021 void CodeGenFunction::EmitOMPTargetParallelForSimdDirective(
2022     const OMPTargetParallelForSimdDirective &S) {
2023   OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
2024   CGM.getOpenMPRuntime().emitInlinedDirective(
2025       *this, OMPD_target_parallel_for_simd,
2026       [&S](CodeGenFunction &CGF, PrePostActionTy &) {
2027         OMPLoopScope PreInitScope(CGF, S);
2028         CGF.EmitStmt(
2029             cast<CapturedStmt>(S.getAssociatedStmt())->getCapturedStmt());
2030       });
2031 }
2032 
2033 void CodeGenFunction::EmitOMPTargetSimdDirective(
2034     const OMPTargetSimdDirective &S) {
2035   OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
2036   CGM.getOpenMPRuntime().emitInlinedDirective(
2037       *this, OMPD_target_simd, [&S](CodeGenFunction &CGF, PrePostActionTy &) {
2038         OMPLoopScope PreInitScope(CGF, S);
2039         CGF.EmitStmt(
2040             cast<CapturedStmt>(S.getAssociatedStmt())->getCapturedStmt());
2041       });
2042 }
2043 
2044 void CodeGenFunction::EmitOMPTeamsDistributeSimdDirective(
2045     const OMPTeamsDistributeSimdDirective &S) {
2046   OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
2047   CGM.getOpenMPRuntime().emitInlinedDirective(
2048       *this, OMPD_teams_distribute_simd,
2049       [&S](CodeGenFunction &CGF, PrePostActionTy &) {
2050         OMPLoopScope PreInitScope(CGF, S);
2051         CGF.EmitStmt(
2052             cast<CapturedStmt>(S.getAssociatedStmt())->getCapturedStmt());
2053       });
2054 }
2055 
2056 void CodeGenFunction::EmitOMPTeamsDistributeParallelForSimdDirective(
2057     const OMPTeamsDistributeParallelForSimdDirective &S) {
2058   OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
2059   CGM.getOpenMPRuntime().emitInlinedDirective(
2060       *this, OMPD_teams_distribute_parallel_for_simd,
2061       [&S](CodeGenFunction &CGF, PrePostActionTy &) {
2062         OMPLoopScope PreInitScope(CGF, S);
2063         CGF.EmitStmt(
2064             cast<CapturedStmt>(S.getAssociatedStmt())->getCapturedStmt());
2065       });
2066 }
2067 
2068 void CodeGenFunction::EmitOMPTeamsDistributeParallelForDirective(
2069     const OMPTeamsDistributeParallelForDirective &S) {
2070   OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
2071   CGM.getOpenMPRuntime().emitInlinedDirective(
2072       *this, OMPD_teams_distribute_parallel_for,
2073       [&S](CodeGenFunction &CGF, PrePostActionTy &) {
2074         OMPLoopScope PreInitScope(CGF, S);
2075         CGF.EmitStmt(
2076             cast<CapturedStmt>(S.getAssociatedStmt())->getCapturedStmt());
2077       });
2078 }
2079 
2080 void CodeGenFunction::EmitOMPTargetTeamsDistributeDirective(
2081     const OMPTargetTeamsDistributeDirective &S) {
2082   OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
2083   CGM.getOpenMPRuntime().emitInlinedDirective(
2084       *this, OMPD_target_teams_distribute,
2085       [&S](CodeGenFunction &CGF, PrePostActionTy &) {
2086         CGF.EmitStmt(
2087             cast<CapturedStmt>(S.getAssociatedStmt())->getCapturedStmt());
2088       });
2089 }
2090 
2091 void CodeGenFunction::EmitOMPTargetTeamsDistributeParallelForDirective(
2092     const OMPTargetTeamsDistributeParallelForDirective &S) {
2093   OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
2094   CGM.getOpenMPRuntime().emitInlinedDirective(
2095       *this, OMPD_target_teams_distribute_parallel_for,
2096       [&S](CodeGenFunction &CGF, PrePostActionTy &) {
2097         CGF.EmitStmt(
2098             cast<CapturedStmt>(S.getAssociatedStmt())->getCapturedStmt());
2099       });
2100 }
2101 
2102 void CodeGenFunction::EmitOMPTargetTeamsDistributeParallelForSimdDirective(
2103     const OMPTargetTeamsDistributeParallelForSimdDirective &S) {
2104   OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
2105   CGM.getOpenMPRuntime().emitInlinedDirective(
2106       *this, OMPD_target_teams_distribute_parallel_for_simd,
2107       [&S](CodeGenFunction &CGF, PrePostActionTy &) {
2108         CGF.EmitStmt(
2109             cast<CapturedStmt>(S.getAssociatedStmt())->getCapturedStmt());
2110       });
2111 }
2112 
2113 void CodeGenFunction::EmitOMPTargetTeamsDistributeSimdDirective(
2114     const OMPTargetTeamsDistributeSimdDirective &S) {
2115   OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
2116   CGM.getOpenMPRuntime().emitInlinedDirective(
2117       *this, OMPD_target_teams_distribute_simd,
2118       [&S](CodeGenFunction &CGF, PrePostActionTy &) {
2119         CGF.EmitStmt(
2120             cast<CapturedStmt>(S.getAssociatedStmt())->getCapturedStmt());
2121       });
2122 }
2123 
2124 namespace {
2125   struct ScheduleKindModifiersTy {
2126     OpenMPScheduleClauseKind Kind;
2127     OpenMPScheduleClauseModifier M1;
2128     OpenMPScheduleClauseModifier M2;
2129     ScheduleKindModifiersTy(OpenMPScheduleClauseKind Kind,
2130                             OpenMPScheduleClauseModifier M1,
2131                             OpenMPScheduleClauseModifier M2)
2132         : Kind(Kind), M1(M1), M2(M2) {}
2133   };
2134 } // namespace
2135 
2136 bool CodeGenFunction::EmitOMPWorksharingLoop(
2137     const OMPLoopDirective &S, Expr *EUB,
2138     const CodeGenLoopBoundsTy &CodeGenLoopBounds,
2139     const CodeGenDispatchBoundsTy &CGDispatchBounds) {
2140   // Emit the loop iteration variable.
2141   auto IVExpr = cast<DeclRefExpr>(S.getIterationVariable());
2142   auto IVDecl = cast<VarDecl>(IVExpr->getDecl());
2143   EmitVarDecl(*IVDecl);
2144 
2145   // Emit the iterations count variable.
2146   // If it is not a variable, Sema decided to calculate iterations count on each
2147   // iteration (e.g., it is foldable into a constant).
2148   if (auto LIExpr = dyn_cast<DeclRefExpr>(S.getLastIteration())) {
2149     EmitVarDecl(*cast<VarDecl>(LIExpr->getDecl()));
2150     // Emit calculation of the iterations count.
2151     EmitIgnoredExpr(S.getCalcLastIteration());
2152   }
2153 
2154   auto &RT = CGM.getOpenMPRuntime();
2155 
2156   bool HasLastprivateClause;
2157   // Check pre-condition.
2158   {
2159     OMPLoopScope PreInitScope(*this, S);
2160     // Skip the entire loop if we don't meet the precondition.
2161     // If the condition constant folds and can be elided, avoid emitting the
2162     // whole loop.
2163     bool CondConstant;
2164     llvm::BasicBlock *ContBlock = nullptr;
2165     if (ConstantFoldsToSimpleInteger(S.getPreCond(), CondConstant)) {
2166       if (!CondConstant)
2167         return false;
2168     } else {
2169       auto *ThenBlock = createBasicBlock("omp.precond.then");
2170       ContBlock = createBasicBlock("omp.precond.end");
2171       emitPreCond(*this, S, S.getPreCond(), ThenBlock, ContBlock,
2172                   getProfileCount(&S));
2173       EmitBlock(ThenBlock);
2174       incrementProfileCounter(&S);
2175     }
2176 
2177     bool Ordered = false;
2178     if (auto *OrderedClause = S.getSingleClause<OMPOrderedClause>()) {
2179       if (OrderedClause->getNumForLoops())
2180         RT.emitDoacrossInit(*this, S);
2181       else
2182         Ordered = true;
2183     }
2184 
2185     llvm::DenseSet<const Expr *> EmittedFinals;
2186     emitAlignedClause(*this, S);
2187     bool HasLinears = EmitOMPLinearClauseInit(S);
2188     // Emit helper vars inits.
2189 
2190     std::pair<LValue, LValue> Bounds = CodeGenLoopBounds(*this, S);
2191     LValue LB = Bounds.first;
2192     LValue UB = Bounds.second;
2193     LValue ST =
2194         EmitOMPHelperVar(*this, cast<DeclRefExpr>(S.getStrideVariable()));
2195     LValue IL =
2196         EmitOMPHelperVar(*this, cast<DeclRefExpr>(S.getIsLastIterVariable()));
2197 
2198     // Emit 'then' code.
2199     {
2200       OMPPrivateScope LoopScope(*this);
2201       if (EmitOMPFirstprivateClause(S, LoopScope) || HasLinears) {
2202         // Emit implicit barrier to synchronize threads and avoid data races on
2203         // initialization of firstprivate variables and post-update of
2204         // lastprivate variables.
2205         CGM.getOpenMPRuntime().emitBarrierCall(
2206             *this, S.getLocStart(), OMPD_unknown, /*EmitChecks=*/false,
2207             /*ForceSimpleCall=*/true);
2208       }
2209       EmitOMPPrivateClause(S, LoopScope);
2210       HasLastprivateClause = EmitOMPLastprivateClauseInit(S, LoopScope);
2211       EmitOMPReductionClauseInit(S, LoopScope);
2212       EmitOMPPrivateLoopCounters(S, LoopScope);
2213       EmitOMPLinearClause(S, LoopScope);
2214       (void)LoopScope.Privatize();
2215 
2216       // Detect the loop schedule kind and chunk.
2217       llvm::Value *Chunk = nullptr;
2218       OpenMPScheduleTy ScheduleKind;
2219       if (auto *C = S.getSingleClause<OMPScheduleClause>()) {
2220         ScheduleKind.Schedule = C->getScheduleKind();
2221         ScheduleKind.M1 = C->getFirstScheduleModifier();
2222         ScheduleKind.M2 = C->getSecondScheduleModifier();
2223         if (const auto *Ch = C->getChunkSize()) {
2224           Chunk = EmitScalarExpr(Ch);
2225           Chunk = EmitScalarConversion(Chunk, Ch->getType(),
2226                                        S.getIterationVariable()->getType(),
2227                                        S.getLocStart());
2228         }
2229       }
2230       const unsigned IVSize = getContext().getTypeSize(IVExpr->getType());
2231       const bool IVSigned = IVExpr->getType()->hasSignedIntegerRepresentation();
2232       // OpenMP 4.5, 2.7.1 Loop Construct, Description.
2233       // If the static schedule kind is specified or if the ordered clause is
2234       // specified, and if no monotonic modifier is specified, the effect will
2235       // be as if the monotonic modifier was specified.
2236       if (RT.isStaticNonchunked(ScheduleKind.Schedule,
2237                                 /* Chunked */ Chunk != nullptr) &&
2238           !Ordered) {
2239         if (isOpenMPSimdDirective(S.getDirectiveKind()))
2240           EmitOMPSimdInit(S, /*IsMonotonic=*/true);
2241         // OpenMP [2.7.1, Loop Construct, Description, table 2-1]
2242         // When no chunk_size is specified, the iteration space is divided into
2243         // chunks that are approximately equal in size, and at most one chunk is
2244         // distributed to each thread. Note that the size of the chunks is
2245         // unspecified in this case.
2246         CGOpenMPRuntime::StaticRTInput StaticInit(
2247             IVSize, IVSigned, Ordered, IL.getAddress(), LB.getAddress(),
2248             UB.getAddress(), ST.getAddress());
2249         RT.emitForStaticInit(*this, S.getLocStart(), S.getDirectiveKind(),
2250                              ScheduleKind, StaticInit);
2251         auto LoopExit =
2252             getJumpDestInCurrentScope(createBasicBlock("omp.loop.exit"));
2253         // UB = min(UB, GlobalUB);
2254         EmitIgnoredExpr(S.getEnsureUpperBound());
2255         // IV = LB;
2256         EmitIgnoredExpr(S.getInit());
2257         // while (idx <= UB) { BODY; ++idx; }
2258         EmitOMPInnerLoop(S, LoopScope.requiresCleanups(), S.getCond(),
2259                          S.getInc(),
2260                          [&S, LoopExit](CodeGenFunction &CGF) {
2261                            CGF.EmitOMPLoopBody(S, LoopExit);
2262                            CGF.EmitStopPoint(&S);
2263                          },
2264                          [](CodeGenFunction &) {});
2265         EmitBlock(LoopExit.getBlock());
2266         // Tell the runtime we are done.
2267         auto &&CodeGen = [&S](CodeGenFunction &CGF) {
2268           CGF.CGM.getOpenMPRuntime().emitForStaticFinish(CGF, S.getLocEnd(),
2269                                                          S.getDirectiveKind());
2270         };
2271         OMPCancelStack.emitExit(*this, S.getDirectiveKind(), CodeGen);
2272       } else {
2273         const bool IsMonotonic =
2274             Ordered || ScheduleKind.Schedule == OMPC_SCHEDULE_static ||
2275             ScheduleKind.Schedule == OMPC_SCHEDULE_unknown ||
2276             ScheduleKind.M1 == OMPC_SCHEDULE_MODIFIER_monotonic ||
2277             ScheduleKind.M2 == OMPC_SCHEDULE_MODIFIER_monotonic;
2278         // Emit the outer loop, which requests its work chunk [LB..UB] from
2279         // runtime and runs the inner loop to process it.
2280         const OMPLoopArguments LoopArguments(LB.getAddress(), UB.getAddress(),
2281                                              ST.getAddress(), IL.getAddress(),
2282                                              Chunk, EUB);
2283         EmitOMPForOuterLoop(ScheduleKind, IsMonotonic, S, LoopScope, Ordered,
2284                             LoopArguments, CGDispatchBounds);
2285       }
2286       if (isOpenMPSimdDirective(S.getDirectiveKind())) {
2287         EmitOMPSimdFinal(S,
2288                          [&](CodeGenFunction &CGF) -> llvm::Value * {
2289                            return CGF.Builder.CreateIsNotNull(
2290                                CGF.EmitLoadOfScalar(IL, S.getLocStart()));
2291                          });
2292       }
2293       EmitOMPReductionClauseFinal(
2294           S, /*ReductionKind=*/isOpenMPSimdDirective(S.getDirectiveKind())
2295                  ? /*Parallel and Simd*/ OMPD_parallel_for_simd
2296                  : /*Parallel only*/ OMPD_parallel);
2297       // Emit post-update of the reduction variables if IsLastIter != 0.
2298       emitPostUpdateForReductionClause(
2299           *this, S, [&](CodeGenFunction &CGF) -> llvm::Value * {
2300             return CGF.Builder.CreateIsNotNull(
2301                 CGF.EmitLoadOfScalar(IL, S.getLocStart()));
2302           });
2303       // Emit final copy of the lastprivate variables if IsLastIter != 0.
2304       if (HasLastprivateClause)
2305         EmitOMPLastprivateClauseFinal(
2306             S, isOpenMPSimdDirective(S.getDirectiveKind()),
2307             Builder.CreateIsNotNull(EmitLoadOfScalar(IL, S.getLocStart())));
2308     }
2309     EmitOMPLinearClauseFinal(S, [&](CodeGenFunction &CGF) -> llvm::Value * {
2310       return CGF.Builder.CreateIsNotNull(
2311           CGF.EmitLoadOfScalar(IL, S.getLocStart()));
2312     });
2313     // We're now done with the loop, so jump to the continuation block.
2314     if (ContBlock) {
2315       EmitBranch(ContBlock);
2316       EmitBlock(ContBlock, true);
2317     }
2318   }
2319   return HasLastprivateClause;
2320 }
2321 
2322 /// The following two functions generate expressions for the loop lower
2323 /// and upper bounds in case of static and dynamic (dispatch) schedule
2324 /// of the associated 'for' or 'distribute' loop.
2325 static std::pair<LValue, LValue>
2326 emitForLoopBounds(CodeGenFunction &CGF, const OMPExecutableDirective &S) {
2327   const OMPLoopDirective &LS = cast<OMPLoopDirective>(S);
2328   LValue LB =
2329       EmitOMPHelperVar(CGF, cast<DeclRefExpr>(LS.getLowerBoundVariable()));
2330   LValue UB =
2331       EmitOMPHelperVar(CGF, cast<DeclRefExpr>(LS.getUpperBoundVariable()));
2332   return {LB, UB};
2333 }
2334 
2335 /// When dealing with dispatch schedules (e.g. dynamic, guided) we do not
2336 /// consider the lower and upper bound expressions generated by the
2337 /// worksharing loop support, but we use 0 and the iteration space size as
2338 /// constants
2339 static std::pair<llvm::Value *, llvm::Value *>
2340 emitDispatchForLoopBounds(CodeGenFunction &CGF, const OMPExecutableDirective &S,
2341                           Address LB, Address UB) {
2342   const OMPLoopDirective &LS = cast<OMPLoopDirective>(S);
2343   const Expr *IVExpr = LS.getIterationVariable();
2344   const unsigned IVSize = CGF.getContext().getTypeSize(IVExpr->getType());
2345   llvm::Value *LBVal = CGF.Builder.getIntN(IVSize, 0);
2346   llvm::Value *UBVal = CGF.EmitScalarExpr(LS.getLastIteration());
2347   return {LBVal, UBVal};
2348 }
2349 
2350 void CodeGenFunction::EmitOMPForDirective(const OMPForDirective &S) {
2351   bool HasLastprivates = false;
2352   auto &&CodeGen = [&S, &HasLastprivates](CodeGenFunction &CGF,
2353                                           PrePostActionTy &) {
2354     OMPCancelStackRAII CancelRegion(CGF, OMPD_for, S.hasCancel());
2355     HasLastprivates = CGF.EmitOMPWorksharingLoop(S, S.getEnsureUpperBound(),
2356                                                  emitForLoopBounds,
2357                                                  emitDispatchForLoopBounds);
2358   };
2359   {
2360     OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
2361     CGM.getOpenMPRuntime().emitInlinedDirective(*this, OMPD_for, CodeGen,
2362                                                 S.hasCancel());
2363   }
2364 
2365   // Emit an implicit barrier at the end.
2366   if (!S.getSingleClause<OMPNowaitClause>() || HasLastprivates) {
2367     CGM.getOpenMPRuntime().emitBarrierCall(*this, S.getLocStart(), OMPD_for);
2368   }
2369 }
2370 
2371 void CodeGenFunction::EmitOMPForSimdDirective(const OMPForSimdDirective &S) {
2372   bool HasLastprivates = false;
2373   auto &&CodeGen = [&S, &HasLastprivates](CodeGenFunction &CGF,
2374                                           PrePostActionTy &) {
2375     HasLastprivates = CGF.EmitOMPWorksharingLoop(S, S.getEnsureUpperBound(),
2376                                                  emitForLoopBounds,
2377                                                  emitDispatchForLoopBounds);
2378   };
2379   {
2380     OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
2381     CGM.getOpenMPRuntime().emitInlinedDirective(*this, OMPD_simd, CodeGen);
2382   }
2383 
2384   // Emit an implicit barrier at the end.
2385   if (!S.getSingleClause<OMPNowaitClause>() || HasLastprivates) {
2386     CGM.getOpenMPRuntime().emitBarrierCall(*this, S.getLocStart(), OMPD_for);
2387   }
2388 }
2389 
2390 static LValue createSectionLVal(CodeGenFunction &CGF, QualType Ty,
2391                                 const Twine &Name,
2392                                 llvm::Value *Init = nullptr) {
2393   auto LVal = CGF.MakeAddrLValue(CGF.CreateMemTemp(Ty, Name), Ty);
2394   if (Init)
2395     CGF.EmitStoreThroughLValue(RValue::get(Init), LVal, /*isInit*/ true);
2396   return LVal;
2397 }
2398 
2399 void CodeGenFunction::EmitSections(const OMPExecutableDirective &S) {
2400   auto *Stmt = cast<CapturedStmt>(S.getAssociatedStmt())->getCapturedStmt();
2401   auto *CS = dyn_cast<CompoundStmt>(Stmt);
2402   bool HasLastprivates = false;
2403   auto &&CodeGen = [&S, Stmt, CS, &HasLastprivates](CodeGenFunction &CGF,
2404                                                     PrePostActionTy &) {
2405     auto &C = CGF.CGM.getContext();
2406     auto KmpInt32Ty = C.getIntTypeForBitwidth(/*DestWidth=*/32, /*Signed=*/1);
2407     // Emit helper vars inits.
2408     LValue LB = createSectionLVal(CGF, KmpInt32Ty, ".omp.sections.lb.",
2409                                   CGF.Builder.getInt32(0));
2410     auto *GlobalUBVal = CS != nullptr ? CGF.Builder.getInt32(CS->size() - 1)
2411                                       : CGF.Builder.getInt32(0);
2412     LValue UB =
2413         createSectionLVal(CGF, KmpInt32Ty, ".omp.sections.ub.", GlobalUBVal);
2414     LValue ST = createSectionLVal(CGF, KmpInt32Ty, ".omp.sections.st.",
2415                                   CGF.Builder.getInt32(1));
2416     LValue IL = createSectionLVal(CGF, KmpInt32Ty, ".omp.sections.il.",
2417                                   CGF.Builder.getInt32(0));
2418     // Loop counter.
2419     LValue IV = createSectionLVal(CGF, KmpInt32Ty, ".omp.sections.iv.");
2420     OpaqueValueExpr IVRefExpr(S.getLocStart(), KmpInt32Ty, VK_LValue);
2421     CodeGenFunction::OpaqueValueMapping OpaqueIV(CGF, &IVRefExpr, IV);
2422     OpaqueValueExpr UBRefExpr(S.getLocStart(), KmpInt32Ty, VK_LValue);
2423     CodeGenFunction::OpaqueValueMapping OpaqueUB(CGF, &UBRefExpr, UB);
2424     // Generate condition for loop.
2425     BinaryOperator Cond(&IVRefExpr, &UBRefExpr, BO_LE, C.BoolTy, VK_RValue,
2426                         OK_Ordinary, S.getLocStart(), FPOptions());
2427     // Increment for loop counter.
2428     UnaryOperator Inc(&IVRefExpr, UO_PreInc, KmpInt32Ty, VK_RValue, OK_Ordinary,
2429                       S.getLocStart());
2430     auto BodyGen = [Stmt, CS, &S, &IV](CodeGenFunction &CGF) {
2431       // Iterate through all sections and emit a switch construct:
2432       // switch (IV) {
2433       //   case 0:
2434       //     <SectionStmt[0]>;
2435       //     break;
2436       // ...
2437       //   case <NumSection> - 1:
2438       //     <SectionStmt[<NumSection> - 1]>;
2439       //     break;
2440       // }
2441       // .omp.sections.exit:
2442       auto *ExitBB = CGF.createBasicBlock(".omp.sections.exit");
2443       auto *SwitchStmt = CGF.Builder.CreateSwitch(
2444           CGF.EmitLoadOfLValue(IV, S.getLocStart()).getScalarVal(), ExitBB,
2445           CS == nullptr ? 1 : CS->size());
2446       if (CS) {
2447         unsigned CaseNumber = 0;
2448         for (auto *SubStmt : CS->children()) {
2449           auto CaseBB = CGF.createBasicBlock(".omp.sections.case");
2450           CGF.EmitBlock(CaseBB);
2451           SwitchStmt->addCase(CGF.Builder.getInt32(CaseNumber), CaseBB);
2452           CGF.EmitStmt(SubStmt);
2453           CGF.EmitBranch(ExitBB);
2454           ++CaseNumber;
2455         }
2456       } else {
2457         auto CaseBB = CGF.createBasicBlock(".omp.sections.case");
2458         CGF.EmitBlock(CaseBB);
2459         SwitchStmt->addCase(CGF.Builder.getInt32(0), CaseBB);
2460         CGF.EmitStmt(Stmt);
2461         CGF.EmitBranch(ExitBB);
2462       }
2463       CGF.EmitBlock(ExitBB, /*IsFinished=*/true);
2464     };
2465 
2466     CodeGenFunction::OMPPrivateScope LoopScope(CGF);
2467     if (CGF.EmitOMPFirstprivateClause(S, LoopScope)) {
2468       // Emit implicit barrier to synchronize threads and avoid data races on
2469       // initialization of firstprivate variables and post-update of lastprivate
2470       // variables.
2471       CGF.CGM.getOpenMPRuntime().emitBarrierCall(
2472           CGF, S.getLocStart(), OMPD_unknown, /*EmitChecks=*/false,
2473           /*ForceSimpleCall=*/true);
2474     }
2475     CGF.EmitOMPPrivateClause(S, LoopScope);
2476     HasLastprivates = CGF.EmitOMPLastprivateClauseInit(S, LoopScope);
2477     CGF.EmitOMPReductionClauseInit(S, LoopScope);
2478     (void)LoopScope.Privatize();
2479 
2480     // Emit static non-chunked loop.
2481     OpenMPScheduleTy ScheduleKind;
2482     ScheduleKind.Schedule = OMPC_SCHEDULE_static;
2483     CGOpenMPRuntime::StaticRTInput StaticInit(
2484         /*IVSize=*/32, /*IVSigned=*/true, /*Ordered=*/false, IL.getAddress(),
2485         LB.getAddress(), UB.getAddress(), ST.getAddress());
2486     CGF.CGM.getOpenMPRuntime().emitForStaticInit(
2487         CGF, S.getLocStart(), S.getDirectiveKind(), ScheduleKind, StaticInit);
2488     // UB = min(UB, GlobalUB);
2489     auto *UBVal = CGF.EmitLoadOfScalar(UB, S.getLocStart());
2490     auto *MinUBGlobalUB = CGF.Builder.CreateSelect(
2491         CGF.Builder.CreateICmpSLT(UBVal, GlobalUBVal), UBVal, GlobalUBVal);
2492     CGF.EmitStoreOfScalar(MinUBGlobalUB, UB);
2493     // IV = LB;
2494     CGF.EmitStoreOfScalar(CGF.EmitLoadOfScalar(LB, S.getLocStart()), IV);
2495     // while (idx <= UB) { BODY; ++idx; }
2496     CGF.EmitOMPInnerLoop(S, /*RequiresCleanup=*/false, &Cond, &Inc, BodyGen,
2497                          [](CodeGenFunction &) {});
2498     // Tell the runtime we are done.
2499     auto &&CodeGen = [&S](CodeGenFunction &CGF) {
2500       CGF.CGM.getOpenMPRuntime().emitForStaticFinish(CGF, S.getLocEnd(),
2501                                                      S.getDirectiveKind());
2502     };
2503     CGF.OMPCancelStack.emitExit(CGF, S.getDirectiveKind(), CodeGen);
2504     CGF.EmitOMPReductionClauseFinal(S, /*ReductionKind=*/OMPD_parallel);
2505     // Emit post-update of the reduction variables if IsLastIter != 0.
2506     emitPostUpdateForReductionClause(
2507         CGF, S, [&](CodeGenFunction &CGF) -> llvm::Value * {
2508           return CGF.Builder.CreateIsNotNull(
2509               CGF.EmitLoadOfScalar(IL, S.getLocStart()));
2510         });
2511 
2512     // Emit final copy of the lastprivate variables if IsLastIter != 0.
2513     if (HasLastprivates)
2514       CGF.EmitOMPLastprivateClauseFinal(
2515           S, /*NoFinals=*/false,
2516           CGF.Builder.CreateIsNotNull(
2517               CGF.EmitLoadOfScalar(IL, S.getLocStart())));
2518   };
2519 
2520   bool HasCancel = false;
2521   if (auto *OSD = dyn_cast<OMPSectionsDirective>(&S))
2522     HasCancel = OSD->hasCancel();
2523   else if (auto *OPSD = dyn_cast<OMPParallelSectionsDirective>(&S))
2524     HasCancel = OPSD->hasCancel();
2525   OMPCancelStackRAII CancelRegion(*this, S.getDirectiveKind(), HasCancel);
2526   CGM.getOpenMPRuntime().emitInlinedDirective(*this, OMPD_sections, CodeGen,
2527                                               HasCancel);
2528   // Emit barrier for lastprivates only if 'sections' directive has 'nowait'
2529   // clause. Otherwise the barrier will be generated by the codegen for the
2530   // directive.
2531   if (HasLastprivates && S.getSingleClause<OMPNowaitClause>()) {
2532     // Emit implicit barrier to synchronize threads and avoid data races on
2533     // initialization of firstprivate variables.
2534     CGM.getOpenMPRuntime().emitBarrierCall(*this, S.getLocStart(),
2535                                            OMPD_unknown);
2536   }
2537 }
2538 
2539 void CodeGenFunction::EmitOMPSectionsDirective(const OMPSectionsDirective &S) {
2540   {
2541     OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
2542     EmitSections(S);
2543   }
2544   // Emit an implicit barrier at the end.
2545   if (!S.getSingleClause<OMPNowaitClause>()) {
2546     CGM.getOpenMPRuntime().emitBarrierCall(*this, S.getLocStart(),
2547                                            OMPD_sections);
2548   }
2549 }
2550 
2551 void CodeGenFunction::EmitOMPSectionDirective(const OMPSectionDirective &S) {
2552   auto &&CodeGen = [&S](CodeGenFunction &CGF, PrePostActionTy &) {
2553     CGF.EmitStmt(cast<CapturedStmt>(S.getAssociatedStmt())->getCapturedStmt());
2554   };
2555   OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
2556   CGM.getOpenMPRuntime().emitInlinedDirective(*this, OMPD_section, CodeGen,
2557                                               S.hasCancel());
2558 }
2559 
2560 void CodeGenFunction::EmitOMPSingleDirective(const OMPSingleDirective &S) {
2561   llvm::SmallVector<const Expr *, 8> CopyprivateVars;
2562   llvm::SmallVector<const Expr *, 8> DestExprs;
2563   llvm::SmallVector<const Expr *, 8> SrcExprs;
2564   llvm::SmallVector<const Expr *, 8> AssignmentOps;
2565   // Check if there are any 'copyprivate' clauses associated with this
2566   // 'single' construct.
2567   // Build a list of copyprivate variables along with helper expressions
2568   // (<source>, <destination>, <destination>=<source> expressions)
2569   for (const auto *C : S.getClausesOfKind<OMPCopyprivateClause>()) {
2570     CopyprivateVars.append(C->varlists().begin(), C->varlists().end());
2571     DestExprs.append(C->destination_exprs().begin(),
2572                      C->destination_exprs().end());
2573     SrcExprs.append(C->source_exprs().begin(), C->source_exprs().end());
2574     AssignmentOps.append(C->assignment_ops().begin(),
2575                          C->assignment_ops().end());
2576   }
2577   // Emit code for 'single' region along with 'copyprivate' clauses
2578   auto &&CodeGen = [&S](CodeGenFunction &CGF, PrePostActionTy &Action) {
2579     Action.Enter(CGF);
2580     OMPPrivateScope SingleScope(CGF);
2581     (void)CGF.EmitOMPFirstprivateClause(S, SingleScope);
2582     CGF.EmitOMPPrivateClause(S, SingleScope);
2583     (void)SingleScope.Privatize();
2584     CGF.EmitStmt(cast<CapturedStmt>(S.getAssociatedStmt())->getCapturedStmt());
2585   };
2586   {
2587     OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
2588     CGM.getOpenMPRuntime().emitSingleRegion(*this, CodeGen, S.getLocStart(),
2589                                             CopyprivateVars, DestExprs,
2590                                             SrcExprs, AssignmentOps);
2591   }
2592   // Emit an implicit barrier at the end (to avoid data race on firstprivate
2593   // init or if no 'nowait' clause was specified and no 'copyprivate' clause).
2594   if (!S.getSingleClause<OMPNowaitClause>() && CopyprivateVars.empty()) {
2595     CGM.getOpenMPRuntime().emitBarrierCall(
2596         *this, S.getLocStart(),
2597         S.getSingleClause<OMPNowaitClause>() ? OMPD_unknown : OMPD_single);
2598   }
2599 }
2600 
2601 void CodeGenFunction::EmitOMPMasterDirective(const OMPMasterDirective &S) {
2602   auto &&CodeGen = [&S](CodeGenFunction &CGF, PrePostActionTy &Action) {
2603     Action.Enter(CGF);
2604     CGF.EmitStmt(cast<CapturedStmt>(S.getAssociatedStmt())->getCapturedStmt());
2605   };
2606   OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
2607   CGM.getOpenMPRuntime().emitMasterRegion(*this, CodeGen, S.getLocStart());
2608 }
2609 
2610 void CodeGenFunction::EmitOMPCriticalDirective(const OMPCriticalDirective &S) {
2611   auto &&CodeGen = [&S](CodeGenFunction &CGF, PrePostActionTy &Action) {
2612     Action.Enter(CGF);
2613     CGF.EmitStmt(cast<CapturedStmt>(S.getAssociatedStmt())->getCapturedStmt());
2614   };
2615   Expr *Hint = nullptr;
2616   if (auto *HintClause = S.getSingleClause<OMPHintClause>())
2617     Hint = HintClause->getHint();
2618   OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
2619   CGM.getOpenMPRuntime().emitCriticalRegion(*this,
2620                                             S.getDirectiveName().getAsString(),
2621                                             CodeGen, S.getLocStart(), Hint);
2622 }
2623 
2624 void CodeGenFunction::EmitOMPParallelForDirective(
2625     const OMPParallelForDirective &S) {
2626   // Emit directive as a combined directive that consists of two implicit
2627   // directives: 'parallel' with 'for' directive.
2628   auto &&CodeGen = [&S](CodeGenFunction &CGF, PrePostActionTy &) {
2629     OMPCancelStackRAII CancelRegion(CGF, OMPD_parallel_for, S.hasCancel());
2630     CGF.EmitOMPWorksharingLoop(S, S.getEnsureUpperBound(), emitForLoopBounds,
2631                                emitDispatchForLoopBounds);
2632   };
2633   emitCommonOMPParallelDirective(*this, S, OMPD_for, CodeGen,
2634                                  emitEmptyBoundParameters);
2635 }
2636 
2637 void CodeGenFunction::EmitOMPParallelForSimdDirective(
2638     const OMPParallelForSimdDirective &S) {
2639   // Emit directive as a combined directive that consists of two implicit
2640   // directives: 'parallel' with 'for' directive.
2641   auto &&CodeGen = [&S](CodeGenFunction &CGF, PrePostActionTy &) {
2642     CGF.EmitOMPWorksharingLoop(S, S.getEnsureUpperBound(), emitForLoopBounds,
2643                                emitDispatchForLoopBounds);
2644   };
2645   emitCommonOMPParallelDirective(*this, S, OMPD_simd, CodeGen,
2646                                  emitEmptyBoundParameters);
2647 }
2648 
2649 void CodeGenFunction::EmitOMPParallelSectionsDirective(
2650     const OMPParallelSectionsDirective &S) {
2651   // Emit directive as a combined directive that consists of two implicit
2652   // directives: 'parallel' with 'sections' directive.
2653   auto &&CodeGen = [&S](CodeGenFunction &CGF, PrePostActionTy &) {
2654     CGF.EmitSections(S);
2655   };
2656   emitCommonOMPParallelDirective(*this, S, OMPD_sections, CodeGen,
2657                                  emitEmptyBoundParameters);
2658 }
2659 
2660 void CodeGenFunction::EmitOMPTaskBasedDirective(const OMPExecutableDirective &S,
2661                                                 const RegionCodeGenTy &BodyGen,
2662                                                 const TaskGenTy &TaskGen,
2663                                                 OMPTaskDataTy &Data) {
2664   // Emit outlined function for task construct.
2665   auto CS = cast<CapturedStmt>(S.getAssociatedStmt());
2666   auto *I = CS->getCapturedDecl()->param_begin();
2667   auto *PartId = std::next(I);
2668   auto *TaskT = std::next(I, 4);
2669   // Check if the task is final
2670   if (const auto *Clause = S.getSingleClause<OMPFinalClause>()) {
2671     // If the condition constant folds and can be elided, try to avoid emitting
2672     // the condition and the dead arm of the if/else.
2673     auto *Cond = Clause->getCondition();
2674     bool CondConstant;
2675     if (ConstantFoldsToSimpleInteger(Cond, CondConstant))
2676       Data.Final.setInt(CondConstant);
2677     else
2678       Data.Final.setPointer(EvaluateExprAsBool(Cond));
2679   } else {
2680     // By default the task is not final.
2681     Data.Final.setInt(/*IntVal=*/false);
2682   }
2683   // Check if the task has 'priority' clause.
2684   if (const auto *Clause = S.getSingleClause<OMPPriorityClause>()) {
2685     auto *Prio = Clause->getPriority();
2686     Data.Priority.setInt(/*IntVal=*/true);
2687     Data.Priority.setPointer(EmitScalarConversion(
2688         EmitScalarExpr(Prio), Prio->getType(),
2689         getContext().getIntTypeForBitwidth(/*DestWidth=*/32, /*Signed=*/1),
2690         Prio->getExprLoc()));
2691   }
2692   // The first function argument for tasks is a thread id, the second one is a
2693   // part id (0 for tied tasks, >=0 for untied task).
2694   llvm::DenseSet<const VarDecl *> EmittedAsPrivate;
2695   // Get list of private variables.
2696   for (const auto *C : S.getClausesOfKind<OMPPrivateClause>()) {
2697     auto IRef = C->varlist_begin();
2698     for (auto *IInit : C->private_copies()) {
2699       auto *OrigVD = cast<VarDecl>(cast<DeclRefExpr>(*IRef)->getDecl());
2700       if (EmittedAsPrivate.insert(OrigVD->getCanonicalDecl()).second) {
2701         Data.PrivateVars.push_back(*IRef);
2702         Data.PrivateCopies.push_back(IInit);
2703       }
2704       ++IRef;
2705     }
2706   }
2707   EmittedAsPrivate.clear();
2708   // Get list of firstprivate variables.
2709   for (const auto *C : S.getClausesOfKind<OMPFirstprivateClause>()) {
2710     auto IRef = C->varlist_begin();
2711     auto IElemInitRef = C->inits().begin();
2712     for (auto *IInit : C->private_copies()) {
2713       auto *OrigVD = cast<VarDecl>(cast<DeclRefExpr>(*IRef)->getDecl());
2714       if (EmittedAsPrivate.insert(OrigVD->getCanonicalDecl()).second) {
2715         Data.FirstprivateVars.push_back(*IRef);
2716         Data.FirstprivateCopies.push_back(IInit);
2717         Data.FirstprivateInits.push_back(*IElemInitRef);
2718       }
2719       ++IRef;
2720       ++IElemInitRef;
2721     }
2722   }
2723   // Get list of lastprivate variables (for taskloops).
2724   llvm::DenseMap<const VarDecl *, const DeclRefExpr *> LastprivateDstsOrigs;
2725   for (const auto *C : S.getClausesOfKind<OMPLastprivateClause>()) {
2726     auto IRef = C->varlist_begin();
2727     auto ID = C->destination_exprs().begin();
2728     for (auto *IInit : C->private_copies()) {
2729       auto *OrigVD = cast<VarDecl>(cast<DeclRefExpr>(*IRef)->getDecl());
2730       if (EmittedAsPrivate.insert(OrigVD->getCanonicalDecl()).second) {
2731         Data.LastprivateVars.push_back(*IRef);
2732         Data.LastprivateCopies.push_back(IInit);
2733       }
2734       LastprivateDstsOrigs.insert(
2735           {cast<VarDecl>(cast<DeclRefExpr>(*ID)->getDecl()),
2736            cast<DeclRefExpr>(*IRef)});
2737       ++IRef;
2738       ++ID;
2739     }
2740   }
2741   SmallVector<const Expr *, 4> LHSs;
2742   SmallVector<const Expr *, 4> RHSs;
2743   for (const auto *C : S.getClausesOfKind<OMPReductionClause>()) {
2744     auto IPriv = C->privates().begin();
2745     auto IRed = C->reduction_ops().begin();
2746     auto ILHS = C->lhs_exprs().begin();
2747     auto IRHS = C->rhs_exprs().begin();
2748     for (const auto *Ref : C->varlists()) {
2749       Data.ReductionVars.emplace_back(Ref);
2750       Data.ReductionCopies.emplace_back(*IPriv);
2751       Data.ReductionOps.emplace_back(*IRed);
2752       LHSs.emplace_back(*ILHS);
2753       RHSs.emplace_back(*IRHS);
2754       std::advance(IPriv, 1);
2755       std::advance(IRed, 1);
2756       std::advance(ILHS, 1);
2757       std::advance(IRHS, 1);
2758     }
2759   }
2760   Data.Reductions = CGM.getOpenMPRuntime().emitTaskReductionInit(
2761       *this, S.getLocStart(), LHSs, RHSs, Data);
2762   // Build list of dependences.
2763   for (const auto *C : S.getClausesOfKind<OMPDependClause>())
2764     for (auto *IRef : C->varlists())
2765       Data.Dependences.push_back(std::make_pair(C->getDependencyKind(), IRef));
2766   auto &&CodeGen = [&Data, &S, CS, &BodyGen, &LastprivateDstsOrigs](
2767       CodeGenFunction &CGF, PrePostActionTy &Action) {
2768     // Set proper addresses for generated private copies.
2769     OMPPrivateScope Scope(CGF);
2770     if (!Data.PrivateVars.empty() || !Data.FirstprivateVars.empty() ||
2771         !Data.LastprivateVars.empty()) {
2772       enum { PrivatesParam = 2, CopyFnParam = 3 };
2773       auto *CopyFn = CGF.Builder.CreateLoad(
2774           CGF.GetAddrOfLocalVar(CS->getCapturedDecl()->getParam(3)));
2775       auto *PrivatesPtr = CGF.Builder.CreateLoad(
2776           CGF.GetAddrOfLocalVar(CS->getCapturedDecl()->getParam(2)));
2777       // Map privates.
2778       llvm::SmallVector<std::pair<const VarDecl *, Address>, 16> PrivatePtrs;
2779       llvm::SmallVector<llvm::Value *, 16> CallArgs;
2780       CallArgs.push_back(PrivatesPtr);
2781       for (auto *E : Data.PrivateVars) {
2782         auto *VD = cast<VarDecl>(cast<DeclRefExpr>(E)->getDecl());
2783         Address PrivatePtr = CGF.CreateMemTemp(
2784             CGF.getContext().getPointerType(E->getType()), ".priv.ptr.addr");
2785         PrivatePtrs.push_back(std::make_pair(VD, PrivatePtr));
2786         CallArgs.push_back(PrivatePtr.getPointer());
2787       }
2788       for (auto *E : Data.FirstprivateVars) {
2789         auto *VD = cast<VarDecl>(cast<DeclRefExpr>(E)->getDecl());
2790         Address PrivatePtr =
2791             CGF.CreateMemTemp(CGF.getContext().getPointerType(E->getType()),
2792                               ".firstpriv.ptr.addr");
2793         PrivatePtrs.push_back(std::make_pair(VD, PrivatePtr));
2794         CallArgs.push_back(PrivatePtr.getPointer());
2795       }
2796       for (auto *E : Data.LastprivateVars) {
2797         auto *VD = cast<VarDecl>(cast<DeclRefExpr>(E)->getDecl());
2798         Address PrivatePtr =
2799             CGF.CreateMemTemp(CGF.getContext().getPointerType(E->getType()),
2800                               ".lastpriv.ptr.addr");
2801         PrivatePtrs.push_back(std::make_pair(VD, PrivatePtr));
2802         CallArgs.push_back(PrivatePtr.getPointer());
2803       }
2804       CGF.CGM.getOpenMPRuntime().emitOutlinedFunctionCall(CGF, S.getLocStart(),
2805                                                           CopyFn, CallArgs);
2806       for (auto &&Pair : LastprivateDstsOrigs) {
2807         auto *OrigVD = cast<VarDecl>(Pair.second->getDecl());
2808         DeclRefExpr DRE(
2809             const_cast<VarDecl *>(OrigVD),
2810             /*RefersToEnclosingVariableOrCapture=*/CGF.CapturedStmtInfo->lookup(
2811                 OrigVD) != nullptr,
2812             Pair.second->getType(), VK_LValue, Pair.second->getExprLoc());
2813         Scope.addPrivate(Pair.first, [&CGF, &DRE]() {
2814           return CGF.EmitLValue(&DRE).getAddress();
2815         });
2816       }
2817       for (auto &&Pair : PrivatePtrs) {
2818         Address Replacement(CGF.Builder.CreateLoad(Pair.second),
2819                             CGF.getContext().getDeclAlign(Pair.first));
2820         Scope.addPrivate(Pair.first, [Replacement]() { return Replacement; });
2821       }
2822     }
2823     if (Data.Reductions) {
2824       OMPLexicalScope LexScope(CGF, S, /*AsInlined=*/true);
2825       ReductionCodeGen RedCG(Data.ReductionVars, Data.ReductionCopies,
2826                              Data.ReductionOps);
2827       llvm::Value *ReductionsPtr = CGF.Builder.CreateLoad(
2828           CGF.GetAddrOfLocalVar(CS->getCapturedDecl()->getParam(9)));
2829       for (unsigned Cnt = 0, E = Data.ReductionVars.size(); Cnt < E; ++Cnt) {
2830         RedCG.emitSharedLValue(CGF, Cnt);
2831         RedCG.emitAggregateType(CGF, Cnt);
2832         Address Replacement = CGF.CGM.getOpenMPRuntime().getTaskReductionItem(
2833             CGF, S.getLocStart(), ReductionsPtr, RedCG.getSharedLValue(Cnt));
2834         Replacement =
2835             Address(CGF.EmitScalarConversion(
2836                         Replacement.getPointer(), CGF.getContext().VoidPtrTy,
2837                         CGF.getContext().getPointerType(
2838                             Data.ReductionCopies[Cnt]->getType()),
2839                         SourceLocation()),
2840                     Replacement.getAlignment());
2841         Replacement = RedCG.adjustPrivateAddress(CGF, Cnt, Replacement);
2842         Scope.addPrivate(RedCG.getBaseDecl(Cnt),
2843                          [Replacement]() { return Replacement; });
2844         // FIXME: This must removed once the runtime library is fixed.
2845         // Emit required threadprivate variables for
2846         // initilizer/combiner/finalizer.
2847         CGF.CGM.getOpenMPRuntime().emitTaskReductionFixups(CGF, S.getLocStart(),
2848                                                            RedCG, Cnt);
2849       }
2850     }
2851     // Privatize all private variables except for in_reduction items.
2852     (void)Scope.Privatize();
2853     SmallVector<const Expr *, 4> InRedVars;
2854     SmallVector<const Expr *, 4> InRedPrivs;
2855     SmallVector<const Expr *, 4> InRedOps;
2856     SmallVector<const Expr *, 4> TaskgroupDescriptors;
2857     for (const auto *C : S.getClausesOfKind<OMPInReductionClause>()) {
2858       auto IPriv = C->privates().begin();
2859       auto IRed = C->reduction_ops().begin();
2860       auto ITD = C->taskgroup_descriptors().begin();
2861       for (const auto *Ref : C->varlists()) {
2862         InRedVars.emplace_back(Ref);
2863         InRedPrivs.emplace_back(*IPriv);
2864         InRedOps.emplace_back(*IRed);
2865         TaskgroupDescriptors.emplace_back(*ITD);
2866         std::advance(IPriv, 1);
2867         std::advance(IRed, 1);
2868         std::advance(ITD, 1);
2869       }
2870     }
2871     // Privatize in_reduction items here, because taskgroup descriptors must be
2872     // privatized earlier.
2873     OMPPrivateScope InRedScope(CGF);
2874     if (!InRedVars.empty()) {
2875       ReductionCodeGen RedCG(InRedVars, InRedPrivs, InRedOps);
2876       for (unsigned Cnt = 0, E = InRedVars.size(); Cnt < E; ++Cnt) {
2877         RedCG.emitSharedLValue(CGF, Cnt);
2878         RedCG.emitAggregateType(CGF, Cnt);
2879         // The taskgroup descriptor variable is always implicit firstprivate and
2880         // privatized already during procoessing of the firstprivates.
2881         llvm::Value *ReductionsPtr = CGF.EmitLoadOfScalar(
2882             CGF.EmitLValue(TaskgroupDescriptors[Cnt]), SourceLocation());
2883         Address Replacement = CGF.CGM.getOpenMPRuntime().getTaskReductionItem(
2884             CGF, S.getLocStart(), ReductionsPtr, RedCG.getSharedLValue(Cnt));
2885         Replacement = Address(
2886             CGF.EmitScalarConversion(
2887                 Replacement.getPointer(), CGF.getContext().VoidPtrTy,
2888                 CGF.getContext().getPointerType(InRedPrivs[Cnt]->getType()),
2889                 SourceLocation()),
2890             Replacement.getAlignment());
2891         Replacement = RedCG.adjustPrivateAddress(CGF, Cnt, Replacement);
2892         InRedScope.addPrivate(RedCG.getBaseDecl(Cnt),
2893                               [Replacement]() { return Replacement; });
2894         // FIXME: This must removed once the runtime library is fixed.
2895         // Emit required threadprivate variables for
2896         // initilizer/combiner/finalizer.
2897         CGF.CGM.getOpenMPRuntime().emitTaskReductionFixups(CGF, S.getLocStart(),
2898                                                            RedCG, Cnt);
2899       }
2900     }
2901     (void)InRedScope.Privatize();
2902 
2903     Action.Enter(CGF);
2904     BodyGen(CGF);
2905   };
2906   auto *OutlinedFn = CGM.getOpenMPRuntime().emitTaskOutlinedFunction(
2907       S, *I, *PartId, *TaskT, S.getDirectiveKind(), CodeGen, Data.Tied,
2908       Data.NumberOfParts);
2909   OMPLexicalScope Scope(*this, S);
2910   TaskGen(*this, OutlinedFn, Data);
2911 }
2912 
2913 void CodeGenFunction::EmitOMPTaskDirective(const OMPTaskDirective &S) {
2914   // Emit outlined function for task construct.
2915   auto CS = cast<CapturedStmt>(S.getAssociatedStmt());
2916   auto CapturedStruct = GenerateCapturedStmtArgument(*CS);
2917   auto SharedsTy = getContext().getRecordType(CS->getCapturedRecordDecl());
2918   const Expr *IfCond = nullptr;
2919   for (const auto *C : S.getClausesOfKind<OMPIfClause>()) {
2920     if (C->getNameModifier() == OMPD_unknown ||
2921         C->getNameModifier() == OMPD_task) {
2922       IfCond = C->getCondition();
2923       break;
2924     }
2925   }
2926 
2927   OMPTaskDataTy Data;
2928   // Check if we should emit tied or untied task.
2929   Data.Tied = !S.getSingleClause<OMPUntiedClause>();
2930   auto &&BodyGen = [CS](CodeGenFunction &CGF, PrePostActionTy &) {
2931     CGF.EmitStmt(CS->getCapturedStmt());
2932   };
2933   auto &&TaskGen = [&S, SharedsTy, CapturedStruct,
2934                     IfCond](CodeGenFunction &CGF, llvm::Value *OutlinedFn,
2935                             const OMPTaskDataTy &Data) {
2936     CGF.CGM.getOpenMPRuntime().emitTaskCall(CGF, S.getLocStart(), S, OutlinedFn,
2937                                             SharedsTy, CapturedStruct, IfCond,
2938                                             Data);
2939   };
2940   EmitOMPTaskBasedDirective(S, BodyGen, TaskGen, Data);
2941 }
2942 
2943 void CodeGenFunction::EmitOMPTaskyieldDirective(
2944     const OMPTaskyieldDirective &S) {
2945   CGM.getOpenMPRuntime().emitTaskyieldCall(*this, S.getLocStart());
2946 }
2947 
2948 void CodeGenFunction::EmitOMPBarrierDirective(const OMPBarrierDirective &S) {
2949   CGM.getOpenMPRuntime().emitBarrierCall(*this, S.getLocStart(), OMPD_barrier);
2950 }
2951 
2952 void CodeGenFunction::EmitOMPTaskwaitDirective(const OMPTaskwaitDirective &S) {
2953   CGM.getOpenMPRuntime().emitTaskwaitCall(*this, S.getLocStart());
2954 }
2955 
2956 void CodeGenFunction::EmitOMPTaskgroupDirective(
2957     const OMPTaskgroupDirective &S) {
2958   auto &&CodeGen = [&S](CodeGenFunction &CGF, PrePostActionTy &Action) {
2959     Action.Enter(CGF);
2960     if (const Expr *E = S.getReductionRef()) {
2961       SmallVector<const Expr *, 4> LHSs;
2962       SmallVector<const Expr *, 4> RHSs;
2963       OMPTaskDataTy Data;
2964       for (const auto *C : S.getClausesOfKind<OMPTaskReductionClause>()) {
2965         auto IPriv = C->privates().begin();
2966         auto IRed = C->reduction_ops().begin();
2967         auto ILHS = C->lhs_exprs().begin();
2968         auto IRHS = C->rhs_exprs().begin();
2969         for (const auto *Ref : C->varlists()) {
2970           Data.ReductionVars.emplace_back(Ref);
2971           Data.ReductionCopies.emplace_back(*IPriv);
2972           Data.ReductionOps.emplace_back(*IRed);
2973           LHSs.emplace_back(*ILHS);
2974           RHSs.emplace_back(*IRHS);
2975           std::advance(IPriv, 1);
2976           std::advance(IRed, 1);
2977           std::advance(ILHS, 1);
2978           std::advance(IRHS, 1);
2979         }
2980       }
2981       llvm::Value *ReductionDesc =
2982           CGF.CGM.getOpenMPRuntime().emitTaskReductionInit(CGF, S.getLocStart(),
2983                                                            LHSs, RHSs, Data);
2984       const auto *VD = cast<VarDecl>(cast<DeclRefExpr>(E)->getDecl());
2985       CGF.EmitVarDecl(*VD);
2986       CGF.EmitStoreOfScalar(ReductionDesc, CGF.GetAddrOfLocalVar(VD),
2987                             /*Volatile=*/false, E->getType());
2988     }
2989     CGF.EmitStmt(cast<CapturedStmt>(S.getAssociatedStmt())->getCapturedStmt());
2990   };
2991   OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
2992   CGM.getOpenMPRuntime().emitTaskgroupRegion(*this, CodeGen, S.getLocStart());
2993 }
2994 
2995 void CodeGenFunction::EmitOMPFlushDirective(const OMPFlushDirective &S) {
2996   CGM.getOpenMPRuntime().emitFlush(*this, [&]() -> ArrayRef<const Expr *> {
2997     if (const auto *FlushClause = S.getSingleClause<OMPFlushClause>()) {
2998       return llvm::makeArrayRef(FlushClause->varlist_begin(),
2999                                 FlushClause->varlist_end());
3000     }
3001     return llvm::None;
3002   }(), S.getLocStart());
3003 }
3004 
3005 void CodeGenFunction::EmitOMPDistributeLoop(const OMPLoopDirective &S,
3006                                             const CodeGenLoopTy &CodeGenLoop,
3007                                             Expr *IncExpr) {
3008   // Emit the loop iteration variable.
3009   auto IVExpr = cast<DeclRefExpr>(S.getIterationVariable());
3010   auto IVDecl = cast<VarDecl>(IVExpr->getDecl());
3011   EmitVarDecl(*IVDecl);
3012 
3013   // Emit the iterations count variable.
3014   // If it is not a variable, Sema decided to calculate iterations count on each
3015   // iteration (e.g., it is foldable into a constant).
3016   if (auto LIExpr = dyn_cast<DeclRefExpr>(S.getLastIteration())) {
3017     EmitVarDecl(*cast<VarDecl>(LIExpr->getDecl()));
3018     // Emit calculation of the iterations count.
3019     EmitIgnoredExpr(S.getCalcLastIteration());
3020   }
3021 
3022   auto &RT = CGM.getOpenMPRuntime();
3023 
3024   bool HasLastprivateClause = false;
3025   // Check pre-condition.
3026   {
3027     OMPLoopScope PreInitScope(*this, S);
3028     // Skip the entire loop if we don't meet the precondition.
3029     // If the condition constant folds and can be elided, avoid emitting the
3030     // whole loop.
3031     bool CondConstant;
3032     llvm::BasicBlock *ContBlock = nullptr;
3033     if (ConstantFoldsToSimpleInteger(S.getPreCond(), CondConstant)) {
3034       if (!CondConstant)
3035         return;
3036     } else {
3037       auto *ThenBlock = createBasicBlock("omp.precond.then");
3038       ContBlock = createBasicBlock("omp.precond.end");
3039       emitPreCond(*this, S, S.getPreCond(), ThenBlock, ContBlock,
3040                   getProfileCount(&S));
3041       EmitBlock(ThenBlock);
3042       incrementProfileCounter(&S);
3043     }
3044 
3045     // Emit 'then' code.
3046     {
3047       // Emit helper vars inits.
3048 
3049       LValue LB = EmitOMPHelperVar(
3050           *this, cast<DeclRefExpr>(
3051                      (isOpenMPLoopBoundSharingDirective(S.getDirectiveKind())
3052                           ? S.getCombinedLowerBoundVariable()
3053                           : S.getLowerBoundVariable())));
3054       LValue UB = EmitOMPHelperVar(
3055           *this, cast<DeclRefExpr>(
3056                      (isOpenMPLoopBoundSharingDirective(S.getDirectiveKind())
3057                           ? S.getCombinedUpperBoundVariable()
3058                           : S.getUpperBoundVariable())));
3059       LValue ST =
3060           EmitOMPHelperVar(*this, cast<DeclRefExpr>(S.getStrideVariable()));
3061       LValue IL =
3062           EmitOMPHelperVar(*this, cast<DeclRefExpr>(S.getIsLastIterVariable()));
3063 
3064       OMPPrivateScope LoopScope(*this);
3065       if (EmitOMPFirstprivateClause(S, LoopScope)) {
3066         // Emit implicit barrier to synchronize threads and avoid data races on
3067         // initialization of firstprivate variables and post-update of
3068         // lastprivate variables.
3069         CGM.getOpenMPRuntime().emitBarrierCall(
3070           *this, S.getLocStart(), OMPD_unknown, /*EmitChecks=*/false,
3071           /*ForceSimpleCall=*/true);
3072       }
3073       EmitOMPPrivateClause(S, LoopScope);
3074       HasLastprivateClause = EmitOMPLastprivateClauseInit(S, LoopScope);
3075       EmitOMPPrivateLoopCounters(S, LoopScope);
3076       (void)LoopScope.Privatize();
3077 
3078       // Detect the distribute schedule kind and chunk.
3079       llvm::Value *Chunk = nullptr;
3080       OpenMPDistScheduleClauseKind ScheduleKind = OMPC_DIST_SCHEDULE_unknown;
3081       if (auto *C = S.getSingleClause<OMPDistScheduleClause>()) {
3082         ScheduleKind = C->getDistScheduleKind();
3083         if (const auto *Ch = C->getChunkSize()) {
3084           Chunk = EmitScalarExpr(Ch);
3085           Chunk = EmitScalarConversion(Chunk, Ch->getType(),
3086           S.getIterationVariable()->getType(),
3087           S.getLocStart());
3088         }
3089       }
3090       const unsigned IVSize = getContext().getTypeSize(IVExpr->getType());
3091       const bool IVSigned = IVExpr->getType()->hasSignedIntegerRepresentation();
3092 
3093       // OpenMP [2.10.8, distribute Construct, Description]
3094       // If dist_schedule is specified, kind must be static. If specified,
3095       // iterations are divided into chunks of size chunk_size, chunks are
3096       // assigned to the teams of the league in a round-robin fashion in the
3097       // order of the team number. When no chunk_size is specified, the
3098       // iteration space is divided into chunks that are approximately equal
3099       // in size, and at most one chunk is distributed to each team of the
3100       // league. The size of the chunks is unspecified in this case.
3101       if (RT.isStaticNonchunked(ScheduleKind,
3102                                 /* Chunked */ Chunk != nullptr)) {
3103         CGOpenMPRuntime::StaticRTInput StaticInit(
3104             IVSize, IVSigned, /* Ordered = */ false, IL.getAddress(),
3105             LB.getAddress(), UB.getAddress(), ST.getAddress());
3106         RT.emitDistributeStaticInit(*this, S.getLocStart(), ScheduleKind,
3107                                     StaticInit);
3108         auto LoopExit =
3109             getJumpDestInCurrentScope(createBasicBlock("omp.loop.exit"));
3110         // UB = min(UB, GlobalUB);
3111         EmitIgnoredExpr(isOpenMPLoopBoundSharingDirective(S.getDirectiveKind())
3112                             ? S.getCombinedEnsureUpperBound()
3113                             : S.getEnsureUpperBound());
3114         // IV = LB;
3115         EmitIgnoredExpr(isOpenMPLoopBoundSharingDirective(S.getDirectiveKind())
3116                             ? S.getCombinedInit()
3117                             : S.getInit());
3118 
3119         Expr *Cond = isOpenMPLoopBoundSharingDirective(S.getDirectiveKind())
3120                          ? S.getCombinedCond()
3121                          : S.getCond();
3122 
3123         // for distribute alone,  codegen
3124         // while (idx <= UB) { BODY; ++idx; }
3125         // when combined with 'for' (e.g. as in 'distribute parallel for')
3126         // while (idx <= UB) { <CodeGen rest of pragma>; idx += ST; }
3127         EmitOMPInnerLoop(S, LoopScope.requiresCleanups(), Cond, IncExpr,
3128                          [&S, LoopExit, &CodeGenLoop](CodeGenFunction &CGF) {
3129                            CodeGenLoop(CGF, S, LoopExit);
3130                          },
3131                          [](CodeGenFunction &) {});
3132         EmitBlock(LoopExit.getBlock());
3133         // Tell the runtime we are done.
3134         RT.emitForStaticFinish(*this, S.getLocStart(), S.getDirectiveKind());
3135       } else {
3136         // Emit the outer loop, which requests its work chunk [LB..UB] from
3137         // runtime and runs the inner loop to process it.
3138         const OMPLoopArguments LoopArguments = {
3139             LB.getAddress(), UB.getAddress(), ST.getAddress(), IL.getAddress(),
3140             Chunk};
3141         EmitOMPDistributeOuterLoop(ScheduleKind, S, LoopScope, LoopArguments,
3142                                    CodeGenLoop);
3143       }
3144 
3145       // Emit final copy of the lastprivate variables if IsLastIter != 0.
3146       if (HasLastprivateClause)
3147         EmitOMPLastprivateClauseFinal(
3148             S, /*NoFinals=*/false,
3149             Builder.CreateIsNotNull(
3150                 EmitLoadOfScalar(IL, S.getLocStart())));
3151     }
3152 
3153     // We're now done with the loop, so jump to the continuation block.
3154     if (ContBlock) {
3155       EmitBranch(ContBlock);
3156       EmitBlock(ContBlock, true);
3157     }
3158   }
3159 }
3160 
3161 void CodeGenFunction::EmitOMPDistributeDirective(
3162     const OMPDistributeDirective &S) {
3163   auto &&CodeGen = [&S](CodeGenFunction &CGF, PrePostActionTy &) {
3164 
3165     CGF.EmitOMPDistributeLoop(S, emitOMPLoopBodyWithStopPoint, S.getInc());
3166   };
3167   OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
3168   CGM.getOpenMPRuntime().emitInlinedDirective(*this, OMPD_distribute, CodeGen,
3169                                               false);
3170 }
3171 
3172 static llvm::Function *emitOutlinedOrderedFunction(CodeGenModule &CGM,
3173                                                    const CapturedStmt *S) {
3174   CodeGenFunction CGF(CGM, /*suppressNewContext=*/true);
3175   CodeGenFunction::CGCapturedStmtInfo CapStmtInfo;
3176   CGF.CapturedStmtInfo = &CapStmtInfo;
3177   auto *Fn = CGF.GenerateOpenMPCapturedStmtFunction(*S);
3178   Fn->addFnAttr(llvm::Attribute::NoInline);
3179   return Fn;
3180 }
3181 
3182 void CodeGenFunction::EmitOMPOrderedDirective(const OMPOrderedDirective &S) {
3183   if (!S.getAssociatedStmt()) {
3184     for (const auto *DC : S.getClausesOfKind<OMPDependClause>())
3185       CGM.getOpenMPRuntime().emitDoacrossOrdered(*this, DC);
3186     return;
3187   }
3188   auto *C = S.getSingleClause<OMPSIMDClause>();
3189   auto &&CodeGen = [&S, C, this](CodeGenFunction &CGF,
3190                                  PrePostActionTy &Action) {
3191     if (C) {
3192       auto CS = cast<CapturedStmt>(S.getAssociatedStmt());
3193       llvm::SmallVector<llvm::Value *, 16> CapturedVars;
3194       CGF.GenerateOpenMPCapturedVars(*CS, CapturedVars);
3195       auto *OutlinedFn = emitOutlinedOrderedFunction(CGM, CS);
3196       CGM.getOpenMPRuntime().emitOutlinedFunctionCall(CGF, S.getLocStart(),
3197                                                       OutlinedFn, CapturedVars);
3198     } else {
3199       Action.Enter(CGF);
3200       CGF.EmitStmt(
3201           cast<CapturedStmt>(S.getAssociatedStmt())->getCapturedStmt());
3202     }
3203   };
3204   OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
3205   CGM.getOpenMPRuntime().emitOrderedRegion(*this, CodeGen, S.getLocStart(), !C);
3206 }
3207 
3208 static llvm::Value *convertToScalarValue(CodeGenFunction &CGF, RValue Val,
3209                                          QualType SrcType, QualType DestType,
3210                                          SourceLocation Loc) {
3211   assert(CGF.hasScalarEvaluationKind(DestType) &&
3212          "DestType must have scalar evaluation kind.");
3213   assert(!Val.isAggregate() && "Must be a scalar or complex.");
3214   return Val.isScalar()
3215              ? CGF.EmitScalarConversion(Val.getScalarVal(), SrcType, DestType,
3216                                         Loc)
3217              : CGF.EmitComplexToScalarConversion(Val.getComplexVal(), SrcType,
3218                                                  DestType, Loc);
3219 }
3220 
3221 static CodeGenFunction::ComplexPairTy
3222 convertToComplexValue(CodeGenFunction &CGF, RValue Val, QualType SrcType,
3223                       QualType DestType, SourceLocation Loc) {
3224   assert(CGF.getEvaluationKind(DestType) == TEK_Complex &&
3225          "DestType must have complex evaluation kind.");
3226   CodeGenFunction::ComplexPairTy ComplexVal;
3227   if (Val.isScalar()) {
3228     // Convert the input element to the element type of the complex.
3229     auto DestElementType = DestType->castAs<ComplexType>()->getElementType();
3230     auto ScalarVal = CGF.EmitScalarConversion(Val.getScalarVal(), SrcType,
3231                                               DestElementType, Loc);
3232     ComplexVal = CodeGenFunction::ComplexPairTy(
3233         ScalarVal, llvm::Constant::getNullValue(ScalarVal->getType()));
3234   } else {
3235     assert(Val.isComplex() && "Must be a scalar or complex.");
3236     auto SrcElementType = SrcType->castAs<ComplexType>()->getElementType();
3237     auto DestElementType = DestType->castAs<ComplexType>()->getElementType();
3238     ComplexVal.first = CGF.EmitScalarConversion(
3239         Val.getComplexVal().first, SrcElementType, DestElementType, Loc);
3240     ComplexVal.second = CGF.EmitScalarConversion(
3241         Val.getComplexVal().second, SrcElementType, DestElementType, Loc);
3242   }
3243   return ComplexVal;
3244 }
3245 
3246 static void emitSimpleAtomicStore(CodeGenFunction &CGF, bool IsSeqCst,
3247                                   LValue LVal, RValue RVal) {
3248   if (LVal.isGlobalReg()) {
3249     CGF.EmitStoreThroughGlobalRegLValue(RVal, LVal);
3250   } else {
3251     CGF.EmitAtomicStore(RVal, LVal,
3252                         IsSeqCst ? llvm::AtomicOrdering::SequentiallyConsistent
3253                                  : llvm::AtomicOrdering::Monotonic,
3254                         LVal.isVolatile(), /*IsInit=*/false);
3255   }
3256 }
3257 
3258 void CodeGenFunction::emitOMPSimpleStore(LValue LVal, RValue RVal,
3259                                          QualType RValTy, SourceLocation Loc) {
3260   switch (getEvaluationKind(LVal.getType())) {
3261   case TEK_Scalar:
3262     EmitStoreThroughLValue(RValue::get(convertToScalarValue(
3263                                *this, RVal, RValTy, LVal.getType(), Loc)),
3264                            LVal);
3265     break;
3266   case TEK_Complex:
3267     EmitStoreOfComplex(
3268         convertToComplexValue(*this, RVal, RValTy, LVal.getType(), Loc), LVal,
3269         /*isInit=*/false);
3270     break;
3271   case TEK_Aggregate:
3272     llvm_unreachable("Must be a scalar or complex.");
3273   }
3274 }
3275 
3276 static void EmitOMPAtomicReadExpr(CodeGenFunction &CGF, bool IsSeqCst,
3277                                   const Expr *X, const Expr *V,
3278                                   SourceLocation Loc) {
3279   // v = x;
3280   assert(V->isLValue() && "V of 'omp atomic read' is not lvalue");
3281   assert(X->isLValue() && "X of 'omp atomic read' is not lvalue");
3282   LValue XLValue = CGF.EmitLValue(X);
3283   LValue VLValue = CGF.EmitLValue(V);
3284   RValue Res = XLValue.isGlobalReg()
3285                    ? CGF.EmitLoadOfLValue(XLValue, Loc)
3286                    : CGF.EmitAtomicLoad(
3287                          XLValue, Loc,
3288                          IsSeqCst ? llvm::AtomicOrdering::SequentiallyConsistent
3289                                   : llvm::AtomicOrdering::Monotonic,
3290                          XLValue.isVolatile());
3291   // OpenMP, 2.12.6, atomic Construct
3292   // Any atomic construct with a seq_cst clause forces the atomically
3293   // performed operation to include an implicit flush operation without a
3294   // list.
3295   if (IsSeqCst)
3296     CGF.CGM.getOpenMPRuntime().emitFlush(CGF, llvm::None, Loc);
3297   CGF.emitOMPSimpleStore(VLValue, Res, X->getType().getNonReferenceType(), Loc);
3298 }
3299 
3300 static void EmitOMPAtomicWriteExpr(CodeGenFunction &CGF, bool IsSeqCst,
3301                                    const Expr *X, const Expr *E,
3302                                    SourceLocation Loc) {
3303   // x = expr;
3304   assert(X->isLValue() && "X of 'omp atomic write' is not lvalue");
3305   emitSimpleAtomicStore(CGF, IsSeqCst, CGF.EmitLValue(X), CGF.EmitAnyExpr(E));
3306   // OpenMP, 2.12.6, atomic Construct
3307   // Any atomic construct with a seq_cst clause forces the atomically
3308   // performed operation to include an implicit flush operation without a
3309   // list.
3310   if (IsSeqCst)
3311     CGF.CGM.getOpenMPRuntime().emitFlush(CGF, llvm::None, Loc);
3312 }
3313 
3314 static std::pair<bool, RValue> emitOMPAtomicRMW(CodeGenFunction &CGF, LValue X,
3315                                                 RValue Update,
3316                                                 BinaryOperatorKind BO,
3317                                                 llvm::AtomicOrdering AO,
3318                                                 bool IsXLHSInRHSPart) {
3319   auto &Context = CGF.CGM.getContext();
3320   // Allow atomicrmw only if 'x' and 'update' are integer values, lvalue for 'x'
3321   // expression is simple and atomic is allowed for the given type for the
3322   // target platform.
3323   if (BO == BO_Comma || !Update.isScalar() ||
3324       !Update.getScalarVal()->getType()->isIntegerTy() ||
3325       !X.isSimple() || (!isa<llvm::ConstantInt>(Update.getScalarVal()) &&
3326                         (Update.getScalarVal()->getType() !=
3327                          X.getAddress().getElementType())) ||
3328       !X.getAddress().getElementType()->isIntegerTy() ||
3329       !Context.getTargetInfo().hasBuiltinAtomic(
3330           Context.getTypeSize(X.getType()), Context.toBits(X.getAlignment())))
3331     return std::make_pair(false, RValue::get(nullptr));
3332 
3333   llvm::AtomicRMWInst::BinOp RMWOp;
3334   switch (BO) {
3335   case BO_Add:
3336     RMWOp = llvm::AtomicRMWInst::Add;
3337     break;
3338   case BO_Sub:
3339     if (!IsXLHSInRHSPart)
3340       return std::make_pair(false, RValue::get(nullptr));
3341     RMWOp = llvm::AtomicRMWInst::Sub;
3342     break;
3343   case BO_And:
3344     RMWOp = llvm::AtomicRMWInst::And;
3345     break;
3346   case BO_Or:
3347     RMWOp = llvm::AtomicRMWInst::Or;
3348     break;
3349   case BO_Xor:
3350     RMWOp = llvm::AtomicRMWInst::Xor;
3351     break;
3352   case BO_LT:
3353     RMWOp = X.getType()->hasSignedIntegerRepresentation()
3354                 ? (IsXLHSInRHSPart ? llvm::AtomicRMWInst::Min
3355                                    : llvm::AtomicRMWInst::Max)
3356                 : (IsXLHSInRHSPart ? llvm::AtomicRMWInst::UMin
3357                                    : llvm::AtomicRMWInst::UMax);
3358     break;
3359   case BO_GT:
3360     RMWOp = X.getType()->hasSignedIntegerRepresentation()
3361                 ? (IsXLHSInRHSPart ? llvm::AtomicRMWInst::Max
3362                                    : llvm::AtomicRMWInst::Min)
3363                 : (IsXLHSInRHSPart ? llvm::AtomicRMWInst::UMax
3364                                    : llvm::AtomicRMWInst::UMin);
3365     break;
3366   case BO_Assign:
3367     RMWOp = llvm::AtomicRMWInst::Xchg;
3368     break;
3369   case BO_Mul:
3370   case BO_Div:
3371   case BO_Rem:
3372   case BO_Shl:
3373   case BO_Shr:
3374   case BO_LAnd:
3375   case BO_LOr:
3376     return std::make_pair(false, RValue::get(nullptr));
3377   case BO_PtrMemD:
3378   case BO_PtrMemI:
3379   case BO_LE:
3380   case BO_GE:
3381   case BO_EQ:
3382   case BO_NE:
3383   case BO_AddAssign:
3384   case BO_SubAssign:
3385   case BO_AndAssign:
3386   case BO_OrAssign:
3387   case BO_XorAssign:
3388   case BO_MulAssign:
3389   case BO_DivAssign:
3390   case BO_RemAssign:
3391   case BO_ShlAssign:
3392   case BO_ShrAssign:
3393   case BO_Comma:
3394     llvm_unreachable("Unsupported atomic update operation");
3395   }
3396   auto *UpdateVal = Update.getScalarVal();
3397   if (auto *IC = dyn_cast<llvm::ConstantInt>(UpdateVal)) {
3398     UpdateVal = CGF.Builder.CreateIntCast(
3399         IC, X.getAddress().getElementType(),
3400         X.getType()->hasSignedIntegerRepresentation());
3401   }
3402   auto *Res = CGF.Builder.CreateAtomicRMW(RMWOp, X.getPointer(), UpdateVal, AO);
3403   return std::make_pair(true, RValue::get(Res));
3404 }
3405 
3406 std::pair<bool, RValue> CodeGenFunction::EmitOMPAtomicSimpleUpdateExpr(
3407     LValue X, RValue E, BinaryOperatorKind BO, bool IsXLHSInRHSPart,
3408     llvm::AtomicOrdering AO, SourceLocation Loc,
3409     const llvm::function_ref<RValue(RValue)> &CommonGen) {
3410   // Update expressions are allowed to have the following forms:
3411   // x binop= expr; -> xrval + expr;
3412   // x++, ++x -> xrval + 1;
3413   // x--, --x -> xrval - 1;
3414   // x = x binop expr; -> xrval binop expr
3415   // x = expr Op x; - > expr binop xrval;
3416   auto Res = emitOMPAtomicRMW(*this, X, E, BO, AO, IsXLHSInRHSPart);
3417   if (!Res.first) {
3418     if (X.isGlobalReg()) {
3419       // Emit an update expression: 'xrval' binop 'expr' or 'expr' binop
3420       // 'xrval'.
3421       EmitStoreThroughLValue(CommonGen(EmitLoadOfLValue(X, Loc)), X);
3422     } else {
3423       // Perform compare-and-swap procedure.
3424       EmitAtomicUpdate(X, AO, CommonGen, X.getType().isVolatileQualified());
3425     }
3426   }
3427   return Res;
3428 }
3429 
3430 static void EmitOMPAtomicUpdateExpr(CodeGenFunction &CGF, bool IsSeqCst,
3431                                     const Expr *X, const Expr *E,
3432                                     const Expr *UE, bool IsXLHSInRHSPart,
3433                                     SourceLocation Loc) {
3434   assert(isa<BinaryOperator>(UE->IgnoreImpCasts()) &&
3435          "Update expr in 'atomic update' must be a binary operator.");
3436   auto *BOUE = cast<BinaryOperator>(UE->IgnoreImpCasts());
3437   // Update expressions are allowed to have the following forms:
3438   // x binop= expr; -> xrval + expr;
3439   // x++, ++x -> xrval + 1;
3440   // x--, --x -> xrval - 1;
3441   // x = x binop expr; -> xrval binop expr
3442   // x = expr Op x; - > expr binop xrval;
3443   assert(X->isLValue() && "X of 'omp atomic update' is not lvalue");
3444   LValue XLValue = CGF.EmitLValue(X);
3445   RValue ExprRValue = CGF.EmitAnyExpr(E);
3446   auto AO = IsSeqCst ? llvm::AtomicOrdering::SequentiallyConsistent
3447                      : llvm::AtomicOrdering::Monotonic;
3448   auto *LHS = cast<OpaqueValueExpr>(BOUE->getLHS()->IgnoreImpCasts());
3449   auto *RHS = cast<OpaqueValueExpr>(BOUE->getRHS()->IgnoreImpCasts());
3450   auto *XRValExpr = IsXLHSInRHSPart ? LHS : RHS;
3451   auto *ERValExpr = IsXLHSInRHSPart ? RHS : LHS;
3452   auto Gen =
3453       [&CGF, UE, ExprRValue, XRValExpr, ERValExpr](RValue XRValue) -> RValue {
3454         CodeGenFunction::OpaqueValueMapping MapExpr(CGF, ERValExpr, ExprRValue);
3455         CodeGenFunction::OpaqueValueMapping MapX(CGF, XRValExpr, XRValue);
3456         return CGF.EmitAnyExpr(UE);
3457       };
3458   (void)CGF.EmitOMPAtomicSimpleUpdateExpr(
3459       XLValue, ExprRValue, BOUE->getOpcode(), IsXLHSInRHSPart, AO, Loc, Gen);
3460   // OpenMP, 2.12.6, atomic Construct
3461   // Any atomic construct with a seq_cst clause forces the atomically
3462   // performed operation to include an implicit flush operation without a
3463   // list.
3464   if (IsSeqCst)
3465     CGF.CGM.getOpenMPRuntime().emitFlush(CGF, llvm::None, Loc);
3466 }
3467 
3468 static RValue convertToType(CodeGenFunction &CGF, RValue Value,
3469                             QualType SourceType, QualType ResType,
3470                             SourceLocation Loc) {
3471   switch (CGF.getEvaluationKind(ResType)) {
3472   case TEK_Scalar:
3473     return RValue::get(
3474         convertToScalarValue(CGF, Value, SourceType, ResType, Loc));
3475   case TEK_Complex: {
3476     auto Res = convertToComplexValue(CGF, Value, SourceType, ResType, Loc);
3477     return RValue::getComplex(Res.first, Res.second);
3478   }
3479   case TEK_Aggregate:
3480     break;
3481   }
3482   llvm_unreachable("Must be a scalar or complex.");
3483 }
3484 
3485 static void EmitOMPAtomicCaptureExpr(CodeGenFunction &CGF, bool IsSeqCst,
3486                                      bool IsPostfixUpdate, const Expr *V,
3487                                      const Expr *X, const Expr *E,
3488                                      const Expr *UE, bool IsXLHSInRHSPart,
3489                                      SourceLocation Loc) {
3490   assert(X->isLValue() && "X of 'omp atomic capture' is not lvalue");
3491   assert(V->isLValue() && "V of 'omp atomic capture' is not lvalue");
3492   RValue NewVVal;
3493   LValue VLValue = CGF.EmitLValue(V);
3494   LValue XLValue = CGF.EmitLValue(X);
3495   RValue ExprRValue = CGF.EmitAnyExpr(E);
3496   auto AO = IsSeqCst ? llvm::AtomicOrdering::SequentiallyConsistent
3497                      : llvm::AtomicOrdering::Monotonic;
3498   QualType NewVValType;
3499   if (UE) {
3500     // 'x' is updated with some additional value.
3501     assert(isa<BinaryOperator>(UE->IgnoreImpCasts()) &&
3502            "Update expr in 'atomic capture' must be a binary operator.");
3503     auto *BOUE = cast<BinaryOperator>(UE->IgnoreImpCasts());
3504     // Update expressions are allowed to have the following forms:
3505     // x binop= expr; -> xrval + expr;
3506     // x++, ++x -> xrval + 1;
3507     // x--, --x -> xrval - 1;
3508     // x = x binop expr; -> xrval binop expr
3509     // x = expr Op x; - > expr binop xrval;
3510     auto *LHS = cast<OpaqueValueExpr>(BOUE->getLHS()->IgnoreImpCasts());
3511     auto *RHS = cast<OpaqueValueExpr>(BOUE->getRHS()->IgnoreImpCasts());
3512     auto *XRValExpr = IsXLHSInRHSPart ? LHS : RHS;
3513     NewVValType = XRValExpr->getType();
3514     auto *ERValExpr = IsXLHSInRHSPart ? RHS : LHS;
3515     auto &&Gen = [&CGF, &NewVVal, UE, ExprRValue, XRValExpr, ERValExpr,
3516                   IsPostfixUpdate](RValue XRValue) -> RValue {
3517       CodeGenFunction::OpaqueValueMapping MapExpr(CGF, ERValExpr, ExprRValue);
3518       CodeGenFunction::OpaqueValueMapping MapX(CGF, XRValExpr, XRValue);
3519       RValue Res = CGF.EmitAnyExpr(UE);
3520       NewVVal = IsPostfixUpdate ? XRValue : Res;
3521       return Res;
3522     };
3523     auto Res = CGF.EmitOMPAtomicSimpleUpdateExpr(
3524         XLValue, ExprRValue, BOUE->getOpcode(), IsXLHSInRHSPart, AO, Loc, Gen);
3525     if (Res.first) {
3526       // 'atomicrmw' instruction was generated.
3527       if (IsPostfixUpdate) {
3528         // Use old value from 'atomicrmw'.
3529         NewVVal = Res.second;
3530       } else {
3531         // 'atomicrmw' does not provide new value, so evaluate it using old
3532         // value of 'x'.
3533         CodeGenFunction::OpaqueValueMapping MapExpr(CGF, ERValExpr, ExprRValue);
3534         CodeGenFunction::OpaqueValueMapping MapX(CGF, XRValExpr, Res.second);
3535         NewVVal = CGF.EmitAnyExpr(UE);
3536       }
3537     }
3538   } else {
3539     // 'x' is simply rewritten with some 'expr'.
3540     NewVValType = X->getType().getNonReferenceType();
3541     ExprRValue = convertToType(CGF, ExprRValue, E->getType(),
3542                                X->getType().getNonReferenceType(), Loc);
3543     auto &&Gen = [&NewVVal, ExprRValue](RValue XRValue) -> RValue {
3544       NewVVal = XRValue;
3545       return ExprRValue;
3546     };
3547     // Try to perform atomicrmw xchg, otherwise simple exchange.
3548     auto Res = CGF.EmitOMPAtomicSimpleUpdateExpr(
3549         XLValue, ExprRValue, /*BO=*/BO_Assign, /*IsXLHSInRHSPart=*/false, AO,
3550         Loc, Gen);
3551     if (Res.first) {
3552       // 'atomicrmw' instruction was generated.
3553       NewVVal = IsPostfixUpdate ? Res.second : ExprRValue;
3554     }
3555   }
3556   // Emit post-update store to 'v' of old/new 'x' value.
3557   CGF.emitOMPSimpleStore(VLValue, NewVVal, NewVValType, Loc);
3558   // OpenMP, 2.12.6, atomic Construct
3559   // Any atomic construct with a seq_cst clause forces the atomically
3560   // performed operation to include an implicit flush operation without a
3561   // list.
3562   if (IsSeqCst)
3563     CGF.CGM.getOpenMPRuntime().emitFlush(CGF, llvm::None, Loc);
3564 }
3565 
3566 static void EmitOMPAtomicExpr(CodeGenFunction &CGF, OpenMPClauseKind Kind,
3567                               bool IsSeqCst, bool IsPostfixUpdate,
3568                               const Expr *X, const Expr *V, const Expr *E,
3569                               const Expr *UE, bool IsXLHSInRHSPart,
3570                               SourceLocation Loc) {
3571   switch (Kind) {
3572   case OMPC_read:
3573     EmitOMPAtomicReadExpr(CGF, IsSeqCst, X, V, Loc);
3574     break;
3575   case OMPC_write:
3576     EmitOMPAtomicWriteExpr(CGF, IsSeqCst, X, E, Loc);
3577     break;
3578   case OMPC_unknown:
3579   case OMPC_update:
3580     EmitOMPAtomicUpdateExpr(CGF, IsSeqCst, X, E, UE, IsXLHSInRHSPart, Loc);
3581     break;
3582   case OMPC_capture:
3583     EmitOMPAtomicCaptureExpr(CGF, IsSeqCst, IsPostfixUpdate, V, X, E, UE,
3584                              IsXLHSInRHSPart, Loc);
3585     break;
3586   case OMPC_if:
3587   case OMPC_final:
3588   case OMPC_num_threads:
3589   case OMPC_private:
3590   case OMPC_firstprivate:
3591   case OMPC_lastprivate:
3592   case OMPC_reduction:
3593   case OMPC_task_reduction:
3594   case OMPC_in_reduction:
3595   case OMPC_safelen:
3596   case OMPC_simdlen:
3597   case OMPC_collapse:
3598   case OMPC_default:
3599   case OMPC_seq_cst:
3600   case OMPC_shared:
3601   case OMPC_linear:
3602   case OMPC_aligned:
3603   case OMPC_copyin:
3604   case OMPC_copyprivate:
3605   case OMPC_flush:
3606   case OMPC_proc_bind:
3607   case OMPC_schedule:
3608   case OMPC_ordered:
3609   case OMPC_nowait:
3610   case OMPC_untied:
3611   case OMPC_threadprivate:
3612   case OMPC_depend:
3613   case OMPC_mergeable:
3614   case OMPC_device:
3615   case OMPC_threads:
3616   case OMPC_simd:
3617   case OMPC_map:
3618   case OMPC_num_teams:
3619   case OMPC_thread_limit:
3620   case OMPC_priority:
3621   case OMPC_grainsize:
3622   case OMPC_nogroup:
3623   case OMPC_num_tasks:
3624   case OMPC_hint:
3625   case OMPC_dist_schedule:
3626   case OMPC_defaultmap:
3627   case OMPC_uniform:
3628   case OMPC_to:
3629   case OMPC_from:
3630   case OMPC_use_device_ptr:
3631   case OMPC_is_device_ptr:
3632     llvm_unreachable("Clause is not allowed in 'omp atomic'.");
3633   }
3634 }
3635 
3636 void CodeGenFunction::EmitOMPAtomicDirective(const OMPAtomicDirective &S) {
3637   bool IsSeqCst = S.getSingleClause<OMPSeqCstClause>();
3638   OpenMPClauseKind Kind = OMPC_unknown;
3639   for (auto *C : S.clauses()) {
3640     // Find first clause (skip seq_cst clause, if it is first).
3641     if (C->getClauseKind() != OMPC_seq_cst) {
3642       Kind = C->getClauseKind();
3643       break;
3644     }
3645   }
3646 
3647   const auto *CS =
3648       S.getAssociatedStmt()->IgnoreContainers(/*IgnoreCaptured=*/true);
3649   if (const auto *EWC = dyn_cast<ExprWithCleanups>(CS)) {
3650     enterFullExpression(EWC);
3651   }
3652   // Processing for statements under 'atomic capture'.
3653   if (const auto *Compound = dyn_cast<CompoundStmt>(CS)) {
3654     for (const auto *C : Compound->body()) {
3655       if (const auto *EWC = dyn_cast<ExprWithCleanups>(C)) {
3656         enterFullExpression(EWC);
3657       }
3658     }
3659   }
3660 
3661   auto &&CodeGen = [&S, Kind, IsSeqCst, CS](CodeGenFunction &CGF,
3662                                             PrePostActionTy &) {
3663     CGF.EmitStopPoint(CS);
3664     EmitOMPAtomicExpr(CGF, Kind, IsSeqCst, S.isPostfixUpdate(), S.getX(),
3665                       S.getV(), S.getExpr(), S.getUpdateExpr(),
3666                       S.isXLHSInRHSPart(), S.getLocStart());
3667   };
3668   OMPLexicalScope Scope(*this, S, /*AsInlined=*/true);
3669   CGM.getOpenMPRuntime().emitInlinedDirective(*this, OMPD_atomic, CodeGen);
3670 }
3671 
3672 static void emitCommonOMPTargetDirective(CodeGenFunction &CGF,
3673                                          const OMPExecutableDirective &S,
3674                                          const RegionCodeGenTy &CodeGen) {
3675   assert(isOpenMPTargetExecutionDirective(S.getDirectiveKind()));
3676   CodeGenModule &CGM = CGF.CGM;
3677   const CapturedStmt &CS = *cast<CapturedStmt>(S.getAssociatedStmt());
3678 
3679   llvm::Function *Fn = nullptr;
3680   llvm::Constant *FnID = nullptr;
3681 
3682   const Expr *IfCond = nullptr;
3683   // Check for the at most one if clause associated with the target region.
3684   for (const auto *C : S.getClausesOfKind<OMPIfClause>()) {
3685     if (C->getNameModifier() == OMPD_unknown ||
3686         C->getNameModifier() == OMPD_target) {
3687       IfCond = C->getCondition();
3688       break;
3689     }
3690   }
3691 
3692   // Check if we have any device clause associated with the directive.
3693   const Expr *Device = nullptr;
3694   if (auto *C = S.getSingleClause<OMPDeviceClause>()) {
3695     Device = C->getDevice();
3696   }
3697 
3698   // Check if we have an if clause whose conditional always evaluates to false
3699   // or if we do not have any targets specified. If so the target region is not
3700   // an offload entry point.
3701   bool IsOffloadEntry = true;
3702   if (IfCond) {
3703     bool Val;
3704     if (CGF.ConstantFoldsToSimpleInteger(IfCond, Val) && !Val)
3705       IsOffloadEntry = false;
3706   }
3707   if (CGM.getLangOpts().OMPTargetTriples.empty())
3708     IsOffloadEntry = false;
3709 
3710   assert(CGF.CurFuncDecl && "No parent declaration for target region!");
3711   StringRef ParentName;
3712   // In case we have Ctors/Dtors we use the complete type variant to produce
3713   // the mangling of the device outlined kernel.
3714   if (auto *D = dyn_cast<CXXConstructorDecl>(CGF.CurFuncDecl))
3715     ParentName = CGM.getMangledName(GlobalDecl(D, Ctor_Complete));
3716   else if (auto *D = dyn_cast<CXXDestructorDecl>(CGF.CurFuncDecl))
3717     ParentName = CGM.getMangledName(GlobalDecl(D, Dtor_Complete));
3718   else
3719     ParentName =
3720         CGM.getMangledName(GlobalDecl(cast<FunctionDecl>(CGF.CurFuncDecl)));
3721 
3722   // Emit target region as a standalone region.
3723   CGM.getOpenMPRuntime().emitTargetOutlinedFunction(S, ParentName, Fn, FnID,
3724                                                     IsOffloadEntry, CodeGen);
3725   OMPLexicalScope Scope(CGF, S);
3726   llvm::SmallVector<llvm::Value *, 16> CapturedVars;
3727   CGF.GenerateOpenMPCapturedVars(CS, CapturedVars);
3728   CGM.getOpenMPRuntime().emitTargetCall(CGF, S, Fn, FnID, IfCond, Device,
3729                                         CapturedVars);
3730 }
3731 
3732 static void emitTargetRegion(CodeGenFunction &CGF, const OMPTargetDirective &S,
3733                              PrePostActionTy &Action) {
3734   CodeGenFunction::OMPPrivateScope PrivateScope(CGF);
3735   (void)CGF.EmitOMPFirstprivateClause(S, PrivateScope);
3736   CGF.EmitOMPPrivateClause(S, PrivateScope);
3737   (void)PrivateScope.Privatize();
3738 
3739   Action.Enter(CGF);
3740   CGF.EmitStmt(cast<CapturedStmt>(S.getAssociatedStmt())->getCapturedStmt());
3741 }
3742 
3743 void CodeGenFunction::EmitOMPTargetDeviceFunction(CodeGenModule &CGM,
3744                                                   StringRef ParentName,
3745                                                   const OMPTargetDirective &S) {
3746   auto &&CodeGen = [&S](CodeGenFunction &CGF, PrePostActionTy &Action) {
3747     emitTargetRegion(CGF, S, Action);
3748   };
3749   llvm::Function *Fn;
3750   llvm::Constant *Addr;
3751   // Emit target region as a standalone region.
3752   CGM.getOpenMPRuntime().emitTargetOutlinedFunction(
3753       S, ParentName, Fn, Addr, /*IsOffloadEntry=*/true, CodeGen);
3754   assert(Fn && Addr && "Target device function emission failed.");
3755 }
3756 
3757 void CodeGenFunction::EmitOMPTargetDirective(const OMPTargetDirective &S) {
3758   auto &&CodeGen = [&S](CodeGenFunction &CGF, PrePostActionTy &Action) {
3759     emitTargetRegion(CGF, S, Action);
3760   };
3761   emitCommonOMPTargetDirective(*this, S, CodeGen);
3762 }
3763 
3764 static void emitCommonOMPTeamsDirective(CodeGenFunction &CGF,
3765                                         const OMPExecutableDirective &S,
3766                                         OpenMPDirectiveKind InnermostKind,
3767                                         const RegionCodeGenTy &CodeGen) {
3768   const CapturedStmt *CS = S.getCapturedStmt(OMPD_teams);
3769   auto OutlinedFn = CGF.CGM.getOpenMPRuntime().emitTeamsOutlinedFunction(
3770       S, *CS->getCapturedDecl()->param_begin(), InnermostKind, CodeGen);
3771 
3772   const OMPNumTeamsClause *NT = S.getSingleClause<OMPNumTeamsClause>();
3773   const OMPThreadLimitClause *TL = S.getSingleClause<OMPThreadLimitClause>();
3774   if (NT || TL) {
3775     Expr *NumTeams = (NT) ? NT->getNumTeams() : nullptr;
3776     Expr *ThreadLimit = (TL) ? TL->getThreadLimit() : nullptr;
3777 
3778     CGF.CGM.getOpenMPRuntime().emitNumTeamsClause(CGF, NumTeams, ThreadLimit,
3779                                                   S.getLocStart());
3780   }
3781 
3782   OMPTeamsScope Scope(CGF, S);
3783   llvm::SmallVector<llvm::Value *, 16> CapturedVars;
3784   CGF.GenerateOpenMPCapturedVars(*CS, CapturedVars);
3785   CGF.CGM.getOpenMPRuntime().emitTeamsCall(CGF, S, S.getLocStart(), OutlinedFn,
3786                                            CapturedVars);
3787 }
3788 
3789 void CodeGenFunction::EmitOMPTeamsDirective(const OMPTeamsDirective &S) {
3790   // Emit teams region as a standalone region.
3791   auto &&CodeGen = [&S](CodeGenFunction &CGF, PrePostActionTy &) {
3792     OMPPrivateScope PrivateScope(CGF);
3793     (void)CGF.EmitOMPFirstprivateClause(S, PrivateScope);
3794     CGF.EmitOMPPrivateClause(S, PrivateScope);
3795     CGF.EmitOMPReductionClauseInit(S, PrivateScope);
3796     (void)PrivateScope.Privatize();
3797     CGF.EmitStmt(cast<CapturedStmt>(S.getAssociatedStmt())->getCapturedStmt());
3798     CGF.EmitOMPReductionClauseFinal(S, /*ReductionKind=*/OMPD_teams);
3799   };
3800   emitCommonOMPTeamsDirective(*this, S, OMPD_teams, CodeGen);
3801   emitPostUpdateForReductionClause(
3802       *this, S, [](CodeGenFunction &) -> llvm::Value * { return nullptr; });
3803 }
3804 
3805 static void emitTargetTeamsRegion(CodeGenFunction &CGF, PrePostActionTy &Action,
3806                                   const OMPTargetTeamsDirective &S) {
3807   auto *CS = S.getCapturedStmt(OMPD_teams);
3808   Action.Enter(CGF);
3809   auto &&CodeGen = [CS](CodeGenFunction &CGF, PrePostActionTy &) {
3810     // TODO: Add support for clauses.
3811     CGF.EmitStmt(CS->getCapturedStmt());
3812   };
3813   emitCommonOMPTeamsDirective(CGF, S, OMPD_teams, CodeGen);
3814 }
3815 
3816 void CodeGenFunction::EmitOMPTargetTeamsDeviceFunction(
3817     CodeGenModule &CGM, StringRef ParentName,
3818     const OMPTargetTeamsDirective &S) {
3819   auto &&CodeGen = [&S](CodeGenFunction &CGF, PrePostActionTy &Action) {
3820     emitTargetTeamsRegion(CGF, Action, S);
3821   };
3822   llvm::Function *Fn;
3823   llvm::Constant *Addr;
3824   // Emit target region as a standalone region.
3825   CGM.getOpenMPRuntime().emitTargetOutlinedFunction(
3826       S, ParentName, Fn, Addr, /*IsOffloadEntry=*/true, CodeGen);
3827   assert(Fn && Addr && "Target device function emission failed.");
3828 }
3829 
3830 void CodeGenFunction::EmitOMPTargetTeamsDirective(
3831     const OMPTargetTeamsDirective &S) {
3832   auto &&CodeGen = [&S](CodeGenFunction &CGF, PrePostActionTy &Action) {
3833     emitTargetTeamsRegion(CGF, Action, S);
3834   };
3835   emitCommonOMPTargetDirective(*this, S, CodeGen);
3836 }
3837 
3838 void CodeGenFunction::EmitOMPTeamsDistributeDirective(
3839     const OMPTeamsDistributeDirective &S) {
3840 
3841   auto &&CodeGenDistribute = [&S](CodeGenFunction &CGF, PrePostActionTy &) {
3842     CGF.EmitOMPDistributeLoop(S, emitOMPLoopBodyWithStopPoint, S.getInc());
3843   };
3844 
3845   // Emit teams region as a standalone region.
3846   auto &&CodeGen = [&S, &CodeGenDistribute](CodeGenFunction &CGF,
3847                                             PrePostActionTy &) {
3848     OMPPrivateScope PrivateScope(CGF);
3849     CGF.EmitOMPReductionClauseInit(S, PrivateScope);
3850     (void)PrivateScope.Privatize();
3851     CGF.CGM.getOpenMPRuntime().emitInlinedDirective(CGF, OMPD_distribute,
3852                                                     CodeGenDistribute);
3853     CGF.EmitOMPReductionClauseFinal(S, /*ReductionKind=*/OMPD_teams);
3854   };
3855   emitCommonOMPTeamsDirective(*this, S, OMPD_teams, CodeGen);
3856   emitPostUpdateForReductionClause(*this, S,
3857                                    [](CodeGenFunction &) { return nullptr; });
3858 }
3859 
3860 void CodeGenFunction::EmitOMPCancellationPointDirective(
3861     const OMPCancellationPointDirective &S) {
3862   CGM.getOpenMPRuntime().emitCancellationPointCall(*this, S.getLocStart(),
3863                                                    S.getCancelRegion());
3864 }
3865 
3866 void CodeGenFunction::EmitOMPCancelDirective(const OMPCancelDirective &S) {
3867   const Expr *IfCond = nullptr;
3868   for (const auto *C : S.getClausesOfKind<OMPIfClause>()) {
3869     if (C->getNameModifier() == OMPD_unknown ||
3870         C->getNameModifier() == OMPD_cancel) {
3871       IfCond = C->getCondition();
3872       break;
3873     }
3874   }
3875   CGM.getOpenMPRuntime().emitCancelCall(*this, S.getLocStart(), IfCond,
3876                                         S.getCancelRegion());
3877 }
3878 
3879 CodeGenFunction::JumpDest
3880 CodeGenFunction::getOMPCancelDestination(OpenMPDirectiveKind Kind) {
3881   if (Kind == OMPD_parallel || Kind == OMPD_task ||
3882       Kind == OMPD_target_parallel)
3883     return ReturnBlock;
3884   assert(Kind == OMPD_for || Kind == OMPD_section || Kind == OMPD_sections ||
3885          Kind == OMPD_parallel_sections || Kind == OMPD_parallel_for ||
3886          Kind == OMPD_distribute_parallel_for ||
3887          Kind == OMPD_target_parallel_for);
3888   return OMPCancelStack.getExitBlock();
3889 }
3890 
3891 void CodeGenFunction::EmitOMPUseDevicePtrClause(
3892     const OMPClause &NC, OMPPrivateScope &PrivateScope,
3893     const llvm::DenseMap<const ValueDecl *, Address> &CaptureDeviceAddrMap) {
3894   const auto &C = cast<OMPUseDevicePtrClause>(NC);
3895   auto OrigVarIt = C.varlist_begin();
3896   auto InitIt = C.inits().begin();
3897   for (auto PvtVarIt : C.private_copies()) {
3898     auto *OrigVD = cast<VarDecl>(cast<DeclRefExpr>(*OrigVarIt)->getDecl());
3899     auto *InitVD = cast<VarDecl>(cast<DeclRefExpr>(*InitIt)->getDecl());
3900     auto *PvtVD = cast<VarDecl>(cast<DeclRefExpr>(PvtVarIt)->getDecl());
3901 
3902     // In order to identify the right initializer we need to match the
3903     // declaration used by the mapping logic. In some cases we may get
3904     // OMPCapturedExprDecl that refers to the original declaration.
3905     const ValueDecl *MatchingVD = OrigVD;
3906     if (auto *OED = dyn_cast<OMPCapturedExprDecl>(MatchingVD)) {
3907       // OMPCapturedExprDecl are used to privative fields of the current
3908       // structure.
3909       auto *ME = cast<MemberExpr>(OED->getInit());
3910       assert(isa<CXXThisExpr>(ME->getBase()) &&
3911              "Base should be the current struct!");
3912       MatchingVD = ME->getMemberDecl();
3913     }
3914 
3915     // If we don't have information about the current list item, move on to
3916     // the next one.
3917     auto InitAddrIt = CaptureDeviceAddrMap.find(MatchingVD);
3918     if (InitAddrIt == CaptureDeviceAddrMap.end())
3919       continue;
3920 
3921     bool IsRegistered = PrivateScope.addPrivate(OrigVD, [&]() -> Address {
3922       // Initialize the temporary initialization variable with the address we
3923       // get from the runtime library. We have to cast the source address
3924       // because it is always a void *. References are materialized in the
3925       // privatization scope, so the initialization here disregards the fact
3926       // the original variable is a reference.
3927       QualType AddrQTy =
3928           getContext().getPointerType(OrigVD->getType().getNonReferenceType());
3929       llvm::Type *AddrTy = ConvertTypeForMem(AddrQTy);
3930       Address InitAddr = Builder.CreateBitCast(InitAddrIt->second, AddrTy);
3931       setAddrOfLocalVar(InitVD, InitAddr);
3932 
3933       // Emit private declaration, it will be initialized by the value we
3934       // declaration we just added to the local declarations map.
3935       EmitDecl(*PvtVD);
3936 
3937       // The initialization variables reached its purpose in the emission
3938       // ofthe previous declaration, so we don't need it anymore.
3939       LocalDeclMap.erase(InitVD);
3940 
3941       // Return the address of the private variable.
3942       return GetAddrOfLocalVar(PvtVD);
3943     });
3944     assert(IsRegistered && "firstprivate var already registered as private");
3945     // Silence the warning about unused variable.
3946     (void)IsRegistered;
3947 
3948     ++OrigVarIt;
3949     ++InitIt;
3950   }
3951 }
3952 
3953 // Generate the instructions for '#pragma omp target data' directive.
3954 void CodeGenFunction::EmitOMPTargetDataDirective(
3955     const OMPTargetDataDirective &S) {
3956   CGOpenMPRuntime::TargetDataInfo Info(/*RequiresDevicePointerInfo=*/true);
3957 
3958   // Create a pre/post action to signal the privatization of the device pointer.
3959   // This action can be replaced by the OpenMP runtime code generation to
3960   // deactivate privatization.
3961   bool PrivatizeDevicePointers = false;
3962   class DevicePointerPrivActionTy : public PrePostActionTy {
3963     bool &PrivatizeDevicePointers;
3964 
3965   public:
3966     explicit DevicePointerPrivActionTy(bool &PrivatizeDevicePointers)
3967         : PrePostActionTy(), PrivatizeDevicePointers(PrivatizeDevicePointers) {}
3968     void Enter(CodeGenFunction &CGF) override {
3969       PrivatizeDevicePointers = true;
3970     }
3971   };
3972   DevicePointerPrivActionTy PrivAction(PrivatizeDevicePointers);
3973 
3974   auto &&CodeGen = [&S, &Info, &PrivatizeDevicePointers](
3975       CodeGenFunction &CGF, PrePostActionTy &Action) {
3976     auto &&InnermostCodeGen = [&S](CodeGenFunction &CGF, PrePostActionTy &) {
3977       CGF.EmitStmt(
3978           cast<CapturedStmt>(S.getAssociatedStmt())->getCapturedStmt());
3979     };
3980 
3981     // Codegen that selects wheather to generate the privatization code or not.
3982     auto &&PrivCodeGen = [&S, &Info, &PrivatizeDevicePointers,
3983                           &InnermostCodeGen](CodeGenFunction &CGF,
3984                                              PrePostActionTy &Action) {
3985       RegionCodeGenTy RCG(InnermostCodeGen);
3986       PrivatizeDevicePointers = false;
3987 
3988       // Call the pre-action to change the status of PrivatizeDevicePointers if
3989       // needed.
3990       Action.Enter(CGF);
3991 
3992       if (PrivatizeDevicePointers) {
3993         OMPPrivateScope PrivateScope(CGF);
3994         // Emit all instances of the use_device_ptr clause.
3995         for (const auto *C : S.getClausesOfKind<OMPUseDevicePtrClause>())
3996           CGF.EmitOMPUseDevicePtrClause(*C, PrivateScope,
3997                                         Info.CaptureDeviceAddrMap);
3998         (void)PrivateScope.Privatize();
3999         RCG(CGF);
4000       } else
4001         RCG(CGF);
4002     };
4003 
4004     // Forward the provided action to the privatization codegen.
4005     RegionCodeGenTy PrivRCG(PrivCodeGen);
4006     PrivRCG.setAction(Action);
4007 
4008     // Notwithstanding the body of the region is emitted as inlined directive,
4009     // we don't use an inline scope as changes in the references inside the
4010     // region are expected to be visible outside, so we do not privative them.
4011     OMPLexicalScope Scope(CGF, S);
4012     CGF.CGM.getOpenMPRuntime().emitInlinedDirective(CGF, OMPD_target_data,
4013                                                     PrivRCG);
4014   };
4015 
4016   RegionCodeGenTy RCG(CodeGen);
4017 
4018   // If we don't have target devices, don't bother emitting the data mapping
4019   // code.
4020   if (CGM.getLangOpts().OMPTargetTriples.empty()) {
4021     RCG(*this);
4022     return;
4023   }
4024 
4025   // Check if we have any if clause associated with the directive.
4026   const Expr *IfCond = nullptr;
4027   if (auto *C = S.getSingleClause<OMPIfClause>())
4028     IfCond = C->getCondition();
4029 
4030   // Check if we have any device clause associated with the directive.
4031   const Expr *Device = nullptr;
4032   if (auto *C = S.getSingleClause<OMPDeviceClause>())
4033     Device = C->getDevice();
4034 
4035   // Set the action to signal privatization of device pointers.
4036   RCG.setAction(PrivAction);
4037 
4038   // Emit region code.
4039   CGM.getOpenMPRuntime().emitTargetDataCalls(*this, S, IfCond, Device, RCG,
4040                                              Info);
4041 }
4042 
4043 void CodeGenFunction::EmitOMPTargetEnterDataDirective(
4044     const OMPTargetEnterDataDirective &S) {
4045   // If we don't have target devices, don't bother emitting the data mapping
4046   // code.
4047   if (CGM.getLangOpts().OMPTargetTriples.empty())
4048     return;
4049 
4050   // Check if we have any if clause associated with the directive.
4051   const Expr *IfCond = nullptr;
4052   if (auto *C = S.getSingleClause<OMPIfClause>())
4053     IfCond = C->getCondition();
4054 
4055   // Check if we have any device clause associated with the directive.
4056   const Expr *Device = nullptr;
4057   if (auto *C = S.getSingleClause<OMPDeviceClause>())
4058     Device = C->getDevice();
4059 
4060   CGM.getOpenMPRuntime().emitTargetDataStandAloneCall(*this, S, IfCond, Device);
4061 }
4062 
4063 void CodeGenFunction::EmitOMPTargetExitDataDirective(
4064     const OMPTargetExitDataDirective &S) {
4065   // If we don't have target devices, don't bother emitting the data mapping
4066   // code.
4067   if (CGM.getLangOpts().OMPTargetTriples.empty())
4068     return;
4069 
4070   // Check if we have any if clause associated with the directive.
4071   const Expr *IfCond = nullptr;
4072   if (auto *C = S.getSingleClause<OMPIfClause>())
4073     IfCond = C->getCondition();
4074 
4075   // Check if we have any device clause associated with the directive.
4076   const Expr *Device = nullptr;
4077   if (auto *C = S.getSingleClause<OMPDeviceClause>())
4078     Device = C->getDevice();
4079 
4080   CGM.getOpenMPRuntime().emitTargetDataStandAloneCall(*this, S, IfCond, Device);
4081 }
4082 
4083 static void emitTargetParallelRegion(CodeGenFunction &CGF,
4084                                      const OMPTargetParallelDirective &S,
4085                                      PrePostActionTy &Action) {
4086   // Get the captured statement associated with the 'parallel' region.
4087   auto *CS = S.getCapturedStmt(OMPD_parallel);
4088   Action.Enter(CGF);
4089   auto &&CodeGen = [&S, CS](CodeGenFunction &CGF, PrePostActionTy &) {
4090     CodeGenFunction::OMPPrivateScope PrivateScope(CGF);
4091     (void)CGF.EmitOMPFirstprivateClause(S, PrivateScope);
4092     CGF.EmitOMPPrivateClause(S, PrivateScope);
4093     CGF.EmitOMPReductionClauseInit(S, PrivateScope);
4094     (void)PrivateScope.Privatize();
4095     // TODO: Add support for clauses.
4096     CGF.EmitStmt(CS->getCapturedStmt());
4097     CGF.EmitOMPReductionClauseFinal(S, /*ReductionKind=*/OMPD_parallel);
4098   };
4099   emitCommonOMPParallelDirective(CGF, S, OMPD_parallel, CodeGen,
4100                                  emitEmptyBoundParameters);
4101   emitPostUpdateForReductionClause(
4102       CGF, S, [](CodeGenFunction &) -> llvm::Value * { return nullptr; });
4103 }
4104 
4105 void CodeGenFunction::EmitOMPTargetParallelDeviceFunction(
4106     CodeGenModule &CGM, StringRef ParentName,
4107     const OMPTargetParallelDirective &S) {
4108   auto &&CodeGen = [&S](CodeGenFunction &CGF, PrePostActionTy &Action) {
4109     emitTargetParallelRegion(CGF, S, Action);
4110   };
4111   llvm::Function *Fn;
4112   llvm::Constant *Addr;
4113   // Emit target region as a standalone region.
4114   CGM.getOpenMPRuntime().emitTargetOutlinedFunction(
4115       S, ParentName, Fn, Addr, /*IsOffloadEntry=*/true, CodeGen);
4116   assert(Fn && Addr && "Target device function emission failed.");
4117 }
4118 
4119 void CodeGenFunction::EmitOMPTargetParallelDirective(
4120     const OMPTargetParallelDirective &S) {
4121   auto &&CodeGen = [&S](CodeGenFunction &CGF, PrePostActionTy &Action) {
4122     emitTargetParallelRegion(CGF, S, Action);
4123   };
4124   emitCommonOMPTargetDirective(*this, S, CodeGen);
4125 }
4126 
4127 void CodeGenFunction::EmitOMPTargetParallelForDirective(
4128     const OMPTargetParallelForDirective &S) {
4129   // TODO: codegen for target parallel for.
4130 }
4131 
4132 /// Emit a helper variable and return corresponding lvalue.
4133 static void mapParam(CodeGenFunction &CGF, const DeclRefExpr *Helper,
4134                      const ImplicitParamDecl *PVD,
4135                      CodeGenFunction::OMPPrivateScope &Privates) {
4136   auto *VDecl = cast<VarDecl>(Helper->getDecl());
4137   Privates.addPrivate(
4138       VDecl, [&CGF, PVD]() -> Address { return CGF.GetAddrOfLocalVar(PVD); });
4139 }
4140 
4141 void CodeGenFunction::EmitOMPTaskLoopBasedDirective(const OMPLoopDirective &S) {
4142   assert(isOpenMPTaskLoopDirective(S.getDirectiveKind()));
4143   // Emit outlined function for task construct.
4144   auto CS = cast<CapturedStmt>(S.getAssociatedStmt());
4145   auto CapturedStruct = GenerateCapturedStmtArgument(*CS);
4146   auto SharedsTy = getContext().getRecordType(CS->getCapturedRecordDecl());
4147   const Expr *IfCond = nullptr;
4148   for (const auto *C : S.getClausesOfKind<OMPIfClause>()) {
4149     if (C->getNameModifier() == OMPD_unknown ||
4150         C->getNameModifier() == OMPD_taskloop) {
4151       IfCond = C->getCondition();
4152       break;
4153     }
4154   }
4155 
4156   OMPTaskDataTy Data;
4157   // Check if taskloop must be emitted without taskgroup.
4158   Data.Nogroup = S.getSingleClause<OMPNogroupClause>();
4159   // TODO: Check if we should emit tied or untied task.
4160   Data.Tied = true;
4161   // Set scheduling for taskloop
4162   if (const auto* Clause = S.getSingleClause<OMPGrainsizeClause>()) {
4163     // grainsize clause
4164     Data.Schedule.setInt(/*IntVal=*/false);
4165     Data.Schedule.setPointer(EmitScalarExpr(Clause->getGrainsize()));
4166   } else if (const auto* Clause = S.getSingleClause<OMPNumTasksClause>()) {
4167     // num_tasks clause
4168     Data.Schedule.setInt(/*IntVal=*/true);
4169     Data.Schedule.setPointer(EmitScalarExpr(Clause->getNumTasks()));
4170   }
4171 
4172   auto &&BodyGen = [CS, &S](CodeGenFunction &CGF, PrePostActionTy &) {
4173     // if (PreCond) {
4174     //   for (IV in 0..LastIteration) BODY;
4175     //   <Final counter/linear vars updates>;
4176     // }
4177     //
4178 
4179     // Emit: if (PreCond) - begin.
4180     // If the condition constant folds and can be elided, avoid emitting the
4181     // whole loop.
4182     bool CondConstant;
4183     llvm::BasicBlock *ContBlock = nullptr;
4184     OMPLoopScope PreInitScope(CGF, S);
4185     if (CGF.ConstantFoldsToSimpleInteger(S.getPreCond(), CondConstant)) {
4186       if (!CondConstant)
4187         return;
4188     } else {
4189       auto *ThenBlock = CGF.createBasicBlock("taskloop.if.then");
4190       ContBlock = CGF.createBasicBlock("taskloop.if.end");
4191       emitPreCond(CGF, S, S.getPreCond(), ThenBlock, ContBlock,
4192                   CGF.getProfileCount(&S));
4193       CGF.EmitBlock(ThenBlock);
4194       CGF.incrementProfileCounter(&S);
4195     }
4196 
4197     if (isOpenMPSimdDirective(S.getDirectiveKind()))
4198       CGF.EmitOMPSimdInit(S);
4199 
4200     OMPPrivateScope LoopScope(CGF);
4201     // Emit helper vars inits.
4202     enum { LowerBound = 5, UpperBound, Stride, LastIter };
4203     auto *I = CS->getCapturedDecl()->param_begin();
4204     auto *LBP = std::next(I, LowerBound);
4205     auto *UBP = std::next(I, UpperBound);
4206     auto *STP = std::next(I, Stride);
4207     auto *LIP = std::next(I, LastIter);
4208     mapParam(CGF, cast<DeclRefExpr>(S.getLowerBoundVariable()), *LBP,
4209              LoopScope);
4210     mapParam(CGF, cast<DeclRefExpr>(S.getUpperBoundVariable()), *UBP,
4211              LoopScope);
4212     mapParam(CGF, cast<DeclRefExpr>(S.getStrideVariable()), *STP, LoopScope);
4213     mapParam(CGF, cast<DeclRefExpr>(S.getIsLastIterVariable()), *LIP,
4214              LoopScope);
4215     CGF.EmitOMPPrivateLoopCounters(S, LoopScope);
4216     bool HasLastprivateClause = CGF.EmitOMPLastprivateClauseInit(S, LoopScope);
4217     (void)LoopScope.Privatize();
4218     // Emit the loop iteration variable.
4219     const Expr *IVExpr = S.getIterationVariable();
4220     const VarDecl *IVDecl = cast<VarDecl>(cast<DeclRefExpr>(IVExpr)->getDecl());
4221     CGF.EmitVarDecl(*IVDecl);
4222     CGF.EmitIgnoredExpr(S.getInit());
4223 
4224     // Emit the iterations count variable.
4225     // If it is not a variable, Sema decided to calculate iterations count on
4226     // each iteration (e.g., it is foldable into a constant).
4227     if (auto LIExpr = dyn_cast<DeclRefExpr>(S.getLastIteration())) {
4228       CGF.EmitVarDecl(*cast<VarDecl>(LIExpr->getDecl()));
4229       // Emit calculation of the iterations count.
4230       CGF.EmitIgnoredExpr(S.getCalcLastIteration());
4231     }
4232 
4233     CGF.EmitOMPInnerLoop(S, LoopScope.requiresCleanups(), S.getCond(),
4234                          S.getInc(),
4235                          [&S](CodeGenFunction &CGF) {
4236                            CGF.EmitOMPLoopBody(S, JumpDest());
4237                            CGF.EmitStopPoint(&S);
4238                          },
4239                          [](CodeGenFunction &) {});
4240     // Emit: if (PreCond) - end.
4241     if (ContBlock) {
4242       CGF.EmitBranch(ContBlock);
4243       CGF.EmitBlock(ContBlock, true);
4244     }
4245     // Emit final copy of the lastprivate variables if IsLastIter != 0.
4246     if (HasLastprivateClause) {
4247       CGF.EmitOMPLastprivateClauseFinal(
4248           S, isOpenMPSimdDirective(S.getDirectiveKind()),
4249           CGF.Builder.CreateIsNotNull(CGF.EmitLoadOfScalar(
4250               CGF.GetAddrOfLocalVar(*LIP), /*Volatile=*/false,
4251               (*LIP)->getType(), S.getLocStart())));
4252     }
4253   };
4254   auto &&TaskGen = [&S, SharedsTy, CapturedStruct,
4255                     IfCond](CodeGenFunction &CGF, llvm::Value *OutlinedFn,
4256                             const OMPTaskDataTy &Data) {
4257     auto &&CodeGen = [&](CodeGenFunction &CGF, PrePostActionTy &) {
4258       OMPLoopScope PreInitScope(CGF, S);
4259       CGF.CGM.getOpenMPRuntime().emitTaskLoopCall(CGF, S.getLocStart(), S,
4260                                                   OutlinedFn, SharedsTy,
4261                                                   CapturedStruct, IfCond, Data);
4262     };
4263     CGF.CGM.getOpenMPRuntime().emitInlinedDirective(CGF, OMPD_taskloop,
4264                                                     CodeGen);
4265   };
4266   if (Data.Nogroup)
4267     EmitOMPTaskBasedDirective(S, BodyGen, TaskGen, Data);
4268   else {
4269     CGM.getOpenMPRuntime().emitTaskgroupRegion(
4270         *this,
4271         [&S, &BodyGen, &TaskGen, &Data](CodeGenFunction &CGF,
4272                                         PrePostActionTy &Action) {
4273           Action.Enter(CGF);
4274           CGF.EmitOMPTaskBasedDirective(S, BodyGen, TaskGen, Data);
4275         },
4276         S.getLocStart());
4277   }
4278 }
4279 
4280 void CodeGenFunction::EmitOMPTaskLoopDirective(const OMPTaskLoopDirective &S) {
4281   EmitOMPTaskLoopBasedDirective(S);
4282 }
4283 
4284 void CodeGenFunction::EmitOMPTaskLoopSimdDirective(
4285     const OMPTaskLoopSimdDirective &S) {
4286   EmitOMPTaskLoopBasedDirective(S);
4287 }
4288 
4289 // Generate the instructions for '#pragma omp target update' directive.
4290 void CodeGenFunction::EmitOMPTargetUpdateDirective(
4291     const OMPTargetUpdateDirective &S) {
4292   // If we don't have target devices, don't bother emitting the data mapping
4293   // code.
4294   if (CGM.getLangOpts().OMPTargetTriples.empty())
4295     return;
4296 
4297   // Check if we have any if clause associated with the directive.
4298   const Expr *IfCond = nullptr;
4299   if (auto *C = S.getSingleClause<OMPIfClause>())
4300     IfCond = C->getCondition();
4301 
4302   // Check if we have any device clause associated with the directive.
4303   const Expr *Device = nullptr;
4304   if (auto *C = S.getSingleClause<OMPDeviceClause>())
4305     Device = C->getDevice();
4306 
4307   CGM.getOpenMPRuntime().emitTargetDataStandAloneCall(*this, S, IfCond, Device);
4308 }
4309