[Lldb-commits] [lldb] r323102 - Revert "[SymbolFilePDB] Fix null array access when parsing the type of a function without any arguments, i.e. 'int main()' and add support to test it"

Pavel Labath via lldb-commits lldb-commits at lists.llvm.org
Mon Jan 22 03:51:56 PST 2018


Author: labath
Date: Mon Jan 22 03:51:56 2018
New Revision: 323102

URL: http://llvm.org/viewvc/llvm-project?rev=323102&view=rev
Log:
Revert "[SymbolFilePDB] Fix null array access when parsing the type of a function without any arguments, i.e. 'int main()' and add support to test it"

This reverts commit r322995, as it breaks
lldb-Unit::SymbolFilePDBTests.TestTypedefs
<http://lab.llvm.org:8011/builders/lldb-windows7-android/builds/7715>.

Removed:
    lldb/trunk/lit/SymbolFile/PDB/Inputs/SimpleTypesTest.cpp
    lldb/trunk/lit/SymbolFile/PDB/enums-layout.test
    lldb/trunk/lit/SymbolFile/PDB/typedefs.test
Modified:
    lldb/trunk/source/Plugins/SymbolFile/PDB/PDBASTParser.cpp
    lldb/trunk/source/Plugins/SymbolFile/PDB/SymbolFilePDB.cpp
    lldb/trunk/unittests/SymbolFile/PDB/Inputs/test-pdb-types.cpp
    lldb/trunk/unittests/SymbolFile/PDB/SymbolFilePDBTests.cpp

Removed: lldb/trunk/lit/SymbolFile/PDB/Inputs/SimpleTypesTest.cpp
URL: http://llvm.org/viewvc/llvm-project/lldb/trunk/lit/SymbolFile/PDB/Inputs/SimpleTypesTest.cpp?rev=323101&view=auto
==============================================================================
--- lldb/trunk/lit/SymbolFile/PDB/Inputs/SimpleTypesTest.cpp (original)
+++ lldb/trunk/lit/SymbolFile/PDB/Inputs/SimpleTypesTest.cpp (removed)
@@ -1,40 +0,0 @@
-// typedef
-typedef unsigned long ULongArrayTypedef[10];
-ULongArrayTypedef ULongArrayVar;
-
-typedef long double*& RefTypedef;
-long double* LongDoublePtrVar = 0;
-RefTypedef RefVar = LongDoublePtrVar;
-
-typedef long long (*FuncPtrTypedef)(int&, unsigned char**, short[], const double, volatile bool);
-FuncPtrTypedef FuncVar;
-
-typedef char (*VarArgsFuncTypedef)(void*, long, unsigned short, unsigned int, ...);
-VarArgsFuncTypedef VarArgsFuncVar;
-
-typedef float (*VarArgsFuncTypedefA)(...);
-VarArgsFuncTypedefA VarArgsFuncVarA;
-
-// unscoped enum
-enum Enum { RED, GREEN, BLUE };
-Enum EnumVar;
-
-enum EnumConst { LOW, NORMAL = 10, HIGH };
-EnumConst EnumConstVar;
-
-enum EnumEmpty {};
-EnumEmpty EnumEmptyVar;
-
-enum EnumUChar : unsigned char { ON, OFF, AUTO };
-EnumUChar EnumCharVar;
-
-// scoped enum
-enum class EnumClass { YES, NO, DEFAULT };
-EnumClass EnumClassVar;
-
-enum struct EnumStruct { red, blue, black };
-EnumStruct EnumStructVar;
-  
-int main() {
-  return 0;
-}

Removed: lldb/trunk/lit/SymbolFile/PDB/enums-layout.test
URL: http://llvm.org/viewvc/llvm-project/lldb/trunk/lit/SymbolFile/PDB/enums-layout.test?rev=323101&view=auto
==============================================================================
--- lldb/trunk/lit/SymbolFile/PDB/enums-layout.test (original)
+++ lldb/trunk/lit/SymbolFile/PDB/enums-layout.test (removed)
@@ -1,45 +0,0 @@
-REQUIRES: windows
-RUN: clang-cl -m32 /Z7 /c /GS- %S/Inputs/SimpleTypesTest.cpp /o %T/SimpleTypesTest.cpp.enums.obj
-RUN: link %T/SimpleTypesTest.cpp.enums.obj /DEBUG /nodefaultlib /ENTRY:main /OUT:%T/SimpleTypesTest.cpp.enums.exe
-RUN: lldb-test symbols %T/SimpleTypesTest.cpp.enums.exe | FileCheck %s
-
-; FIXME: PDB does not have information about scoped enumeration (Enum class) so the  
-; compiler type used is the same as the one for unscoped enumeration.
-
-CHECK: Module [[CU:.*]]
-CHECK-DAG: {{^[0-9A-F]+}}: SymbolVendor ([[CU]])
-CHECK:      Type{{.*}} , name = "Enum", size = 4, compiler_type = {{.*}} enum Enum {
-CHECK-NEXT:    RED,
-CHECK-NEXT:    GREEN,
-CHECK-NEXT:    BLUE
-CHECK-NEXT:}
-
-CHECK:      Type{{.*}} , name = "EnumConst", size = 4, compiler_type = {{.*}} enum EnumConst {
-CHECK-NEXT:    LOW,
-CHECK-NEXT:    NORMAL,
-CHECK-NEXT:    HIGH
-CHECK-NEXT:}
-
-CHECK:      Type{{.*}} , name = "EnumEmpty", size = 4, compiler_type = {{.*}} enum EnumEmpty {
-CHECK-NEXT:}
-
-CHECK:      Type{{.*}} , name = "EnumUChar", size = 1, compiler_type = {{.*}} enum EnumUChar {
-CHECK-NEXT:    ON,
-CHECK-NEXT:    OFF,
-CHECK-NEXT:    AUTO
-CHECK-NEXT:}
-
-; Note that `enum EnumClass` is tested instead of `enum class EnumClass`
-CHECK:      Type{{.*}} , name = "EnumClass", size = 4, compiler_type = {{.*}} enum EnumClass {
-CHECK-NEXT:    YES,
-CHECK-NEXT:    NO,
-CHECK-NEXT:    DEFAULT
-CHECK-NEXT:}
-
-CHECK:      Type{{.*}} , name = "EnumStruct", size = 4, compiler_type = {{.*}} enum EnumStruct {
-CHECK-NEXT:    red,
-CHECK-NEXT:    blue,
-CHECK-NEXT:    black
-CHECK-NEXT:}
-
-CHECK-DAG: {{^[0-9A-F]+}}:   CompileUnit{{[{]0x[0-9a-f]+[}]}}, language = "c++", file = '{{.*}}\SimpleTypesTest.cpp'

Removed: lldb/trunk/lit/SymbolFile/PDB/typedefs.test
URL: http://llvm.org/viewvc/llvm-project/lldb/trunk/lit/SymbolFile/PDB/typedefs.test?rev=323101&view=auto
==============================================================================
--- lldb/trunk/lit/SymbolFile/PDB/typedefs.test (original)
+++ lldb/trunk/lit/SymbolFile/PDB/typedefs.test (removed)
@@ -1,55 +0,0 @@
-REQUIRES: windows
-RUN: clang-cl -m32 /Z7 /c /GS- %S/Inputs/SimpleTypesTest.cpp /o %T/SimpleTypesTest.cpp.typedefs.obj
-RUN: link %T/SimpleTypesTest.cpp.typedefs.obj /DEBUG /nodefaultlib /ENTRY:main /OUT:%T/SimpleTypesTest.cpp.typedefs.exe
-RUN: lldb-test symbols %T/SimpleTypesTest.cpp.typedefs.exe | FileCheck %s
-
-; Generate 32-bit target
-
-; FIXME: PDB does not have line information for typedef statements so source
-; and line information for them is not tested.
-
-; Note, types `long double` and `double` have same bit size in MSVC and there
-; is no information in the PDB to distinguish them. So the compiler type for 
-; both of them is the same.
-
-CHECK: Module [[CU:.*]]
-CHECK-DAG:  {{^[0-9A-F]+}}: SymbolVendor ([[CU]])
-CHECK:      Type{{.*}} , name = "unsigned long", size = 4, compiler_type = {{.*}} unsigned long
-CHECK-NEXT: Type{{.*}} , size = 40, compiler_type = {{.*}} unsigned long [10]
-CHECK-NEXT: Type{{.*}} , name = "ULongArrayTypedef", compiler_type = {{.*}} typedef ULongArrayTypedef
-
-; Note: compiler_type of `long double` is represented by the one for `double`
-CHECK:      Type{{.*}} , name = "double", size = 8, compiler_type = {{.*}} double
-CHECK-NEXT: Type{{.*}} , size = 4, compiler_type = {{.*}} double *
-CHECK-NEXT: Type{{.*}} , size = 4, compiler_type = {{.*}} double *&
-CHECK-DAG: Type{{.*}} , name = "RefTypedef", compiler_type = {{.*}} typedef RefTypedef
-
-CHECK:      Type{{.*}} , name = "int", size = 4, compiler_type = {{.*}} int
-CHECK-NEXT: Type{{.*}} , size = 4, compiler_type = {{.*}} int &
-CHECK-NEXT: Type{{.*}} , name = "unsigned char", size = 1, compiler_type = {{.*}} unsigned char
-CHECK-NEXT: Type{{.*}} , size = 4, compiler_type = {{.*}} unsigned char *
-CHECK-NEXT: Type{{.*}} , size = 4, compiler_type = {{.*}} unsigned char **
-CHECK-NEXT: Type{{.*}} , name = "short", size = 2, compiler_type = {{.*}} short
-CHECK-NEXT: Type{{.*}} , size = 4, compiler_type = {{.*}} short *
-CHECK-NEXT: Type{{.*}} , name = "const double", size = 8, compiler_type = {{.*}} const double
-CHECK-NEXT: Type{{.*}} , name = "volatile bool", size = 1, compiler_type = {{.*}} volatile _Bool
-CHECK-NEXT: Type{{.*}} , name = "long long", size = 8, compiler_type = {{.*}} long long
-CHECK-NEXT: Type{{.*}} , compiler_type = {{.*}} long long (int &, unsigned char **, short *, const double, volatile _Bool)
-CHECK-DAG:  Type{{.*}} , name = "FuncPtrTypedef", compiler_type = {{.*}} typedef FuncPtrTypedef
-
-CHECK:      Type{{.*}} , name = "void", compiler_type = {{.*}} void
-CHECK-NEXT: Type{{.*}} , size = 4, compiler_type = {{.*}} void *
-CHECK-NEXT: Type{{.*}} , name = "long", size = 4, compiler_type = {{.*}} long
-CHECK-NEXT: Type{{.*}} , name = "unsigned short", size = 2, compiler_type = {{.*}} unsigned short
-CHECK-NEXT: Type{{.*}} , name = "unsigned int", size = 4, compiler_type = {{.*}} unsigned int
-CHECK-NEXT: Type{{.*}} , name = "signed char", size = 1, compiler_type = {{.*}} signed char
-CHECK-NEXT: Type{{.*}} , compiler_type = {{.*}} signed char (void *, long, unsigned short, unsigned int, ...)
-CHECK-DAG:  Type{{.*}} , size = 4, compiler_type = {{.*}} signed char (*)(void *, long, unsigned short, unsigned int, ...)
-CHECK-DAG:  Type{{.*}} , name = "VarArgsFuncTypedef", compiler_type = {{.*}} typedef VarArgsFuncTypedef
-
-CHECK:      Type{{.*}} , name = "float", size = 4, compiler_type = {{.*}} float
-CHECK-NEXT: Type{{.*}} , compiler_type = {{.*}} float (...)
-CHECK-DAG:  Type{{.*}} , size = 4, compiler_type = {{.*}} float (*)(...)
-CHECK-DAG:  Type{{.*}} , name = "VarArgsFuncTypedefA", compiler_type = {{.*}} typedef VarArgsFuncTypedefA
-
-CHECK-DAG: {{^[0-9A-F]+}}:   CompileUnit{{[{]0x[0-9a-f]+[}]}}, language = "c++", file = '{{.*}}\SimpleTypesTest.cpp'

Modified: lldb/trunk/source/Plugins/SymbolFile/PDB/PDBASTParser.cpp
URL: http://llvm.org/viewvc/llvm-project/lldb/trunk/source/Plugins/SymbolFile/PDB/PDBASTParser.cpp?rev=323102&r1=323101&r2=323102&view=diff
==============================================================================
--- lldb/trunk/source/Plugins/SymbolFile/PDB/PDBASTParser.cpp (original)
+++ lldb/trunk/source/Plugins/SymbolFile/PDB/PDBASTParser.cpp Mon Jan 22 03:51:56 2018
@@ -26,12 +26,12 @@
 #include "llvm/DebugInfo/PDB/PDBSymbolTypeEnum.h"
 #include "llvm/DebugInfo/PDB/PDBSymbolTypeFunctionArg.h"
 #include "llvm/DebugInfo/PDB/PDBSymbolTypeFunctionSig.h"
-#include "llvm/DebugInfo/PDB/PDBSymbolTypePointer.h"
 #include "llvm/DebugInfo/PDB/PDBSymbolTypeTypedef.h"
 #include "llvm/DebugInfo/PDB/PDBSymbolTypeUDT.h"
 
 using namespace lldb;
 using namespace lldb_private;
+using namespace llvm;
 using namespace llvm::pdb;
 
 namespace {
@@ -46,7 +46,7 @@ int TranslateUdtKind(PDB_UdtType pdb_kin
   case PDB_UdtType::Interface:
     return clang::TTK_Interface;
   }
-  return -1;
+  return clang::TTK_Class;
 }
 
 lldb::Encoding TranslateBuiltinEncoding(PDB_BuiltinType type) {
@@ -66,106 +66,6 @@ lldb::Encoding TranslateBuiltinEncoding(
     return lldb::eEncodingInvalid;
   }
 }
-
-lldb::Encoding TranslateEnumEncoding(PDB_VariantType type) {
-  switch (type) {
-  case PDB_VariantType::Int8:
-  case PDB_VariantType::Int16:
-  case PDB_VariantType::Int32:
-  case PDB_VariantType::Int64:
-    return lldb::eEncodingSint;
-
-  case PDB_VariantType::UInt8:
-  case PDB_VariantType::UInt16:
-  case PDB_VariantType::UInt32:
-  case PDB_VariantType::UInt64:
-    return lldb::eEncodingUint;
-
-  default:
-    break;
-  }
-
-  return lldb::eEncodingSint;
-}
-
-CompilerType GetBuiltinTypeForPDBEncodingAndBitSize(
-    ClangASTContext *clang_ast, const PDBSymbolTypeBuiltin *pdb_type,
-    Encoding encoding, uint32_t width) {
-  if (!pdb_type)
-    return CompilerType();
-  if (!clang_ast)
-    return CompilerType();
-  auto *ast = clang_ast->getASTContext();
-  if (!ast)
-    return CompilerType();
-
-  switch (pdb_type->getBuiltinType()) {
-  default: break;
-  case PDB_BuiltinType::None:
-    return CompilerType();
-  case PDB_BuiltinType::Void:
-    // FIXME: where is non-zero size of `void` from?
-    if (width == 0)
-      return clang_ast->GetBasicType(eBasicTypeVoid);
-  case PDB_BuiltinType::Bool:
-    return clang_ast->GetBasicType(eBasicTypeBool);
-  case PDB_BuiltinType::Long:
-    if (width == ast->getTypeSize(ast->LongTy))
-      return CompilerType(ast, ast->LongTy);
-    if (width == ast->getTypeSize(ast->LongLongTy))
-      return CompilerType(ast, ast->LongLongTy);
-    break;
-  case PDB_BuiltinType::ULong:
-    if (width == ast->getTypeSize(ast->UnsignedLongTy))
-      return CompilerType(ast, ast->UnsignedLongTy);
-    if (width == ast->getTypeSize(ast->UnsignedLongLongTy))
-      return CompilerType(ast, ast->UnsignedLongLongTy);
-    break;
-  case PDB_BuiltinType::WCharT:
-    if (width == ast->getTypeSize(ast->WCharTy))
-      return CompilerType(ast, ast->WCharTy);
-    break;
-  case PDB_BuiltinType::Float:
-    // Note: types `long double` and `double` have same bit size in MSVC and there
-    // is no information in the PDB to distinguish them. So when falling back
-    // to default search, the compiler type of `long double` will be represented by
-    // the one generated for `double`.
-    break;
-  }
-  // If there is no match on PDB_BuiltinType, fall back to default search
-  // by encoding and width only
-  return clang_ast->GetBuiltinTypeForEncodingAndBitSize(encoding, width);
-}
-
-ConstString GetPDBBuiltinTypeName(const PDBSymbolTypeBuiltin *pdb_type,
-                                  CompilerType &compiler_type) {
-  if (!pdb_type)
-    return compiler_type.GetTypeName();
-
-  PDB_BuiltinType kind = pdb_type->getBuiltinType();
-  switch (kind) {
-  default: break;
-  case PDB_BuiltinType::Currency:
-    return ConstString("CURRENCY");
-  case PDB_BuiltinType::Date:
-    return ConstString("DATE");
-  case PDB_BuiltinType::Variant:
-    return ConstString("VARIANT");
-  case PDB_BuiltinType::Complex:
-    return ConstString("complex");
-  case PDB_BuiltinType::Bitfield:
-    return ConstString("bitfield");
-  case PDB_BuiltinType::BSTR:
-    return ConstString("BSTR");
-  case PDB_BuiltinType::HResult:
-    return ConstString("HRESULT");
-  case PDB_BuiltinType::BCD:
-    return ConstString("HRESULT");
-  case PDB_BuiltinType::None:
-    return ConstString("...");
-  }
-  return compiler_type.GetTypeName();
-}
 }
 
 PDBASTParser::PDBASTParser(lldb_private::ClangASTContext &ast) : m_ast(ast) {}
@@ -185,15 +85,12 @@ lldb::TypeSP PDBASTParser::CreateLLDBTyp
   if (auto udt = llvm::dyn_cast<PDBSymbolTypeUDT>(&type)) {
     AccessType access = lldb::eAccessPublic;
     PDB_UdtType udt_kind = udt->getUdtKind();
-    auto tag_type_kind = TranslateUdtKind(udt_kind);
-    if (tag_type_kind == -1)
-      return nullptr;
 
     if (udt_kind == PDB_UdtType::Class)
       access = lldb::eAccessPrivate;
 
     CompilerType clang_type = m_ast.CreateRecordType(
-        tu_decl_ctx, access, udt->getName().c_str(), tag_type_kind,
+        tu_decl_ctx, access, udt->getName().c_str(), TranslateUdtKind(udt_kind),
         lldb::eLanguageTypeC_plus_plus, nullptr);
 
     m_ast.SetHasExternalStorage(clang_type.GetOpaqueQualType(), true);
@@ -204,41 +101,21 @@ lldb::TypeSP PDBASTParser::CreateLLDBTyp
         LLDB_INVALID_UID, lldb_private::Type::eEncodingIsUID, decl, clang_type,
         lldb_private::Type::eResolveStateForward);
   } else if (auto enum_type = llvm::dyn_cast<PDBSymbolTypeEnum>(&type)) {
-    auto underlying_type_up = enum_type->getUnderlyingType();
-    if (!underlying_type_up)
-      return nullptr;
-    lldb::Encoding encoding =
-        TranslateBuiltinEncoding(underlying_type_up->getBuiltinType());
-    // FIXME: Type of underlying builtin is always `Int`. We correct it with
-    // the very first enumerator's encoding if any.
-    auto first_child = enum_type->findOneChild<PDBSymbolData>();
-    if (first_child) {
-      encoding = TranslateEnumEncoding(first_child->getValue().Type);
-    }
     std::string name = enum_type->getName();
+    lldb::Encoding encoding =
+        TranslateBuiltinEncoding(enum_type->getBuiltinType());
     uint64_t bytes = enum_type->getLength();
-    CompilerType builtin_type;
-    if (bytes > 0)
-      builtin_type = GetBuiltinTypeForPDBEncodingAndBitSize(
-           &m_ast, underlying_type_up.get(), encoding, bytes * 8);
-    else
-      builtin_type = m_ast.GetBasicType(eBasicTypeInt);
-    // FIXME: PDB does not have information about scoped enumeration (Enum Class).
-    // Set it false for now.
-    bool isScoped = false;
+    CompilerType builtin_type =
+        m_ast.GetBuiltinTypeForEncodingAndBitSize(encoding, bytes * 8);
 
     CompilerType ast_enum = m_ast.CreateEnumerationType(
-        name.c_str(), tu_decl_ctx, decl, builtin_type, isScoped);
+        name.c_str(), tu_decl_ctx, decl, builtin_type, false);
     auto enum_values = enum_type->findAllChildren<PDBSymbolData>();
-    if (enum_values) {
-      while (auto enum_value = enum_values->getNext()) {
-        if (enum_value->getDataKind() != PDB_DataKind::Constant)
-          continue;
-        AddEnumValue(ast_enum, *enum_value);
-      }
+    while (auto enum_value = enum_values->getNext()) {
+      if (enum_value->getDataKind() != PDB_DataKind::Constant)
+        continue;
+      AddEnumValue(ast_enum, *enum_value);
     }
-    if (ClangASTContext::StartTagDeclarationDefinition(ast_enum))
-      ClangASTContext::CompleteTagDeclarationDefinition(ast_enum);
 
     return std::make_shared<lldb_private::Type>(
         type.getSymIndexId(), m_ast.GetSymbolFile(), ConstString(name), bytes,
@@ -264,16 +141,8 @@ lldb::TypeSP PDBASTParser::CreateLLDBTyp
   } else if (auto func_sig = llvm::dyn_cast<PDBSymbolTypeFunctionSig>(&type)) {
     auto arg_enum = func_sig->getArguments();
     uint32_t num_args = arg_enum->getChildCount();
-    std::vector<CompilerType> arg_list;
-
-    bool is_variadic = func_sig->isCVarArgs();
-    // Drop last variadic argument.
-    if (is_variadic)
-      --num_args;
-    for (int arg_idx = 0; arg_idx < num_args; arg_idx++) {
-      auto arg = arg_enum->getChildAtIndex(arg_idx);
-      if (!arg)
-        break;
+    std::vector<CompilerType> arg_list(num_args);
+    while (auto arg = arg_enum->getNext()) {
       lldb_private::Type *arg_type =
           m_ast.GetSymbolFile()->ResolveTypeUID(arg->getSymIndexId());
       // If there's some error looking up one of the dependent types of this
@@ -283,8 +152,6 @@ lldb::TypeSP PDBASTParser::CreateLLDBTyp
       CompilerType arg_ast_type = arg_type->GetFullCompilerType();
       arg_list.push_back(arg_ast_type);
     }
-    lldbassert(arg_list.size() <= num_args);
-
     auto pdb_return_type = func_sig->getReturnType();
     lldb_private::Type *return_type =
         m_ast.GetSymbolFile()->ResolveTypeUID(pdb_return_type->getSymIndexId());
@@ -299,8 +166,7 @@ lldb::TypeSP PDBASTParser::CreateLLDBTyp
     if (func_sig->isVolatileType())
       type_quals |= clang::Qualifiers::Volatile;
     CompilerType func_sig_ast_type = m_ast.CreateFunctionType(
-        return_ast_type, arg_list.data(), arg_list.size(), is_variadic,
-        type_quals);
+        return_ast_type, &arg_list[0], num_args, false, type_quals);
 
     return std::make_shared<lldb_private::Type>(
         func_sig->getSymIndexId(), m_ast.GetSymbolFile(), ConstString(), 0,
@@ -322,51 +188,6 @@ lldb::TypeSP PDBASTParser::CreateLLDBTyp
         array_type->getSymIndexId(), m_ast.GetSymbolFile(), ConstString(),
         bytes, nullptr, LLDB_INVALID_UID, lldb_private::Type::eEncodingIsUID,
         decl, array_ast_type, lldb_private::Type::eResolveStateFull);
-  } else if (auto *builtin_type = llvm::dyn_cast<PDBSymbolTypeBuiltin>(&type)) {
-    PDB_BuiltinType builtin_kind = builtin_type->getBuiltinType();
-    if (builtin_kind == PDB_BuiltinType::None)
-      return nullptr;
-
-    uint64_t bytes = builtin_type->getLength();
-    Encoding encoding = TranslateBuiltinEncoding(builtin_kind);
-    CompilerType builtin_ast_type = GetBuiltinTypeForPDBEncodingAndBitSize(
-        &m_ast, builtin_type, encoding, bytes * 8);
-
-    Type::EncodingDataType encoding_data_type = Type::eEncodingIsUID;
-    if (builtin_type->isConstType()) {
-      encoding_data_type = Type::eEncodingIsConstUID;
-      builtin_ast_type = builtin_ast_type.AddConstModifier();
-    }
-    if (builtin_type->isVolatileType()) {
-      encoding_data_type = Type::eEncodingIsVolatileUID;
-      builtin_ast_type = builtin_ast_type.AddVolatileModifier();
-    }
-    auto type_name = GetPDBBuiltinTypeName(builtin_type, builtin_ast_type);
-
-    return std::make_shared<lldb_private::Type>(
-        builtin_type->getSymIndexId(), m_ast.GetSymbolFile(), type_name,
-        bytes, nullptr, LLDB_INVALID_UID, encoding_data_type,
-        decl, builtin_ast_type, lldb_private::Type::eResolveStateFull);
-  } else if (auto *pointer_type = llvm::dyn_cast<PDBSymbolTypePointer>(&type)) {
-    Type *pointee_type = m_ast.GetSymbolFile()->ResolveTypeUID(
-        pointer_type->getPointeeType()->getSymIndexId());
-    if (!pointee_type)
-      return nullptr;
-
-    CompilerType pointer_ast_type;
-    Type::EncodingDataType encoding_data_type = Type::eEncodingIsPointerUID;
-    if (pointer_type->isReference()) {
-      encoding_data_type = Type::eEncodingIsLValueReferenceUID;
-      pointer_ast_type =
-          pointee_type->GetFullCompilerType().GetLValueReferenceType();
-    } else
-      pointer_ast_type = pointee_type->GetFullCompilerType().GetPointerType();
-
-    return std::make_shared<lldb_private::Type>(
-        pointer_type->getSymIndexId(), m_ast.GetSymbolFile(), ConstString(),
-        pointer_type->getLength(), nullptr, LLDB_INVALID_UID,
-        encoding_data_type, decl, pointer_ast_type,
-        lldb_private::Type::eResolveStateFull);
   }
   return nullptr;
 }

Modified: lldb/trunk/source/Plugins/SymbolFile/PDB/SymbolFilePDB.cpp
URL: http://llvm.org/viewvc/llvm-project/lldb/trunk/source/Plugins/SymbolFile/PDB/SymbolFilePDB.cpp?rev=323102&r1=323101&r2=323102&view=diff
==============================================================================
--- lldb/trunk/source/Plugins/SymbolFile/PDB/SymbolFilePDB.cpp (original)
+++ lldb/trunk/source/Plugins/SymbolFile/PDB/SymbolFilePDB.cpp Mon Jan 22 03:51:56 2018
@@ -20,7 +20,6 @@
 #include "lldb/Symbol/SymbolContext.h"
 #include "lldb/Symbol/SymbolVendor.h"
 #include "lldb/Symbol/TypeMap.h"
-#include "lldb/Symbol/TypeList.h"
 #include "lldb/Utility/RegularExpression.h"
 
 #include "llvm/DebugInfo/PDB/GenericError.h"
@@ -319,33 +318,8 @@ SymbolFilePDB::ParseFunctionBlocks(const
 }
 
 size_t SymbolFilePDB::ParseTypes(const lldb_private::SymbolContext &sc) {
-  lldbassert(sc.module_sp.get());
-  size_t num_added = 0;
-  auto results_up = m_session_up->getGlobalScope()->findAllChildren();
-  if (!results_up)
-    return 0;
-  while (auto symbol_up = results_up->getNext()) {
-    switch (symbol_up->getSymTag()) {
-    case PDB_SymType::Enum:
-    case PDB_SymType::UDT:
-    case PDB_SymType::Typedef:
-      break;
-    default:
-      continue;
-    }
-
-    auto type_uid = symbol_up->getSymIndexId();
-    if (m_types.find(type_uid) != m_types.end())
-      continue;
-
-    // This should cause the type to get cached and stored in the `m_types`
-    // lookup.
-    if (!ResolveTypeUID(symbol_up->getSymIndexId()))
-      continue;
-
-    ++num_added;
-  }
-  return num_added;
+  // TODO: Implement this
+  return size_t();
 }
 
 size_t
@@ -375,11 +349,8 @@ lldb_private::Type *SymbolFilePDB::Resol
     return nullptr;
 
   lldb::TypeSP result = pdb->CreateLLDBTypeFromPDBType(*pdb_type);
-  if (result.get()) {
+  if (result.get())
     m_types.insert(std::make_pair(type_uid, result));
-    auto type_list = GetTypeList();
-    type_list->Insert(result);
-  }
   return result.get();
 }
 
@@ -678,9 +649,7 @@ size_t SymbolFilePDB::FindTypes(
   return 0;
 }
 
-lldb_private::TypeList *SymbolFilePDB::GetTypeList() {
-  return m_obj_file->GetModule()->GetTypeList();
-}
+lldb_private::TypeList *SymbolFilePDB::GetTypeList() { return nullptr; }
 
 size_t SymbolFilePDB::GetTypes(lldb_private::SymbolContextScope *sc_scope,
                                uint32_t type_mask,

Modified: lldb/trunk/unittests/SymbolFile/PDB/Inputs/test-pdb-types.cpp
URL: http://llvm.org/viewvc/llvm-project/lldb/trunk/unittests/SymbolFile/PDB/Inputs/test-pdb-types.cpp?rev=323102&r1=323101&r2=323102&view=diff
==============================================================================
--- lldb/trunk/unittests/SymbolFile/PDB/Inputs/test-pdb-types.cpp (original)
+++ lldb/trunk/unittests/SymbolFile/PDB/Inputs/test-pdb-types.cpp Mon Jan 22 03:51:56 2018
@@ -48,10 +48,6 @@ int test_func(int a, int b) { return a +
 
 typedef Class ClassTypedef;
 typedef NS::NSClass NSClassTypedef;
-typedef int(*FuncPointerTypedef)();
-typedef int(*VariadicFuncPointerTypedef)(char,...);
-FuncPointerTypedef GlobalFunc;
-VariadicFuncPointerTypedef GlobalVariadicFunc;
 int GlobalArray[10];
 
 static const int sizeof_NSClass = sizeof(NS::NSClass);
@@ -61,8 +57,6 @@ static const int sizeof_Enum = sizeof(En
 static const int sizeof_ShortEnum = sizeof(ShortEnum);
 static const int sizeof_ClassTypedef = sizeof(ClassTypedef);
 static const int sizeof_NSClassTypedef = sizeof(NSClassTypedef);
-static const int sizeof_FuncPointerTypedef = sizeof(FuncPointerTypedef);
-static const int sizeof_VariadicFuncPointerTypedef = sizeof(VariadicFuncPointerTypedef);
 static const int sizeof_GlobalArray = sizeof(GlobalArray);
 
 int main(int argc, char **argv) {

Modified: lldb/trunk/unittests/SymbolFile/PDB/SymbolFilePDBTests.cpp
URL: http://llvm.org/viewvc/llvm-project/lldb/trunk/unittests/SymbolFile/PDB/SymbolFilePDBTests.cpp?rev=323102&r1=323101&r2=323102&view=diff
==============================================================================
--- lldb/trunk/unittests/SymbolFile/PDB/SymbolFilePDBTests.cpp (original)
+++ lldb/trunk/unittests/SymbolFile/PDB/SymbolFilePDBTests.cpp Mon Jan 22 03:51:56 2018
@@ -483,10 +483,7 @@ TEST_F(SymbolFilePDBTests, TestTypedefs)
   llvm::DenseSet<SymbolFile *> searched_files;
   TypeMap results;
 
-  const char *TypedefsToCheck[] = {
-      "ClassTypedef", "NSClassTypedef",
-      "FuncPointerTypedef", "VariadicFuncPointerTypedef"
-  };
+  const char *TypedefsToCheck[] = {"ClassTypedef", "NSClassTypedef"};
   for (auto Typedef : TypedefsToCheck) {
     TypeMap results;
     EXPECT_EQ(1u, symfile->FindTypes(sc, ConstString(Typedef), nullptr, false,




More information about the lldb-commits mailing list