51 case Token::kw_affine_map: {
55 if (
parseToken(Token::less,
"expected '<' in affine map") ||
57 parseToken(Token::greater,
"expected '>' in affine map"))
61 case Token::kw_affine_set: {
65 if (
parseToken(Token::less,
"expected '<' in integer set") ||
67 parseToken(Token::greater,
"expected '>' in integer set"))
73 case Token::l_square: {
76 auto parseElt = [&]() -> ParseResult {
78 return elements.back() ? success() : failure();
99 case Token::kw_dense_resource:
103 case Token::kw_array:
107 case Token::l_brace: {
115 case Token::hash_identifier:
119 case Token::floatliteral:
127 if (
getToken().is(Token::floatliteral))
131 "expected constant integer or floating point value"),
136 case Token::kw_loc: {
140 if (
parseToken(Token::l_paren,
"expected '(' in inline location") ||
142 parseToken(Token::r_paren,
"expected ')' in inline location"))
148 case Token::kw_sparse:
152 case Token::kw_strided:
156 case Token::kw_distinct:
160 case Token::string: {
172 case Token::at_identifier: {
177 referenceLocations.push_back(
getToken().getLocRange());
184 std::vector<FlatSymbolRefAttr> nestedRefs;
185 while (
getToken().is(Token::colon)) {
190 if (
getToken().isNot(Token::eof, Token::error)) {
198 if (
getToken().isNot(Token::at_identifier)) {
199 emitError(curLoc,
"expected nested symbol reference identifier");
206 referenceLocations.push_back(
getToken().getLocRange());
212 SymbolRefAttr symbolRefAttr =
218 return symbolRefAttr;
227 case Token::code_complete:
228 if (
getToken().isCodeCompletionFor(Token::hash_identifier))
247 case Token::at_identifier:
248 case Token::floatliteral:
250 case Token::hash_identifier:
251 case Token::kw_affine_map:
252 case Token::kw_affine_set:
253 case Token::kw_dense:
254 case Token::kw_dense_resource:
255 case Token::kw_false:
257 case Token::kw_sparse:
261 case Token::l_square:
265 return success(attribute !=
nullptr);
271 if (result.
has_value() && succeeded(*result))
296 llvm::SmallDenseSet<StringAttr> seenKeys;
297 auto parseElt = [&]() -> ParseResult {
299 std::optional<StringAttr> nameId;
302 else if (
getToken().
isAny(Token::bare_identifier, Token::inttype) ||
309 return emitError(
"expected valid attribute name");
311 if (!seenKeys.insert(*nameId).second)
313 << nameId->getValue() <<
"' in dictionary attribute";
317 auto splitName = nameId->strref().split(
'.');
318 if (!splitName.second.empty())
336 " in attribute dictionary");
343 return (
emitError(
"floating point value too large for attribute"),
nullptr);
352 if (!isa<FloatType>(type))
353 return (
emitError(
"floating point value not valid for specified type"),
361 StringRef spelling) {
364 bool isHex = spelling.size() > 1 && spelling[1] ==
'x';
365 if (spelling.getAsInteger(isHex ? 0 : 10, result))
369 unsigned width = type.
isIndex() ? IndexType::kInternalStorageBitWidth
372 if (width > result.getBitWidth()) {
373 result = result.zext(width);
374 }
else if (width < result.getBitWidth()) {
377 if (result.countl_zero() < result.getBitWidth() - width)
380 result = result.trunc(width);
388 }
else if (isNegative) {
392 if (!result.isSignBitSet())
395 result.isSignBitSet()) {
420 if (
auto floatType = dyn_cast<FloatType>(type)) {
421 std::optional<APFloat> result;
423 floatType.getFloatSemantics())))
428 if (!isa<IntegerType, IndexType>(type))
429 return emitError(loc,
"integer literal not valid for specified type"),
434 "negative integer literal not valid for unsigned integer type");
440 return emitError(loc,
"integer constant out of range for attribute"),
452 std::string &result) {
454 result = std::move(*value);
458 tok.
getLoc(),
"expected string containing hex digits starting with `0x`");
465 class TensorLiteralParser {
467 TensorLiteralParser(
Parser &p) : p(p) {}
471 ParseResult
parse(
bool allowHex);
481 ParseResult getIntAttrElements(SMLoc loc,
Type eltTy,
482 std::vector<APInt> &intValues);
485 ParseResult getFloatAttrElements(SMLoc loc, FloatType eltTy,
486 std::vector<APFloat> &floatValues);
498 ParseResult parseElement();
509 ParseResult parseHexElements();
517 std::vector<std::pair<bool, Token>> storage;
520 std::optional<Token> hexStorage;
528 if (allowHex && p.getToken().is(Token::string)) {
529 hexStorage = p.getToken();
530 p.consumeToken(Token::string);
534 if (p.getToken().is(Token::l_square))
535 return parseList(shape);
536 return parseElement();
542 Type eltType = type.getElementType();
547 return getHexAttr(loc, type);
551 if (!shape.empty() &&
getShape() != type.getShape()) {
552 p.emitError(loc) <<
"inferred shape of elements literal ([" <<
getShape()
553 <<
"]) does not match type ([" << type.getShape() <<
"])";
558 if (!hexStorage && storage.empty() && type.getNumElements()) {
559 p.emitError(loc) <<
"parsed zero elements, but type (" << type
560 <<
") expected at least 1";
565 bool isComplex =
false;
566 if (ComplexType complexTy = dyn_cast<ComplexType>(eltType)) {
567 eltType = complexTy.getElementType();
571 bool isSplat = shape.empty() && type.getNumElements() != 0;
572 if (isSplat && storage.size() != 2) {
573 p.emitError(loc) <<
"parsed " << storage.size() <<
" elements, but type ("
574 << complexTy <<
") expected 2 elements";
577 if (!shape.empty() &&
578 storage.size() !=
static_cast<size_t>(type.getNumElements()) * 2) {
579 p.emitError(loc) <<
"parsed " << storage.size() <<
" elements, but type ("
580 << type <<
") expected " << type.getNumElements() * 2
588 std::vector<APInt> intValues;
589 if (failed(getIntAttrElements(loc, eltType, intValues)))
594 reinterpret_cast<std::complex<APInt> *
>(intValues.data()),
595 intValues.size() / 2);
601 if (FloatType floatTy = dyn_cast<FloatType>(eltType)) {
602 std::vector<APFloat> floatValues;
603 if (failed(getFloatAttrElements(loc, floatTy, floatValues)))
608 reinterpret_cast<std::complex<APFloat> *
>(floatValues.data()),
609 floatValues.size() / 2);
616 return getStringAttr(loc, type, type.getElementType());
621 TensorLiteralParser::getIntAttrElements(SMLoc loc,
Type eltTy,
622 std::vector<APInt> &intValues) {
623 intValues.reserve(storage.size());
625 for (
const auto &signAndToken : storage) {
626 bool isNegative = signAndToken.first;
627 const Token &token = signAndToken.second;
628 auto tokenLoc = token.
getLoc();
630 if (isNegative && isUintType) {
631 return p.emitError(tokenLoc)
632 <<
"expected unsigned integer elements, but parsed negative value";
636 if (token.
is(Token::floatliteral)) {
637 return p.emitError(tokenLoc)
638 <<
"expected integer elements, but parsed floating-point";
641 assert(token.
isAny(Token::integer, Token::kw_true, Token::kw_false) &&
642 "unexpected token type");
643 if (token.
isAny(Token::kw_true, Token::kw_false)) {
645 return p.emitError(tokenLoc)
646 <<
"expected i1 type for 'true' or 'false' values";
648 APInt apInt(1, token.
is(Token::kw_true),
false);
649 intValues.push_back(apInt);
654 std::optional<APInt> apInt =
657 return p.emitError(tokenLoc,
"integer constant out of range for type");
658 intValues.push_back(*apInt);
665 TensorLiteralParser::getFloatAttrElements(SMLoc loc, FloatType eltTy,
666 std::vector<APFloat> &floatValues) {
667 floatValues.reserve(storage.size());
668 for (
const auto &signAndToken : storage) {
669 bool isNegative = signAndToken.first;
670 const Token &token = signAndToken.second;
671 std::optional<APFloat> result;
672 if (failed(p.parseFloatFromLiteral(result, token, isNegative,
673 eltTy.getFloatSemantics())))
675 floatValues.push_back(*result);
683 if (hexStorage.has_value()) {
684 auto stringValue = hexStorage->getStringValue();
688 std::vector<std::string> stringValues;
689 std::vector<StringRef> stringRefValues;
690 stringValues.reserve(storage.size());
691 stringRefValues.reserve(storage.size());
693 for (
auto val : storage) {
694 if (!val.second.is(Token::string)) {
695 p.emitError(loc) <<
"expected string token, got "
696 << val.second.getSpelling();
699 stringValues.push_back(val.second.getStringValue());
700 stringRefValues.emplace_back(stringValues.back());
708 Type elementType = type.getElementType();
711 <<
"expected floating-point, integer, or complex element type, got "
721 bool detectedSplat =
false;
723 p.emitError(loc) <<
"elements hex data size is invalid for provided type: "
728 if (llvm::endianness::native == llvm::endianness::big) {
735 DenseIntOrFPElementsAttr::convertEndianOfArrayRefForBEmachine(
736 rawData, convRawData, type);
743 ParseResult TensorLiteralParser::parseElement() {
744 switch (p.getToken().getKind()) {
747 case Token::kw_false:
748 case Token::floatliteral:
750 storage.emplace_back(
false, p.getToken());
756 p.consumeToken(Token::minus);
757 if (!p.getToken().isAny(Token::floatliteral, Token::integer))
758 return p.emitError(
"expected integer or floating point literal");
759 storage.emplace_back(
true, p.getToken());
764 storage.emplace_back(
false, p.getToken());
770 p.consumeToken(Token::l_paren);
771 if (parseElement() ||
772 p.parseToken(Token::comma,
"expected ',' between complex elements") ||
774 p.parseToken(Token::r_paren,
"expected ')' after complex elements"))
779 return p.emitError(
"expected element literal of primitive type");
794 if (prevDims == newDims)
796 return p.emitError(
"tensor literal is invalid; ranks are not consistent "
803 auto parseOneElement = [&]() -> ParseResult {
805 if (p.getToken().getKind() == Token::l_square) {
806 if (parseList(thisDims))
808 }
else if (parseElement()) {
813 return checkDims(newDims, thisDims);
823 dims.push_back(size);
824 dims.append(newDims.begin(), newDims.end());
835 class DenseArrayElementParser {
837 explicit DenseArrayElementParser(
Type type) : type(type) {}
840 ParseResult parseIntegerElement(
Parser &p);
843 ParseResult parseFloatElement(
Parser &p);
850 void append(
const APInt &data);
855 std::vector<char> rawData;
861 void DenseArrayElementParser::append(
const APInt &data) {
862 if (data.getBitWidth()) {
863 assert(data.getBitWidth() % 8 == 0);
864 unsigned byteSize = data.getBitWidth() / 8;
865 size_t offset = rawData.size();
866 rawData.insert(rawData.end(), byteSize, 0);
867 llvm::StoreIntToMemory(
868 data,
reinterpret_cast<uint8_t *
>(rawData.data() + offset), byteSize);
873 ParseResult DenseArrayElementParser::parseIntegerElement(
Parser &p) {
874 bool isNegative = p.
consumeIf(Token::minus);
877 std::optional<APInt> value;
880 if (!type.isInteger(1))
881 return p.
emitError(
"expected i1 type for 'true' or 'false' values");
882 value = APInt(8, p.
getToken().
is(Token::kw_true),
883 !type.isUnsignedInteger());
885 }
else if (p.
consumeIf(Token::integer)) {
888 return p.
emitError(
"integer constant out of range");
890 return p.
emitError(
"expected integer literal");
896 ParseResult DenseArrayElementParser::parseFloatElement(
Parser &p) {
897 bool isNegative = p.
consumeIf(Token::minus);
899 std::optional<APFloat> fromIntLit;
902 cast<FloatType>(type).getFloatSemantics())))
905 append(fromIntLit->bitcastToAPInt());
912 if (
parseToken(Token::less,
"expected '<' after 'array'"))
918 emitError(typeLoc,
"expected an integer or floating point type");
925 emitError(typeLoc,
"expected integer or float type, got: ") << eltType;
929 emitError(typeLoc,
"element type bitwidth must be a multiple of 8");
937 if (
parseToken(Token::colon,
"expected ':' after dense array type"))
940 DenseArrayElementParser eltParser(eltType);
943 [&] {
return eltParser.parseIntegerElement(*
this); }))
947 [&] {
return eltParser.parseFloatElement(*
this); }))
950 if (
parseToken(Token::greater,
"expected '>' to close an array attribute"))
952 return eltParser.getAttr();
959 if (
parseToken(Token::less,
"expected '<' after 'dense'"))
963 TensorLiteralParser literalParser(*
this);
965 if (literalParser.parse(
true) ||
973 return literalParser.getAttr(attribLoc, type);
979 if (
parseToken(Token::less,
"expected '<' after 'dense_resource'"))
983 FailureOr<AsmDialectResourceHandle> rawHandle =
985 if (failed(rawHandle) ||
parseToken(Token::greater,
"expected '>'"))
988 auto *handle = dyn_cast<DenseResourceElementsHandle>(&*rawHandle);
990 return emitError(loc,
"invalid `dense_resource` handle type"),
nullptr;
1000 ShapedType shapedType = dyn_cast<ShapedType>(attrType);
1002 emitError(typeLoc,
"`dense_resource` expected a shaped type");
1017 if (
parseToken(Token::colon,
"expected ':'"))
1023 auto sType = dyn_cast<ShapedType>(type);
1025 emitError(loc,
"elements literal must be a shaped type");
1029 if (!sType.hasStaticShape()) {
1030 emitError(loc,
"elements literal type must have static shape");
1041 if (
parseToken(Token::less,
"Expected '<' after 'sparse'"))
1055 ShapedType indicesType =
1058 return getChecked<SparseElementsAttr>(
1066 TensorLiteralParser indiceParser(*
this);
1067 if (indiceParser.parse(
false))
1070 if (
parseToken(Token::comma,
"expected ','"))
1075 TensorLiteralParser valuesParser(*
this);
1076 if (valuesParser.parse(
true))
1079 if (
parseToken(Token::greater,
"expected '>'"))
1091 ShapedType indicesType;
1092 if (indiceParser.getShape().empty()) {
1098 auto indices = indiceParser.getAttr(indicesLoc, indicesType);
1105 auto valuesEltType = type.getElementType();
1106 ShapedType valuesType =
1107 valuesParser.getShape().empty()
1110 auto values = valuesParser.getAttr(valuesLoc, valuesType);
1115 return getChecked<SparseElementsAttr>(loc, type, indices, values);
1121 auto errorEmitter = [&] {
return emitError(loc); };
1124 if (failed(
parseToken(Token::less,
"expected '<' after 'strided'")) ||
1125 failed(
parseToken(Token::l_square,
"expected '['")))
1131 auto parseStrideOrOffset = [&]() -> std::optional<int64_t> {
1133 return ShapedType::kDynamic;
1137 emitError(loc,
"expected a 64-bit signed integer or '?'");
1138 return std::nullopt;
1141 bool negative =
consumeIf(Token::minus);
1143 if (
getToken().is(Token::integer)) {
1149 auto result =
static_cast<int64_t
>(*value);
1161 if (!
getToken().is(Token::r_square)) {
1163 std::optional<int64_t> stride = parseStrideOrOffset();
1166 strides.push_back(*stride);
1170 if (failed(
parseToken(Token::r_square,
"expected ']'")))
1181 if (failed(
parseToken(Token::comma,
"expected ','")) ||
1182 failed(
parseToken(Token::kw_offset,
"expected 'offset' after comma")) ||
1183 failed(
parseToken(Token::colon,
"expected ':' after 'offset'")))
1186 std::optional<int64_t> offset = parseStrideOrOffset();
1187 if (!offset || failed(
parseToken(Token::greater,
"expected '>'")))
1204 if (
parseToken(Token::l_square,
"expected '[' after 'distinct'"))
1209 if (
parseToken(Token::integer,
"expected distinct ID"))
1213 emitError(
"expected an unsigned 64-bit integer");
1218 if (
parseToken(Token::r_square,
"expected ']' to close distinct ID") ||
1219 parseToken(Token::less,
"expected '<' after distinct ID"))
1223 if (
getToken().is(Token::greater)) {
1228 if (!referencedAttr) {
1233 if (
parseToken(Token::greater,
"expected '>' to close distinct attribute"))
1242 auto it = distinctAttrs.find(*value);
1243 if (it == distinctAttrs.end()) {
1245 it = distinctAttrs.try_emplace(*value, distinctAttr).first;
1246 }
else if (it->getSecond().getReferencedAttr() != referencedAttr) {
1247 emitError(loc,
"referenced attribute does not match previous definition: ")
1248 << it->getSecond().getReferencedAttr();
1252 return it->getSecond();
static ParseResult parseElementAttrHexValues(Parser &parser, Token tok, std::string &result)
Parse elements values stored within a hex string.
static std::optional< APInt > buildAttributeAPInt(Type type, bool isNegative, StringRef spelling)
Construct an APint from a parsed value, a known attribute type and sign.
static Value max(ImplicitLocOpBuilder &builder, Value value, Value bound)
static ArrayRef< int64_t > getShape(Type type)
Returns the shape of the given type.
A multi-dimensional affine map Affine map's are immutable like Type's, and they are uniqued.
void addUses(Value value, ArrayRef< SMLoc > locations)
Add a source uses of the given value.
@ Braces
{} brackets surrounding zero or more operands.
@ Square
Square brackets surrounding zero or more operands.
Attributes are known-constant values of operations.
IntegerAttr getIntegerAttr(Type type, int64_t value)
IntegerType getIntegerType(unsigned width)
BoolAttr getBoolAttr(bool value)
StringAttr getStringAttr(const Twine &bytes)
ArrayAttr getArrayAttr(ArrayRef< Attribute > value)
An attribute that represents a reference to a dense vector or tensor object.
static DenseElementsAttr getFromRawBuffer(ShapedType type, ArrayRef< char > rawBuffer)
Construct a dense elements attribute from a raw buffer representing the data for this attribute.
static DenseElementsAttr get(ShapedType type, ArrayRef< Attribute > values)
Constructs a dense elements attribute from an array of element values.
static bool isValidRawBuffer(ShapedType type, ArrayRef< char > rawBuffer, bool &detectedSplat)
Returns true if the given buffer is a valid raw buffer for the given type.
An attribute that associates a referenced attribute with a unique identifier.
static DistinctAttr create(Attribute referencedAttr)
Creates a distinct attribute that associates a referenced attribute with a unique identifier.
An integer set representing a conjunction of one or more affine equalities and inequalities.
void resetPointer(const char *newPointer)
Change the position of the lexer cursor.
Location objects represent source locations information in MLIR.
T * getOrLoadDialect()
Get (or create) a dialect for the given derived dialect type.
NamedAttrList is array of NamedAttributes that tracks whether it is sorted and does some basic work t...
DictionaryAttr getDictionary(MLIRContext *context) const
Return a dictionary attribute for the underlying dictionary.
void push_back(NamedAttribute newAttribute)
Add an attribute with the specified name.
This class implements Optional functionality for ParseResult.
bool has_value() const
Returns true if we contain a valid ParseResult value.
This represents a token in the MLIR syntax.
bool isKeyword() const
Return true if this is one of the keyword token kinds (e.g. kw_if).
std::string getStringValue() const
Given a token containing a string literal, return its value, including removing the quote characters ...
std::string getSymbolReference() const
Given a token containing a symbol reference, return the unescaped string value.
static std::optional< uint64_t > getUInt64IntegerValue(StringRef spelling)
For an integer token, return its value as an uint64_t.
std::optional< double > getFloatingPointValue() const
For a floatliteral token, return its value as a double.
bool isAny(Kind k1, Kind k2) const
StringRef getSpelling() const
std::optional< std::string > getHexStringValue() const
Given a token containing a hex string literal, return its value or std::nullopt if the token does not...
Instances of the Type class are uniqued, have an immutable identifier and an optional mutable compone...
bool isSignedInteger() const
Return true if this is a signed integer type (with the specified width).
bool isIntOrIndexOrFloat() const
Return true if this is an integer (of any signedness), index, or float type.
bool isUnsignedInteger() const
Return true if this is an unsigned integer type (with the specified width).
bool isIntOrIndex() const
Return true if this is an integer (of any signedness) or an index type.
bool isInteger() const
Return true if this is an integer type (with the specified width).
unsigned getIntOrFloatBitWidth() const
Return the bit width of an integer or a float type, assert failure on other types.
This class implement support for parsing global entities like attributes and types.
ParseResult parseFloatFromLiteral(std::optional< APFloat > &result, const Token &tok, bool isNegative, const llvm::fltSemantics &semantics)
Parse a floating point value from a literal.
Attribute parseDenseArrayAttr(Type type)
Parse a DenseArrayAttr.
Attribute parseStridedLayoutAttr()
Parse a strided layout attribute.
Attribute parseDecOrHexAttr(Type type, bool isNegative)
Parse a decimal or a hexadecimal literal, which can be either an integer or a float attribute.
OptionalParseResult parseOptionalType(Type &type)
Optionally parse a type.
ParseResult parseToken(Token::Kind expectedToken, const Twine &message)
Consume the specified token if present and return success.
ParseResult parseCommaSeparatedListUntil(Token::Kind rightToken, function_ref< ParseResult()> parseElement, bool allowEmptyList=true)
Parse a comma-separated list of elements up until the specified end token.
Type parseType()
Parse an arbitrary type.
Attribute parseDenseElementsAttr(Type attrType)
Parse a dense elements attribute.
Attribute parseDenseResourceElementsAttr(Type attrType)
Parse a dense resource elements attribute.
ParseResult parseAffineMapReference(AffineMap &map)
InFlightDiagnostic emitError(const Twine &message={})
Emit an error and return failure.
ParserState & state
The Parser is subclassed and reinstantiated.
Attribute parseAttribute(Type type={})
Parse an arbitrary attribute with an optional type.
StringRef getTokenSpelling() const
FailureOr< AsmDialectResourceHandle > parseResourceHandle(const OpAsmDialectInterface *dialect, std::string &name)
Parse a handle to a dialect resource within the assembly format.
ParseResult parseLocationInstance(LocationAttr &loc)
Parse a raw location instance.
void consumeToken()
Advance the current lexer onto the next token.
Attribute codeCompleteAttribute()
ParseResult parseAttributeDict(NamedAttrList &attributes)
Parse an attribute dictionary.
MLIRContext * getContext() const
Attribute parseDistinctAttr(Type type)
Parse a distinct attribute.
InFlightDiagnostic emitWrongTokenError(const Twine &message={})
Emit an error about a "wrong token".
ParseResult parseCommaSeparatedList(Delimiter delimiter, function_ref< ParseResult()> parseElementFn, StringRef contextMessage=StringRef())
Parse a list of comma-separated items with an optional delimiter.
Attribute parseSparseElementsAttr(Type attrType)
Parse a sparse elements attribute.
OptionalParseResult parseOptionalAttribute(Attribute &attribute, Type type={})
Parse an optional attribute with the provided type.
Attribute parseFloatAttr(Type type, bool isNegative)
Parse a float attribute.
ParseResult parseFloatFromIntegerLiteral(std::optional< APFloat > &result, const Token &tok, bool isNegative, const llvm::fltSemantics &semantics)
Parse a floating point value from an integer literal token.
ParseResult parseIntegerSetReference(IntegerSet &set)
Attribute parseExtendedAttr(Type type)
Parse an extended attribute.
const Token & getToken() const
Return the current token the parser is inspecting.
ShapedType parseElementsLiteralType(SMLoc loc, Type type)
Shaped type for elements attribute.
bool consumeIf(Token::Kind kind)
If the current token has the specified kind, consume it and return true.
OptionalParseResult parseOptionalAttributeWithToken(Token::Kind kind, AttributeT &attr, Type type={})
Parse an optional attribute that is demarcated by a specific token.
QueryRef parse(llvm::StringRef line, const QuerySession &qs)
Include the generated interface declarations.
auto get(MLIRContext *context, Ts &&...params)
Helper method that injects context only if needed, this helps unify some of the attribute constructio...
LogicalResult verify(Operation *op, bool verifyRecursively=true)
Perform (potentially expensive) checks of invariants, used to detect compiler bugs,...
SymbolState & symbols
The current state for symbol parsing.
Lexer lex
The lexer for the source file we're parsing.
AsmParserState * asmState
An optional pointer to a struct containing high level parser state to be populated during parsing.
DenseMap< uint64_t, DistinctAttr > distinctAttributes
A map from unique integer identifier to DistinctAttr.