Skip to content

Commit 90b4cd0

Browse files
committed
[rebase] run clang-format on all Lower/Optimizer files
1 parent 3d9b07f commit 90b4cd0

23 files changed

+259
-214
lines changed

flang/include/flang/Optimizer/Builder/DoLoopHelper.h

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -30,14 +30,14 @@ class DoLoopHelper {
3030
/// Build loop [\p lb, \p ub] with step \p step.
3131
/// If \p step is an empty value, 1 is used for the step.
3232
fir::DoLoopOp createLoop(mlir::Value lb, mlir::Value ub, mlir::Value step,
33-
const BodyGenerator &bodyGenerator);
33+
const BodyGenerator &bodyGenerator);
3434

3535
/// Build loop [\p lb, \p ub] with step 1.
3636
fir::DoLoopOp createLoop(mlir::Value lb, mlir::Value ub,
3737
const BodyGenerator &bodyGenerator);
3838

3939
/// Build loop [0, \p count) with step 1.
40-
fir::DoLoopOp createLoop(mlir::Value count,
40+
fir::DoLoopOp createLoop(mlir::Value count,
4141
const BodyGenerator &bodyGenerator);
4242

4343
private:

flang/include/flang/Optimizer/Builder/Factory.h

Lines changed: 10 additions & 9 deletions
Original file line numberDiff line numberDiff line change
@@ -68,8 +68,8 @@ void genCharacterCopy(mlir::Value src, mlir::Value srcLen, mlir::Value dst,
6868
return fir::ReferenceType::get(toEleTy(ty));
6969
};
7070
if (!srcLen && !dstLen && srcTy.getLen() >= dstTy.getLen()) {
71-
auto upper =
72-
builder.template create<mlir::arith::ConstantIndexOp>(loc, dstTy.getLen() - 1);
71+
auto upper = builder.template create<mlir::arith::ConstantIndexOp>(
72+
loc, dstTy.getLen() - 1);
7373
auto loop = builder.template create<fir::DoLoopOp>(loc, zero, upper, one);
7474
auto insPt = builder.saveInsertionPoint();
7575
builder.setInsertionPointToStart(loop.getBody());
@@ -97,20 +97,21 @@ void genCharacterCopy(mlir::Value src, mlir::Value srcLen, mlir::Value dst,
9797
loc, builder.template create<fir::ConvertOp>(loc, one.getType(), v),
9898
one);
9999
};
100-
mlir::Value len =
101-
dstLen
102-
? minusOne(dstLen)
103-
: builder
104-
.template create<mlir::arith::ConstantIndexOp>(loc, dstTy.getLen() - 1)
105-
.getResult();
100+
mlir::Value len = dstLen ? minusOne(dstLen)
101+
: builder
102+
.template create<mlir::arith::ConstantIndexOp>(
103+
loc, dstTy.getLen() - 1)
104+
.getResult();
106105
auto loop = builder.template create<fir::DoLoopOp>(loc, zero, len, one);
107106
auto insPt = builder.saveInsertionPoint();
108107
builder.setInsertionPointToStart(loop.getBody());
109108
mlir::Value slen =
110109
srcLen
111110
? builder.template create<fir::ConvertOp>(loc, one.getType(), srcLen)
112111
.getResult()
113-
: builder.template create<mlir::arith::ConstantIndexOp>(loc, srcTy.getLen())
112+
: builder
113+
.template create<mlir::arith::ConstantIndexOp>(loc,
114+
srcTy.getLen())
114115
.getResult();
115116
auto cond = builder.template create<mlir::arith::CmpIOp>(
116117
loc, mlir::arith::CmpIPredicate::slt, loop.getInductionVar(), slen);

flang/include/flang/Optimizer/Dialect/FIRDialect.h

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -16,7 +16,7 @@
1616
#include "mlir/IR/Dialect.h"
1717

1818
namespace mlir {
19-
class BlockAndValueMapping;
19+
class BlockAndValueMapping;
2020
} // namespace mlir
2121

2222
namespace fir {

flang/include/flang/Optimizer/Support/InitFIR.h

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -30,7 +30,6 @@ namespace fir::support {
3030
mlir::arith::ArithmeticDialect, mlir::StandardOpsDialect, \
3131
mlir::vector::VectorDialect
3232

33-
3433
// The definitive list of dialects used by flang.
3534
#define FLANG_DIALECT_LIST \
3635
FLANG_NONCODEGEN_DIALECT_LIST, FIRCodeGenDialect, mlir::LLVM::LLVMDialect

flang/include/flang/Optimizer/Support/TypeCode.h

Lines changed: 1 addition & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -83,9 +83,7 @@ inline int realBitsToTypeCode(unsigned bits) {
8383
// clang-format on
8484
}
8585

86-
static constexpr int derivedToTypeCode() {
87-
return CFI_type_struct;
88-
}
86+
static constexpr int derivedToTypeCode() { return CFI_type_struct; }
8987

9088
} // namespace fir
9189

flang/lib/Lower/Allocatable.cpp

Lines changed: 5 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -18,9 +18,9 @@
1818
#include "flang/Lower/Runtime.h"
1919
#include "flang/Lower/Todo.h"
2020
#include "flang/Optimizer/Builder/FIRBuilder.h"
21+
#include "flang/Optimizer/Builder/Runtime/RTBuilder.h"
2122
#include "flang/Optimizer/Dialect/FIROps.h"
2223
#include "flang/Optimizer/Dialect/FIROpsSupport.h"
23-
#include "flang/Optimizer/Builder/Runtime/RTBuilder.h"
2424
#include "flang/Optimizer/Support/FatalError.h"
2525
#include "flang/Parser/parse-tree.h"
2626
#include "flang/Runtime/allocatable.h"
@@ -77,8 +77,8 @@ struct ErrorManager {
7777
void genStatCheck(fir::FirOpBuilder &builder, mlir::Location loc) {
7878
if (statValue) {
7979
auto zero = builder.createIntegerConstant(loc, statValue.getType(), 0);
80-
auto cmp = builder.create<mlir::arith::CmpIOp>(loc, mlir::arith::CmpIPredicate::eq,
81-
statValue, zero);
80+
auto cmp = builder.create<mlir::arith::CmpIOp>(
81+
loc, mlir::arith::CmpIPredicate::eq, statValue, zero);
8282
auto ifOp = builder.create<fir::IfOp>(loc, cmp,
8383
/*withElseRegion=*/false);
8484
builder.setInsertionPointToStart(&ifOp.thenRegion().front());
@@ -350,7 +350,8 @@ class AllocateStmtHelper {
350350
ub = builder.createConvert(loc, idxTy, ub);
351351
if (lb) {
352352
auto diff = builder.create<mlir::arith::SubIOp>(loc, ub, lb);
353-
extents.emplace_back(builder.create<mlir::arith::AddIOp>(loc, diff, one));
353+
extents.emplace_back(
354+
builder.create<mlir::arith::AddIOp>(loc, diff, one));
354355
} else {
355356
extents.emplace_back(ub);
356357
}

flang/lib/Lower/Bridge.cpp

Lines changed: 22 additions & 15 deletions
Original file line numberDiff line numberDiff line change
@@ -746,15 +746,15 @@ class FirConverter : public Fortran::lower::AbstractConverter {
746746
auto sum = builder->create<mlir::arith::AddFOp>(loc, expr, expr);
747747
auto zero = builder->create<mlir::arith::ConstantOp>(
748748
loc, exprType, builder->getFloatAttr(exprType, 0.0));
749-
auto cond1 =
750-
builder->create<mlir::arith::CmpFOp>(loc, mlir::arith::CmpFPredicate::OLT, sum, zero);
749+
auto cond1 = builder->create<mlir::arith::CmpFOp>(
750+
loc, mlir::arith::CmpFPredicate::OLT, sum, zero);
751751
auto *elseIfBlock =
752752
builder->getBlock()->splitBlock(builder->getInsertionPoint());
753753
genFIRConditionalBranch(cond1, blockOfLabel(eval, std::get<1>(stmt.t)),
754754
elseIfBlock);
755755
startBlock(elseIfBlock);
756-
auto cond2 =
757-
builder->create<mlir::arith::CmpFOp>(loc, mlir::arith::CmpFPredicate::OGT, sum, zero);
756+
auto cond2 = builder->create<mlir::arith::CmpFOp>(
757+
loc, mlir::arith::CmpFPredicate::OGT, sum, zero);
758758
genFIRConditionalBranch(cond2, blockOfLabel(eval, std::get<3>(stmt.t)),
759759
blockOfLabel(eval, std::get<2>(stmt.t)));
760760
}
@@ -1005,21 +1005,26 @@ class FirConverter : public Fortran::lower::AbstractConverter {
10051005
// Unstructured loop preheader - initialize tripVariable and loopVariable.
10061006
mlir::Value tripCount;
10071007
if (info.hasRealControl) {
1008-
auto diff1 = builder->create<mlir::arith::SubFOp>(loc, upperValue, lowerValue);
1009-
auto diff2 = builder->create<mlir::arith::AddFOp>(loc, diff1, info.stepValue);
1010-
tripCount = builder->create<mlir::arith::DivFOp>(loc, diff2, info.stepValue);
1008+
auto diff1 =
1009+
builder->create<mlir::arith::SubFOp>(loc, upperValue, lowerValue);
1010+
auto diff2 =
1011+
builder->create<mlir::arith::AddFOp>(loc, diff1, info.stepValue);
1012+
tripCount =
1013+
builder->create<mlir::arith::DivFOp>(loc, diff2, info.stepValue);
10111014
controlType = builder->getIndexType();
10121015
tripCount = builder->createConvert(loc, controlType, tripCount);
10131016
} else {
1014-
auto diff1 = builder->create<mlir::arith::SubIOp>(loc, upperValue, lowerValue);
1015-
auto diff2 = builder->create<mlir::arith::AddIOp>(loc, diff1, info.stepValue);
1017+
auto diff1 =
1018+
builder->create<mlir::arith::SubIOp>(loc, upperValue, lowerValue);
1019+
auto diff2 =
1020+
builder->create<mlir::arith::AddIOp>(loc, diff1, info.stepValue);
10161021
tripCount =
10171022
builder->create<mlir::arith::DivSIOp>(loc, diff2, info.stepValue);
10181023
}
10191024
if (forceLoopToExecuteOnce) { // minimum tripCount is 1
10201025
auto one = builder->createIntegerConstant(loc, controlType, 1);
1021-
auto cond = builder->create<mlir::arith::CmpIOp>(loc, mlir::arith::CmpIPredicate::slt,
1022-
tripCount, one);
1026+
auto cond = builder->create<mlir::arith::CmpIOp>(
1027+
loc, mlir::arith::CmpIPredicate::slt, tripCount, one);
10231028
tripCount = builder->create<mlir::SelectOp>(loc, cond, one, tripCount);
10241029
}
10251030
info.tripVariable = builder->createTemporary(loc, controlType);
@@ -1031,8 +1036,8 @@ class FirConverter : public Fortran::lower::AbstractConverter {
10311036
startBlock(info.headerBlock);
10321037
tripCount = builder->create<fir::LoadOp>(loc, info.tripVariable);
10331038
auto zero = builder->createIntegerConstant(loc, controlType, 0);
1034-
auto cond = builder->create<mlir::arith::CmpIOp>(loc, mlir::arith::CmpIPredicate::sgt,
1035-
tripCount, zero);
1039+
auto cond = builder->create<mlir::arith::CmpIOp>(
1040+
loc, mlir::arith::CmpIPredicate::sgt, tripCount, zero);
10361041
if (info.maskExpr) {
10371042
genFIRConditionalBranch(cond, info.maskBlock, info.exitBlock);
10381043
startBlock(info.maskBlock);
@@ -1092,9 +1097,11 @@ class FirConverter : public Fortran::lower::AbstractConverter {
10921097
builder->create<fir::StoreOp>(loc, tripCount, info.tripVariable);
10931098
mlir::Value value = builder->create<fir::LoadOp>(loc, info.loopVariable);
10941099
if (info.hasRealControl)
1095-
value = builder->create<mlir::arith::AddFOp>(loc, value, info.stepValue);
1100+
value =
1101+
builder->create<mlir::arith::AddFOp>(loc, value, info.stepValue);
10961102
else
1097-
value = builder->create<mlir::arith::AddIOp>(loc, value, info.stepValue);
1103+
value =
1104+
builder->create<mlir::arith::AddIOp>(loc, value, info.stepValue);
10981105
builder->create<fir::StoreOp>(loc, value, info.loopVariable);
10991106

11001107
genFIRBranch(info.headerBlock);

flang/lib/Lower/ConvertExpr.cpp

Lines changed: 42 additions & 28 deletions
Original file line numberDiff line numberDiff line change
@@ -424,8 +424,8 @@ class ScalarExprLowering {
424424
}
425425

426426
template <typename OpTy>
427-
mlir::Value createCompareOp(mlir::arith::CmpIPredicate pred, const ExtValue &left,
428-
const ExtValue &right) {
427+
mlir::Value createCompareOp(mlir::arith::CmpIPredicate pred,
428+
const ExtValue &left, const ExtValue &right) {
429429
if (auto *lhs = left.getUnboxed())
430430
if (auto *rhs = right.getUnboxed())
431431
return builder.create<OpTy>(getLoc(), pred, *lhs, *rhs);
@@ -438,8 +438,8 @@ class ScalarExprLowering {
438438
}
439439

440440
template <typename OpTy>
441-
mlir::Value createFltCmpOp(mlir::arith::CmpFPredicate pred, const ExtValue &left,
442-
const ExtValue &right) {
441+
mlir::Value createFltCmpOp(mlir::arith::CmpFPredicate pred,
442+
const ExtValue &left, const ExtValue &right) {
443443
if (auto *lhs = left.getUnboxed())
444444
if (auto *rhs = right.getUnboxed())
445445
return builder.create<OpTy>(getLoc(), pred, *lhs, *rhs);
@@ -453,8 +453,8 @@ class ScalarExprLowering {
453453

454454
/// Create a call to the runtime to compare two CHARACTER values.
455455
/// Precondition: This assumes that the two values have `fir.boxchar` type.
456-
mlir::Value createCharCompare(mlir::arith::CmpIPredicate pred, const ExtValue &left,
457-
const ExtValue &right) {
456+
mlir::Value createCharCompare(mlir::arith::CmpIPredicate pred,
457+
const ExtValue &left, const ExtValue &right) {
458458
return fir::runtime::genCharCompare(builder, getLoc(), pred, left, right);
459459
}
460460

@@ -879,12 +879,14 @@ class ScalarExprLowering {
879879
template <int KIND>
880880
ExtValue genval(const Fortran::evaluate::Relational<Fortran::evaluate::Type<
881881
Fortran::common::TypeCategory::Integer, KIND>> &op) {
882-
return createCompareOp<mlir::arith::CmpIOp>(op, translateRelational(op.opr));
882+
return createCompareOp<mlir::arith::CmpIOp>(op,
883+
translateRelational(op.opr));
883884
}
884885
template <int KIND>
885886
ExtValue genval(const Fortran::evaluate::Relational<Fortran::evaluate::Type<
886887
Fortran::common::TypeCategory::Real, KIND>> &op) {
887-
return createFltCmpOp<mlir::arith::CmpFOp>(op, translateFloatRelational(op.opr));
888+
return createFltCmpOp<mlir::arith::CmpFOp>(
889+
op, translateFloatRelational(op.opr));
888890
}
889891
template <int KIND>
890892
ExtValue genval(const Fortran::evaluate::Relational<Fortran::evaluate::Type<
@@ -942,9 +944,11 @@ class ScalarExprLowering {
942944
case Fortran::evaluate::LogicalOperator::Or:
943945
return createBinaryOp<mlir::arith::OrIOp>(lhs, rhs);
944946
case Fortran::evaluate::LogicalOperator::Eqv:
945-
return createCompareOp<mlir::arith::CmpIOp>(mlir::arith::CmpIPredicate::eq, lhs, rhs);
947+
return createCompareOp<mlir::arith::CmpIOp>(
948+
mlir::arith::CmpIPredicate::eq, lhs, rhs);
946949
case Fortran::evaluate::LogicalOperator::Neqv:
947-
return createCompareOp<mlir::arith::CmpIOp>(mlir::arith::CmpIPredicate::ne, lhs, rhs);
950+
return createCompareOp<mlir::arith::CmpIOp>(
951+
mlir::arith::CmpIPredicate::ne, lhs, rhs);
948952
case Fortran::evaluate::LogicalOperator::Not:
949953
// lib/evaluate expression for .NOT. is Fortran::evaluate::Not<KIND>.
950954
llvm_unreachable(".NOT. is not a binary operator");
@@ -3119,9 +3123,11 @@ class ScalarArrayExprLowering {
31193123
case Fortran::evaluate::LogicalOperator::Or:
31203124
return createBinaryBoolOp<mlir::arith::OrIOp>(x);
31213125
case Fortran::evaluate::LogicalOperator::Eqv:
3122-
return createCompareBoolOp<mlir::arith::CmpIOp>(mlir::arith::CmpIPredicate::eq, x);
3126+
return createCompareBoolOp<mlir::arith::CmpIOp>(
3127+
mlir::arith::CmpIPredicate::eq, x);
31233128
case Fortran::evaluate::LogicalOperator::Neqv:
3124-
return createCompareBoolOp<mlir::arith::CmpIOp>(mlir::arith::CmpIPredicate::ne, x);
3129+
return createCompareBoolOp<mlir::arith::CmpIOp>(
3130+
mlir::arith::CmpIPredicate::ne, x);
31253131
case Fortran::evaluate::LogicalOperator::Not:
31263132
llvm_unreachable(".NOT. handled elsewhere");
31273133
}
@@ -3156,7 +3162,8 @@ class ScalarArrayExprLowering {
31563162
ExtValue
31573163
gen(const Fortran::evaluate::Relational<
31583164
Fortran::evaluate::Type<Fortran::common::TypeCategory::Real, KIND>> &x) {
3159-
return createCompareOp<mlir::arith::CmpFOp>(translateFloatRelational(x.opr), x);
3165+
return createCompareOp<mlir::arith::CmpFOp>(translateFloatRelational(x.opr),
3166+
x);
31603167
}
31613168
template <int KIND>
31623169
ExtValue gen(const Fortran::evaluate::Relational<Fortran::evaluate::Type<
@@ -4043,8 +4050,8 @@ class ArrayExprLowering {
40434050
// Compute the dynamic position into the header.
40444051
llvm::SmallVector<mlir::Value> offsets;
40454052
for (auto doLoop : loopStack[i]) {
4046-
auto m = builder.create<mlir::arith::SubIOp>(loc, doLoop.getInductionVar(),
4047-
doLoop.lowerBound());
4053+
auto m = builder.create<mlir::arith::SubIOp>(
4054+
loc, doLoop.getInductionVar(), doLoop.lowerBound());
40484055
auto n = builder.create<mlir::arith::DivSIOp>(loc, m, doLoop.step());
40494056
auto one = builder.createIntegerConstant(loc, n.getType(), 1);
40504057
offsets.push_back(builder.create<mlir::arith::AddIOp>(loc, n, one));
@@ -4166,7 +4173,8 @@ class ArrayExprLowering {
41664173
// Convert any implied shape to closed interval form. The fir.do_loop will
41674174
// run from 0 to `extent - 1` inclusive.
41684175
for (auto extent : shape)
4169-
loopUppers.push_back(builder.create<mlir::arith::SubIOp>(loc, extent, one));
4176+
loopUppers.push_back(
4177+
builder.create<mlir::arith::SubIOp>(loc, extent, one));
41704178

41714179
// Iteration space is created with outermost columns, innermost rows
41724180
llvm::SmallVector<fir::DoLoopOp> loops;
@@ -5120,8 +5128,8 @@ class ArrayExprLowering {
51205128
loc, resTy, arrLd, mlir::ValueRange{iter},
51215129
arrLdTypeParams);
51225130
auto cast = builder.createConvert(loc, idxTy, fetch);
5123-
auto val =
5124-
builder.create<mlir::arith::SubIOp>(loc, idxTy, cast, lb);
5131+
auto val = builder.create<mlir::arith::SubIOp>(loc, idxTy,
5132+
cast, lb);
51255133
newIters.setIndexValue(dim, val);
51265134
return newIters;
51275135
};
@@ -5310,9 +5318,10 @@ class ArrayExprLowering {
53105318
// Convert the upper bound to a length.
53115319
auto cast = builder.createConvert(loc, iTy, substringBounds[1]);
53125320
auto zero = builder.createIntegerConstant(loc, iTy, 0);
5313-
auto size = builder.create<mlir::arith::SubIOp>(loc, cast, substringBounds[0]);
5314-
auto cmp = builder.create<mlir::arith::CmpIOp>(loc, mlir::arith::CmpIPredicate::sgt,
5315-
size, zero);
5321+
auto size =
5322+
builder.create<mlir::arith::SubIOp>(loc, cast, substringBounds[0]);
5323+
auto cmp = builder.create<mlir::arith::CmpIOp>(
5324+
loc, mlir::arith::CmpIPredicate::sgt, size, zero);
53165325
// size = MAX(upper - (lower - 1), 0)
53175326
substringBounds[1] =
53185327
builder.create<mlir::SelectOp>(loc, cmp, size, zero);
@@ -5695,8 +5704,8 @@ class ArrayExprLowering {
56955704
mlir::Value eleSz) {
56965705
auto loc = getLoc();
56975706
auto reallocFunc = fir::factory::getRealloc(builder);
5698-
auto cond = builder.create<mlir::arith::CmpIOp>(loc, mlir::arith::CmpIPredicate::sle,
5699-
bufferSize, needed);
5707+
auto cond = builder.create<mlir::arith::CmpIOp>(
5708+
loc, mlir::arith::CmpIPredicate::sle, bufferSize, needed);
57005709
auto ifOp = builder.create<fir::IfOp>(loc, mem.getType(), cond,
57015710
/*withElseRegion=*/true);
57025711
auto insPt = builder.saveInsertionPoint();
@@ -5790,7 +5799,8 @@ class ArrayExprLowering {
57905799
mem = growBuffer(mem, endOff, limit, buffSize, eleSz);
57915800

57925801
// Copy the elements to the buffer.
5793-
mlir::Value byteSz = builder.create<mlir::arith::MulIOp>(loc, arrSz, eleSz);
5802+
mlir::Value byteSz =
5803+
builder.create<mlir::arith::MulIOp>(loc, arrSz, eleSz);
57945804
auto buff = builder.createConvert(loc, fir::HeapType::get(resTy), mem);
57955805
auto buffi = computeCoordinate(buff, off);
57965806
auto args = fir::runtime::createArguments(
@@ -6064,9 +6074,11 @@ class ArrayExprLowering {
60646074
case Fortran::evaluate::LogicalOperator::Or:
60656075
return createBinaryBoolOp<mlir::arith::OrIOp>(x);
60666076
case Fortran::evaluate::LogicalOperator::Eqv:
6067-
return createCompareBoolOp<mlir::arith::CmpIOp>(mlir::arith::CmpIPredicate::eq, x);
6077+
return createCompareBoolOp<mlir::arith::CmpIOp>(
6078+
mlir::arith::CmpIPredicate::eq, x);
60686079
case Fortran::evaluate::LogicalOperator::Neqv:
6069-
return createCompareBoolOp<mlir::arith::CmpIOp>(mlir::arith::CmpIPredicate::ne, x);
6080+
return createCompareBoolOp<mlir::arith::CmpIOp>(
6081+
mlir::arith::CmpIPredicate::ne, x);
60706082
case Fortran::evaluate::LogicalOperator::Not:
60716083
llvm_unreachable(".NOT. handled elsewhere");
60726084
}
@@ -6112,7 +6124,8 @@ class ArrayExprLowering {
61126124
template <int KIND>
61136125
CC genarr(const Fortran::evaluate::Relational<Fortran::evaluate::Type<
61146126
Fortran::common::TypeCategory::Real, KIND>> &x) {
6115-
return createCompareOp<mlir::arith::CmpFOp>(translateFloatRelational(x.opr), x);
6127+
return createCompareOp<mlir::arith::CmpFOp>(translateFloatRelational(x.opr),
6128+
x);
61166129
}
61176130
template <int KIND>
61186131
CC genarr(const Fortran::evaluate::Relational<Fortran::evaluate::Type<
@@ -6179,7 +6192,8 @@ class ArrayExprLowering {
61796192
auto step = builder.createConvert(loc, idxTy, stride);
61806193
auto prod =
61816194
builder.create<mlir::arith::MulIOp>(loc, impliedIter, step);
6182-
auto trip = builder.create<mlir::arith::AddIOp>(loc, initial, prod);
6195+
auto trip =
6196+
builder.create<mlir::arith::AddIOp>(loc, initial, prod);
61836197
return trip;
61846198
}},
61856199
sub.u);

0 commit comments

Comments
 (0)