Records
Overview
- struct AAAlign - An abstract interface for all align attributes.
- struct AADereferenceable - An abstract interface for all dereferenceable attribute.
- class AAEvalLegacyPass - FunctionPass class - This class is used to implement most globa...
- class AAEvaluator - A CRTP mix-in to automatically provide informational APIs neede...
- struct AAHeapToStack - Helper to tie a abstract state implementation to an abstract at...
- struct AAIsDead - An abstract interface for liveness abstract attribute.
- struct AAMDNodes - A collection of metadata nodes that might be associated with a ...
- class AAManager - A manager for alias analyses. This class can have analyses regi...
- struct AAMemoryBehavior - An abstract interface for all memory related attributes.
- struct AANoAlias - An abstract interface for all noalias attributes.
- struct AANoCapture - An abstract interface for all nocapture attributes.
- struct AANoFree - An AbstractAttribute for nofree.
- struct AANoRecurse - An abstract attribute for norecurse.
- struct AANoReturn - An AbstractAttribute for noreturn.
- struct AANoSync - Helper class that provides common functionality to manifest IR ...
- struct AANoUnwind - Helper class that provides common functionality to manifest IR ...
- struct AANonNull - An abstract interface for all nonnull attributes.
- class AAQueryInfo - This class stores info we want to provide to or retain within a...
- struct AAReachability - An abstract interface to determine reachability of point A to B.
- class AAResultBase - A CRTP-driven "mixin" base class to help implement the function...
- class AAResultBase::AAResultsProxy - This proxy class models a common pattern where we delegate to e...
- class AAResults
- class AAResults::Concept - A private abstract base class describing the concept of an indi...
- class AAResults::Model - A private class template which derives from \c Concept and wrap...
- class AAResultsWrapperPass - A wrapper pass to provide the legacy pass manager access to a s...
- struct AAReturnedValues - An abstract attribute for the returned values of a function.
- struct AAUndefinedBehavior - An abstract attribute for undefined behavior.
- struct AAValueConstantRange - An abstract interface for range value analysis.
- struct AAValueConstantRangeArgument - ------------------ Value Constant Range Attribute -------------...
- struct AAValueConstantRangeCallSite - ------------------ Value Constant Range Attribute -------------...
- struct AAValueConstantRangeCallSiteArgument - ------------------ Value Constant Range Attribute -------------...
- struct AAValueConstantRangeCallSiteReturned - ------------------ Value Constant Range Attribute -------------...
- struct AAValueConstantRangeFloating - ------------------ Value Constant Range Attribute -------------...
- struct AAValueConstantRangeFunction - ------------------ Value Constant Range Attribute -------------...
- struct AAValueConstantRangeImpl - ------------------ Value Constant Range Attribute -------------...
- struct AAValueConstantRangeReturned - ------------------ Value Constant Range Attribute -------------...
- struct AAValueSimplify - An abstract interface for value simplify abstract attribute.
- struct AAWillReturn - An abstract attribute for willreturn.
- struct ADCEPass - A DCE pass that assumes instructions are dead until proven othe...
- class APByteStreamer
- class APFloat
- union APFloat::Storage
- struct APFloatBase - A self-contained host- and target-independent arbitrary-precisi...
- class APInt - Class for arbitrary precision integers. APInt is a functional r...
- struct APInt::ms - Magic data for optimising signed division by a constant.
- struct APInt::mu - Magic data for optimising unsigned division by a constant.
- struct APIntCompare
- class APSInt - Class for arbitrary precision integers. APInt is a functional r...
- class ARCMDKindCache - A cache of MDKinds used by various ARC optimizations.
- class ARCRuntimeEntryPoints - Declarations for ObjC runtime functions and constants. These ar...
- class ARM64UnwindEmitter
- class ARMAttributeParser
- struct ARMAttributeParser::DisplayHandler
- class ARMException - Emits exception handling directives.
- class ARMTargetStreamer - Target specific streamer interface. This is used so that target...
- class ASanGlobalsMetadataAnalysis - The ASanGlobalsMetadataAnalysis initializes and returns a Globa...
- struct ASanStackFrameLayout
- struct ASanStackVariableDescription
- class AShrOperator
- struct AbiTagAttr
- struct AbstractAttribute - Base struct for all "concrete attribute" deductions. The abstra...
- class AbstractCallSite
- struct AbstractCallSite::CallbackInfo
- class AbstractDependenceGraphBuilder - This abstract builder class defines a set of high-level steps f...
- class AbstractLatticeFunction - AbstractLatticeFunction - This class is implemented by the data...
- struct AbstractManglingParser
- struct AbstractManglingParser::NameState - Holds some extra information about a <name > that is being par...
- class AbstractManglingParser::ScopedTemplateParamList
- struct AbstractState - An interface to query the internal state of an abstract attribu...
- class AccelTable - This class holds an abstract representation of an Accelerator T...
- class AccelTableBase - A base class holding non-template-dependant functionality of th...
- struct AccelTableBase::HashData - Represents a group of entries with identical name (and hence, h...
- class AccelTableData - Interface which the different types of accelerator table data h...
- struct AccumBitVector
- class AddDiscriminatorsPass - A CRTP mix-in to automatically provide informational APIs neede...
- class AddOperator
- class AddrSpaceCastInst
- class AddrSpaceCastSDNode
- class AddressPool
- struct AddressPool::AddressPoolEntry
- struct AddressRange - A class that represents an address range. The range is specifie...
- class AddressRanges - The AddressRanges class helps normalize address range collectio...
- class AddressSanitizerPass - Public interface to the address sanitizer pass for instrumentin...
- class AddressesMap - AddressesMap represents information about valid addresses used ...
- class AggregateValueExpression
- class AggressiveAntiDepBreaker - This class works in conjunction with the post-RA scheduler to r...
- class AggressiveAntiDepState - Contains all the state necessary for anti-dep breaking.
- struct AggressiveAntiDepState::RegisterReference - Information about a register reference within a liverange
- class AggressiveInstCombinePass - A CRTP mix-in to automatically provide informational APIs neede...
- struct AliasMatchingData - Tablegenerated data structures needed to match alias patterns.
- class AliasNode - Represents an alias to a Node with an anchor. Example: *AnchorN...
- struct AliasPattern - Data for each alias pattern. Includes feature bits, string, num...
- struct AliasPatternCond
- class AliasSet - An intrusive list node. A base class to enable membership in in...
- class AliasSet::PointerRec
- class AliasSet::iterator - Define an iterator for alias sets... this is just a forward ite...
- class AliasSetTracker
- class AliasSetTracker::ASTCallbackVH - A CallbackVH to arrange for AliasSetTracker to be notified when...
- struct AliasSetTracker::ASTCallbackVHDenseMapInfo - Traits to tell DenseMap that tell us how to compare and hash th...
- class AliasSummary - Alias summary information.
- struct AliasSummary - AliasSummary is just a collection of ExternalRelation and Exter...
- struct Align - This struct is a compact representation of a valid (non-zero po...
- struct Align::LogValue - A trivial type to allow construction of constexpr Align. This i...
- class AlignAdapter
- struct AlignedCharArrayUnion - A suitably aligned and sized character array member which can h...
- class AlignerImpl
- class AlignmentCalcHelper - Helper template to calculate the max alignment requirement for ...
- struct AlignmentFromAssumptionsPass - A CRTP mix-in to automatically provide informational APIs neede...
- struct AllAccessTag
- class AllAnalysesOn - This templated class represents "all analyses that operate over...
- struct AllocFnsTy
- class AllocaInst
- class AllocaSliceRewriter - Visitor to rewrite instructions using p particular slice of an ...
- class AllocaSlices - Representation of the alloca slices. This class represents the ...
- class AllocaSlices::SliceBuilder - Builder for the alloca slices. This class builds a set of alloc...
- class AllocaSlices::partition_iterator - An iterator over partitions of the alloca's slices. This iterat...
- class AllocationOrder
- class AllocatorBase - CRTP base class providing obvious overloads for the core \c All...
- class AllocatorList - A linked-list with a custom, local allocator. Expose a std::lis...
- struct AllocatorList::Cloner
- struct AllocatorList::Disposer
- class AllocatorList::IteratorImpl
- struct AllocatorList::Node
- class AllowedRegVector - Holds a vector of the allowed physical regs for a vreg.
- class AlwaysInlinerPass
- struct AnalysisCallGraphWrapperPassTraits
- struct AnalysisGetter - Wrapper for FunctoinAnalysisManager.
- struct AnalysisInfoMixin - A CRTP mix-in that provides informational APIs needed for analy...
- struct AnalysisKey - A special type used by analysis passes to provide an address th...
- class AnalysisManager
- class AnalysisManager::Invalidator
- struct AnalysisPassConcept - Abstract concept of an analysis pass. This concept is parameter...
- struct AnalysisPassModel - Wrapper to model the analysis pass concept. Can wrap any type w...
- class AnalysisResolver
- struct AnalysisResultConcept - Abstract concept of an analysis result. This concept is paramet...
- struct AnalysisResultsForFn - Helper struct for bundling up the analysis results per function...
- struct AnalysisSetKey - A special type used to provide an address that identifies a set...
- class AnalysisUsage
- struct And - Matching combinators.
- class AnnotationSym
- class Annotations - Annotations lets you mark points and ranges inside source code,...
- struct Annotations::Range - Two offsets pointing to a continuous substring. End is not incl...
- struct AnonStructTypeKeyInfo
- struct AnonStructTypeKeyInfo::KeyTy
- class AntiDepBreaker - This class works in conjunction with the post-RA scheduler to r...
- class Any
- struct Any::StorageBase
- struct Any::StorageImpl
- struct Any::TypeId
- struct AnyBinaryOp_match
- class AnyCoroIdInst - This represents a common base class for llvm.coro.id instructio...
- class AnyCoroIdRetconInst - This represents either the llvm.coro.id.retcon or llvm.coro.id....
- class AnyCoroSuspendInst - A wrapper class for inspecting calls to intrinsic functions. Th...
- class AnyMemCpyInst
- class AnyMemIntrinsic
- class AnyMemMoveInst
- class AnyMemSetInst
- class AnyMemTransferInst
- class AppendingBinaryByteStream - An implementation of WritableBinaryStream which can write at it...
- class AppendingTypeTableBuilder
- class AppleAccelTableData - A base class for different implementations of Data classes for ...
- struct AppleAccelTableData::Atom - An Atom defines the form of the data in an Apple accelerator ta...
- class AppleAccelTableOffsetData - Accelerator table data implementation for simple Apple accelera...
- class AppleAccelTableStaticOffsetData - Accelerator table data implementation for simple Apple accelera...
- class AppleAccelTableStaticTypeData - Accelerator table data implementation for type accelerator tabl...
- class AppleAccelTableTypeData - Accelerator table data implementation for Apple type accelerato...
- class AppleAcceleratorTable - This implements the Apple accelerator table format, a precursor...
- class AppleAcceleratorTable::Entry - Apple-specific implementation of an Accelerator Entry.
- struct AppleAcceleratorTable::Header
- struct AppleAcceleratorTable::HeaderData
- class AppleAcceleratorTable::ValueIterator
- struct ArangeSpan
- struct ArchNames
- class ArchitectureSet
- class ArchitectureSet::arch_iterator
- class ArenaAllocator
- struct ArenaAllocator::AllocatorNode
- class Arg - A concrete instance of a particular driver option. The Arg clas...
- struct ArgFlagsTy
- class ArgList - ArgList - Ordered collection of driver arguments. The ArgList c...
- class ArgListRecord
- class Argument - This class represents an incoming formal argument to a Function...
- struct Argument - A key-value pair with a debug location that is used to display ...
- class ArgumentPromotionPass - Argument promotion pass. This pass walks the functions in each ...
- struct Argument_match
- class Array - An Array is a JSON array, which contains heterogeneous JSON val...
- class ArrayRecord
- class ArrayRecycler - Recycle small arrays allocated from a BumpPtrAllocator. Arrays ...
- class ArrayRecycler::Capacity - The size of an allocated array is represented by a Capacity ins...
- struct ArrayRecycler::FreeList
- class ArrayRef - ArrayRef - Represent a constant reference to an array (0 or mor...
- class ArraySubscriptExpr
- class ArrayType - Class to represent array types.
- class ArrayType
- struct ArrayTypeNode
- class AsmCommentConsumer - A callback class which is notified of each comment in an assemb...
- class AsmCond - AsmCond - Class to support conditional assembly The conditional...
- class AsmLexer - AsmLexer - Lexer class for assembly files.
- class AsmPrinter - This class is intended to be used as a driving class for all as...
- struct AsmPrinter::HandlerInfo - Protected struct HandlerInfo and Handlers permit target extende...
- struct AsmPrinter::SrcMgrDiagInfo
- struct AsmPrinter::XRayFunctionEntry
- class AsmPrinterHandler - Collects and handles AsmPrinter objects required to build debug...
- struct AsmRewrite
- class AsmToken - Target independent representation for an assembler token.
- class AssemblerConstantPools
- class AssemblyAnnotationWriter
- class AssertingVH
- struct AssignableFrom - Implement assignment in terms of construction.
- class AssumptionAnalysis - A function analysis which provides an \c AssumptionCache. This ...
- class AssumptionCache - A cache of @ llvm.assume calls within a function. This cache p...
- class AssumptionCache::AffectedValueCallbackVH - Value handle with callbacks on RAUW and destruction. This is a ...
- class AssumptionCacheTracker - An immutable pass that tracks lazily created \c AssumptionCache...
- class AssumptionCacheTracker::FunctionCallbackVH - A callback value handle applied to function objects, which we u...
- class AssumptionPrinterPass - Printer pass for the \c AssumptionAnalysis results.
- class AtomicCmpXchgInst
- class AtomicFileWriteError - Base class for user error types. Users should declare their err...
- class AtomicMemCpyInst
- class AtomicMemIntrinsic
- class AtomicMemMoveInst
- class AtomicMemSetInst
- class AtomicMemTransferInst
- class AtomicRMWInst
- class AtomicSDNode
- class AttrBuilder
- class Attribute - Functions, function parameters, and return types can have attri...
- class AttributeImpl - This class represents a single, uniqued attribute. That attribu...
- class AttributeList - This class holds the attributes for a function, its return valu...
- class AttributeListImpl - This class represents a set of attributes that apply to the fun...
- struct AttributeSection
- class AttributeSet - This class holds the attributes for a particular argument, para...
- class AttributeSetNode - This class represents a group of attributes that apply to one e...
- struct AttributeSpec::ByteSizeStorage - The following field is used for ByteSize for non-implicit_const...
- struct Attributor - The fixpoint analysis framework that orchestrates the attribute...
- struct Attributor::ArgumentReplacementInfo - Helper struct used in the communication between an abstract att...
- struct Attributor::QueryMapValueTy - A map from abstract attributes to the ones that queried them th...
- struct AttributorPass - }
- class Automaton - A deterministic finite-state automaton. The automaton is define...
- struct AvailableValue - Represents a particular available value that we know how to mat...
- struct AvailableValueInBlock - Represents an AvailableValue which can be rematerialized at the...
- struct BABAlloc
- struct BCDumpOptions
- struct BDCEPass - A CRTP mix-in to automatically provide informational APIs neede...
- struct BFIDOTGraphTraitsBase
- struct BPIPassTrait - Simple trait class that provides a mapping between BPI passes a...
- class BPRelativeSym
- struct BackrefContext
- class BaseClassRecord
- class BaseIndexOffset - Helper struct to parse and store a memory address as base + ind...
- class BasicAA - Analysis pass providing a never-invalidated alias analysis resu...
- class BasicAAResult - This is the AA result object for the basic, local, and stateles...
- struct BasicAAResult::DecomposedGEP
- struct BasicAAResult::VariableGEPIndex
- class BasicAATest - There's a lot of common setup between these tests. This fixture...
- struct BasicAATest::TestAnalyses
- class BasicAAWrapperPass - Legacy wrapper pass to provide the BasicAAResult object.
- class BasicBlock
- class BasicBlock::phi_iterator_impl
- class BasicBlockEdge
- class BasicBlockSDNode
- struct BasicBlockState - State we compute and track per basic block.
- struct BasicDIEUnit - Represents a compile or type unit.
- class BasicExpression
- class BasicTTIImpl
- class BasicTTIImplBase - Base class which can be used to help build a TTI implementation...
- class BatchAAResults - This class is a wrapper over an AAResults, and it is intended t...
- struct BestOpData
- class BinOpInit - !op (X, Y) - Combine two inits.
- struct BinOpPred_match
- struct BinaryAnnotationIterator - CRTP base class which implements the entire standard iterator f...
- class BinaryByteStream - An implementation of BinaryStream which holds its entire data s...
- class BinaryConstantExpr - BinaryConstantExpr - This class is private to Constants.cpp, an...
- class BinaryCoverageReader - Reader for the coverage mapping data that is emitted by the fro...
- struct BinaryCoverageReader::ProfileMappingRecord
- class BinaryExpr
- class BinaryItemStream - BinaryItemStream represents a sequence of objects stored in som...
- struct BinaryItemTraits
- class BinaryOpIntrinsic
- struct BinaryOp_match
- struct BinaryOp_match
- class BinaryOperation - Class representing a single binary operation in the AST of an e...
- class BinaryOperator
- class BinaryStream - An interface for accessing data in a stream-like format, but wh...
- class BinaryStreamError - Base class for errors originating when parsing raw PDB files
- class BinaryStreamReader - Provides read only access to a subclass of `BinaryStream`. Pro...
- class BinaryStreamRef - BinaryStreamRef is to BinaryStream what ArrayRef is to an Array...
- class BinaryStreamRefBase - Common stuff for mutable and immutable StreamRefs.
- class BinaryStreamWriter - Provides write only access to a subclass of `WritableBinaryStre...
- struct BinarySubstreamRef
- struct BinopElts - These are the ingredients in an alternate form binary operator ...
- class BitCastInst
- class BitCastOperator
- class BitCodeAbbrev - BitCodeAbbrev - This class represents an abbreviation record. ...
- class BitCodeAbbrevOp - BitCodeAbbrevOp - This describes one or more operands in an abb...
- class BitFieldRecord
- class BitInit - 'true'/'false' - Represent a concrete initializer for a bit.
- struct BitIntegerState - Specialization of the integer state for a bit-wise encoding.
- class BitMaskClassIterator - This class encapuslates the logic to iterate over bitmask retur...
- class BitRecTy - 'bit' - Represent a single bit
- struct BitSetBuilder
- struct BitSetInfo
- struct BitTestBlock
- struct BitTestCase
- class BitVector
- class BitVector::reference
- class BitcodeAnalyzer
- struct BitcodeAnalyzer::PerBlockIDStats
- struct BitcodeAnalyzer::PerRecordStats
- struct BitcodeFileContents
- struct BitcodeLTOInfo - Basic information extracted from a bitcode module to be used fo...
- class BitcodeModule - Represents a module in a bitcode file.
- class BitcodeReaderValueList
- class BitcodeWriter
- class BitcodeWriterPass - Pass for writing a module of IR out to a bitcode file. Note tha...
- class BitsInit - '{ a, b, c }' - Represents an initializer for a BitsRecTy value...
- class BitsRecTy - 'bits <n >' - Represent a fixed number of bits
- class BitstreamBlockInfo - This class maintains the abbreviations read from a block info b...
- struct BitstreamBlockInfo::BlockInfo - This contains information emitted to BLOCKINFO_BLOCK blocks. Th...
- class BitstreamCursor - This represents a position within a bitcode file, implemented o...
- struct BitstreamCursor::Block
- struct BitstreamEntry - When advancing through a bitstream cursor, each advance can dis...
- struct BitstreamMetaParserHelper - Helper to parse a META_BLOCK for a bitstream remark container.
- struct BitstreamMetaSerializer - Serializer of metadata for bitstream remarks.
- struct BitstreamParserHelper - Helper to parse any bitstream remark container.
- struct BitstreamRemarkParser - Parses and holds the state of the latest parsed remark.
- struct BitstreamRemarkParserHelper - Helper to parse a REMARK_BLOCK for a bitstream remark container.
- struct BitstreamRemarkParserHelper::Argument
- struct BitstreamRemarkSerializer - Implementation of the remark serializer using LLVM bitstream.
- struct BitstreamRemarkSerializerHelper - Serialize the remarks to LLVM bitstream. This class provides wa...
- class BitstreamWriter
- struct BitstreamWriter::Block
- struct BitstreamWriter::BlockInfo - BlockInfo - This contains information emitted to BLOCKINFO_BLOC...
- class BlockAddress - The address of a basic block.
- class BlockAddressSDNode
- struct BlockEdgesAdder
- class BlockFrequency
- class BlockFrequencyAnalysis
- class BlockFrequencyInfo
- class BlockFrequencyInfoImpl - Shared implementation for block frequency analysis. This is a s...
- class BlockFrequencyInfoImplBase - Base class for BlockFrequencyInfoImpl BlockFrequencyInfoImplBas...
- struct BlockFrequencyInfoImplBase::BlockNode - Representative of a block. This is a simple wrapper around an i...
- struct BlockFrequencyInfoImplBase::Distribution - Distribution of unscaled probability weight. Distribution of un...
- struct BlockFrequencyInfoImplBase::FrequencyData - Stats about a block itself.
- struct BlockFrequencyInfoImplBase::LoopData - Data about a loop. Contains the data necessary to represent a l...
- struct BlockFrequencyInfoImplBase::Weight - Unscaled probability weight. Probability weight for an edge in ...
- struct BlockFrequencyInfoImplBase::WorkingData - Index of loop information.
- class BlockFrequencyInfoWrapperPass
- class BlockFrequencyPrinterPass
- class BlockIndexer
- struct BlockIndexer::Block
- class BlockMass - Mass of a block. This class implements a sort of fixed-point fr...
- class BlockPrinter
- class BlockScalarNode - A block scalar node is an opaque datum that can be presented as...
- struct BlockScalarTraits - This class should be specialized by type that requires custom c...
- struct BlockScheduling::ReadyList - This is a 'vector' (really, a variable-sized array), optimized ...
- struct BlockStringValue
- class BlockSym
- class BlockVerifier
- class BlotMapVector - An associative container with fast insertion-order (determinist...
- class BoUpSLP - Bottom Up SLP Vectorizer.
- struct BoUpSLP::BlockScheduling - Contains all scheduling data for a basic block.
- struct BoUpSLP::EdgeInfo - This structure holds any data we need about the edges being tra...
- struct BoUpSLP::ExternalUser - This POD struct describes one external user in the vectorized t...
- struct BoUpSLP::OrdersTypeDenseMapInfo - A DenseMapInfo implementation for holding DenseMaps and DenseSe...
- struct BoUpSLP::ScheduleData - Contains all scheduling relevant data for an instruction. A Sch...
- struct BoUpSLP::TreeEntry
- class BoUpSLP::VLOperands - A helper data structure to hold the operands of a vector of ins...
- class BoolExpr
- struct BooleanState - Simple wrapper for a single bit (boolean) state.
- struct BottomUpPtrState - This class summarizes several per-pointer runtime properties wh...
- struct BoundsCheckingPass - A pass to instrument code and perform run-time bounds checking ...
- class BracedExpr
- class BracedRangeExpr
- class BranchFolder
- class BranchFolder::MBFIWrapper - This class keeps track of branch frequencies of newly created b...
- class BranchFolder::MergePotentialsElt
- class BranchFolder::SameTailElt
- class BranchInst
- struct BranchInst::const_succ_op_iterator
- struct BranchInst::succ_op_iterator
- class BranchNode
- class BranchProbability
- class BranchProbabilityAnalysis - Analysis pass which computes \c BranchProbabilityInfo.
- class BranchProbabilityInfo - Analysis providing branch probability information. This is a fu...
- class BranchProbabilityInfo::BasicBlockCallbackVH - Value handle with callbacks on RAUW and destruction. This is a ...
- struct BranchProbabilityInfo::SccInfo
- class BranchProbabilityInfoWrapperPass - Legacy analysis pass which computes \c BranchProbabilityInfo.
- class BranchProbabilityPrinterPass - Printer pass for the \c BranchProbabilityAnalysis results.
- struct BreakCriticalEdgesPass - A CRTP mix-in to automatically provide informational APIs neede...
- class BreakFalseDeps - MachineFunctionPass - This class adapts the FunctionPass interf...
- struct BucketInfo
- class BufferByteStreamer
- class BufferExtents
- class BuildInfoRecord
- class BuildInfoSym
- class BuildVectorSDNode
- struct BuiltInTypes
- class BumpPtrAllocatorImpl - Allocate memory in an ever growing pool, as if by bump-pointer....
- struct ByteArrayBuilder - This class is used to build a byte array containing overlapping...
- class ByteStreamer
- class CCState
- struct CCState::ByValInfo
- class CCValAssign - CCValAssign - Represent assignment of one arg/retval to a locat...
- class CFGAnalyses - Represents analyses that only rely on functions' control flow. ...
- class CFGBuilder - CFGBuilder builds IR with specific CFG, based on the supplied l...
- struct CFGBuilder::Arc
- struct CFGBuilder::Update
- struct CFGHolder
- class CFGMST - An union-find based Minimum Spanning Tree for CFG Implements a ...
- class CFGOnlyPrinterPass - A CRTP mix-in to automatically provide informational APIs neede...
- class CFGOnlyViewerPass - A CRTP mix-in to automatically provide informational APIs neede...
- class CFGPrinterPass - A CRTP mix-in to automatically provide informational APIs neede...
- struct CFGViewPredecessors
- struct CFGViewPredecessors::DeletedEdgesFilter
- struct CFGViewSuccessors
- struct CFGViewSuccessors::DeletedEdgesFilter
- class CFGViewerPass - A CRTP mix-in to automatically provide informational APIs neede...
- class CFIProgram - Represent a sequence of Call Frame Information instructions tha...
- struct CFIProgram::Instruction - An instruction consists of a DWARF CFI opcode and an optional s...
- class CFLAndersAA - Analysis pass providing a never-invalidated alias analysis resu...
- class CFLAndersAAResult - A CRTP-driven "mixin" base class to help implement the function...
- class CFLAndersAAResult::FunctionInfo
- class CFLAndersAAWrapperPass - Legacy wrapper pass to provide the CFLAndersAAResult object.
- class CFLGraph - The Program Expression Graph (PEG) of CFL analysis CFLGraph is ...
- struct CFLGraph::Edge
- struct CFLGraph::NodeInfo
- class CFLGraph::ValueInfo
- class CFLGraphBuilder - A builder class used to create CFLGraph instance from a given f...
- class CFLGraphBuilder::GetEdgesVisitor - Gets the edges our graph should have, based on an Instruction*
- class CFLSteensAA - Analysis pass providing a never-invalidated alias analysis resu...
- class CFLSteensAAResult - A CRTP-driven "mixin" base class to help implement the function...
- class CFLSteensAAResult::FunctionInfo - Information we have about a function and would like to keep aro...
- class CFLSteensAAWrapperPass - Legacy wrapper pass to provide the CFLSteensAAResult object.
- class CGProfilePass - A CRTP mix-in to automatically provide informational APIs neede...
- class CGSCCToFunctionPassAdaptor - Adaptor that maps from a SCC to its functions. Designed to allo...
- struct CGSCCUpdateResult - Support structure for SCC passes to communicate updates the cal...
- struct CHIArg
- class CIE - DWARF Common Information Entry (CIE)
- struct CPURegister
- class CSEConfigBase
- class CSEConfigConstantOnly
- class CSEConfigFull
- class CSEMIRBuilder - Defines a builder that does CSE of MachineInstructions using GI...
- struct CVMemberRecord
- class CVRecord - CVRecord is a fat pointer (base + size pair) to a symbol or typ...
- class CVSymbolDumper - Dumper for CodeView symbol streams found in COFF object files a...
- class CVSymbolVisitor
- class CacheCost - \c CacheCost represents the estimated cost of a inner loop as t...
- struct CachePruningPolicy - Policy for the pruneCache() function. A default constructed Cac...
- struct CacheStream - This class wraps an output stream for a native object. Most cli...
- class CachedHashString - A container which contains a string, which it owns, plus a prec...
- struct CachedHashString::ConstructEmptyOrTombstoneTy
- class CachedHashStringRef - A container which contains a StringRef plus a precomputed hash.
- class CachedPathResolver - Small helper that resolves and caches file paths. This helps re...
- class CallArgRecord
- class CallBase
- struct CallBase::BundleOpInfo - Used to keep track of an operand bundle. See the main comment ...
- class CallBrInst
- struct CallCount
- class CallEntryPseudoSourceValue - Special value supplied for machine level alias analysis. It ind...
- class CallExpr
- class CallExpression
- class CallGraph - The basic data container for the call graph of a \c Module of I...
- class CallGraphAnalysis - An analysis pass to compute the \c CallGraph for a \c Module. T...
- class CallGraphNode - A node in the call graph for a module. Typically represents a f...
- class CallGraphPrinterPass - Printer pass for the \c CallGraphAnalysis results.
- class CallGraphSCC - CallGraphSCC - This is a single SCC that a CallGraphSCCPass is ...
- class CallGraphSCCPass - Pass interface - Implemented by all 'passes'. Subclass this if...
- class CallGraphWrapperPass - The \c ModulePass which wraps up a \c CallGraph and the logic t...
- class CallInfo
- class CallInst
- class CallLowering
- struct CallLowering::ArgInfo
- struct CallLowering::CallLoweringInfo
- struct CallLowering::ValueHandler - Argument handling is mostly uniform between the four places tha...
- class CallSite
- class CallSiteBase
- struct CallSiteInfo - Serializable representation of CallSiteInfo.
- struct CallSiteInfo::ArgRegPair
- struct CallSiteInfo::MachineInstrLoc - Identifies call instruction location in machine function.
- class CallSiteInfoSym
- struct CallSiteSplittingPass - A CRTP mix-in to automatically provide informational APIs neede...
- struct CallbackAndCookie
- class CallbackVH
- class CalledValuePropagationPass - A CRTP mix-in to automatically provide informational APIs neede...
- struct CalleeInfo - Class to accumulate and hold information about a callee.
- class CalleeSavedInfo - The CalleeSavedInfo class tracks the information need to locate...
- class CallerSym
- struct Candidate
- class CanonicalizeAliasesPass - Simple pass that canonicalizes aliases.
- struct CaptureTracker - This callback is used in conjunction with PointerMayBeCaptured....
- struct CaseBits
- struct CaseBlock - This structure is used to communicate between SelectionDAGBuild...
- struct CaseBlock::PredInfoPair
- struct CaseCluster - A cluster of case labels.
- struct CastClass_match
- class CastExpr
- class CastInst
- struct CatchPadDenseMapInfo
- class CatchPadInst
- class CatchReturnInst
- class CatchSwitchInst
- struct CheckAvailable
- struct CheckIsBool
- struct CheckType
- struct ChildrenGetterTy - Generic utility class used for getting the children of a basic ...
- struct ChoppedName
- class Class5
- class Class5Tmpl
- struct ClassInfo
- struct ClassInfo::MemberInfo
- class ClassRecord
- class CleanupPadInst
- class CleanupReturnInst
- struct ClonedCodeInfo - This struct can be used to capture information about code being...
- class ClosureTypeName
- struct ClrClause
- struct ClrEHUnwindMapEntry
- struct CmpClass_match
- class CmpInst
- class CoalescerPair - A helper class for register coalescers. When deciding if two re...
- class CodeEmitter - A utility class used to compute instruction encodings for a cod...
- class CodeExtractor - Utility class for extracting code into a new function. This uti...
- struct CodeExtractor::LifetimeMarkerInfo
- class CodeExtractorAnalysisCache - A cache for the CodeExtractor analysis. The operation \ref Code...
- class CodeGenCoverage
- class CodeInit - This is the common super-class of types that have a specific, e...
- struct CodeMetrics - Utility to calculate the size and a few similar metrics for a s...
- class CodeRecTy - 'code' - Represent a code fragment
- class CodeViewContext - Holds state from .cv_file and .cv_loc directives for later emis...
- struct CodeViewContext::FileInfo
- class CodeViewDebug - Collects and handles line tables information in a CodeView form...
- struct CodeViewDebug::CVGlobalVariable
- struct CodeViewDebug::FunctionInfo
- struct CodeViewDebug::InlineSite
- struct CodeViewDebug::LexicalBlock
- struct CodeViewDebug::LocalVarDefRange - Represents the most general definition range.
- struct CodeViewDebug::LocalVariable - Similar to DbgVariable in DwarfDebug, but not dwarf-specific.
- struct CodeViewDebug::TypeLoweringScope
- class CodeViewError - Base class for errors originating when parsing raw PDB files
- class CodeViewRecordIO
- struct CodeViewRecordIO::RecordLimit
- class CodeViewRecordStreamer
- class CoffGroupSym
- struct ColorMap
- class ColumnInfo
- struct ColumnNumberEntry
- class Combiner
- class CombinerHelper
- class CombinerInfo
- class Comdat
- class CompareConstantExpr - A constant value that is initialized with an expression using o...
- class Compile2Sym
- class Compile3Sym
- class CompileUnit - Stores all information relating to a compile unit, be it in its...
- class CompileUnit - A DWARF compile unit used to generate DWARF compile/type units....
- struct CompileUnit::AccelInfo
- struct CompileUnit::DIEInfo - Information gathered about a DIE in the object file.
- class CompositeType - Common super class of ArrayType, StructType and VectorType.
- class ConcreteOperator - A helper template for defining operators for individual opcodes.
- class CondCodeSDNode
- class CondOpInit - !cond(condition_1: value1, ... , condition_n: value) Selects th...
- class ConditionalExpr
- struct Config - LTO configuration. A linker can configure LTO by setting fields...
- class ConnectedVNInfoEqClasses - ConnectedVNInfoEqClasses - Helper class that can divide VNInfos...
- class ConstMIBundleOperands
- class Constant - This is an important base class in LLVM. It provides the common...
- struct ConstantAggrKeyType
- class ConstantAggregate - Base class for aggregate constants (with operands). These const...
- class ConstantAggregateZero - All zero aggregate value
- class ConstantArray - ConstantArray - Constant Array Declarations
- class ConstantAsMetadata
- struct ConstantCandidate - Keeps track of a constant candidate and its uses.
- class ConstantData - Base class for constants with no operands. These constants have...
- class ConstantDataArray - An array constant whose element type is a simple 1/2/4/8-byte i...
- struct ConstantDataArraySlice - Represents offset+length into a ConstantDataArray.
- class ConstantDataSequential - ConstantDataSequential - A vector or array constant whose eleme...
- class ConstantDataVector - A vector constant whose element type is a simple 1/2/4/8-byte i...
- class ConstantExpr - A constant value that is initialized with an expression using o...
- struct ConstantExprKeyType
- class ConstantExpression
- class ConstantFP
- class ConstantFPSDNode
- class ConstantFolder - ConstantFolder - Create constants with minimum, target independ...
- class ConstantFoldingMIRBuilder - An MIRBuilder which does trivial constant folding of binary ops...
- class ConstantHoistingPass - A CRTP mix-in to automatically provide informational APIs neede...
- struct ConstantInfo - A base constant and all its rebased constants.
- class ConstantInt - This is the shared class of boolean and integer constants. This...
- struct ConstantLog2 - A tiny meta function to compute the log2 of a compile time cons...
- struct ConstantMatch
- class ConstantMergePass - A pass that merges duplicate global constants into a single con...
- class ConstantPointerNull - A constant pointer value that points to null
- class ConstantPool
- struct ConstantPoolEntry
- class ConstantPoolSDNode
- class ConstantRange - This class represents a range of values.
- class ConstantSDNode
- class ConstantStruct - Base class for aggregate constants (with operands). These const...
- class ConstantSym
- class ConstantTokenNone - A constant token which is empty
- class ConstantUniqueMap
- struct ConstantUniqueMap::MapInfo
- struct ConstantUser - Keeps track of the user of a constant and the operand index whe...
- class ConstantVector - Constant Vector Declarations
- class ConstrainedFPCmpIntrinsic
- class ConstrainedFPIntrinsic
- class Context
- class ContextAndReplaceableUses
- class ContextualFoldingSet - ContextualFoldingSet - This template class is a further refinem...
- struct ContextualFoldingSetTrait - ContextualFoldingSetTrait - Like FoldingSetTrait, but for Conte...
- class ContinuationRecordBuilder
- class ControlHeightReductionPass - A CRTP mix-in to automatically provide informational APIs neede...
- class ConversionExpr
- struct ConversionOperatorIdentifierNode
- class ConversionOperatorType
- struct ConvertUTFResultContainer
- struct CopyHint
- class CoroAllocInst - This represents the llvm.coro.alloc instruction.
- class CoroAllocaAllocInst - This represents the llvm.coro.alloca.alloc instruction.
- class CoroAllocaFreeInst - This represents the llvm.coro.alloca.free instruction.
- class CoroAllocaGetInst - This represents the llvm.coro.alloca.get instruction.
- class CoroBeginInst - This class represents the llvm.coro.begin instruction.
- class CoroEndInst - This represents the llvm.coro.end instruction.
- class CoroFrameInst - This represents the llvm.coro.frame instruction.
- class CoroFreeInst - This represents the llvm.coro.free instruction.
- class CoroIdInst - This represents the llvm.coro.id instruction.
- struct CoroIdInst::Info
- class CoroIdRetconInst - This represents the llvm.coro.id.retcon instruction.
- class CoroIdRetconOnceInst - This represents the llvm.coro.id.retcon.once instruction.
- class CoroPromiseInst - This represents the llvm.coro.promise instruction.
- class CoroSaveInst - This represents the llvm.coro.save instruction.
- class CoroSizeInst - This represents the llvm.coro.size instruction.
- class CoroSubFnInst - This class represents the llvm.coro.subfn.addr instruction.
- class CoroSuspendInst - This represents the llvm.coro.suspend instruction.
- class CoroSuspendRetconInst - This represents the llvm.coro.suspend.retcon instruction.
- struct CorrelatedValuePropagationPass - A CRTP mix-in to automatically provide informational APIs neede...
- struct CostTblEntry - Cost Table Entry
- struct CostsAndCount
- struct CountSumOrPercent
- struct CountedRegion - Associates a source range with an execution count.
- struct CountedSet
- struct Counter - A Counter is an abstract value that describes how to compute th...
- struct CounterExpression - A Counter expression is a value that represents an arithmetic o...
- class CounterExpressionBuilder - A Counter expression builder is used to construct the counter e...
- struct CounterExpressionBuilder::Term - Represents a term in a counter expression tree.
- class CounterMappingContext - A Counter mapping context is used to connect the counters, expr...
- struct CounterMappingRegion - A Counter mapping region associates a source range with a speci...
- struct CovMapFunctionRecord
- struct CovMapFunctionRecordV1
- struct CovMapHeader
- struct CovMapTraits
- class CoverageData - Coverage information to be processed or displayed. This represe...
- class CoverageFilenamesSectionWriter - Writer of the filenames section for the instrumentation based c...
- class CoverageMapError - Base class for user error types. Users should declare their err...
- class CoverageMapping - The mapping of profile information to coverage data. This is th...
- class CoverageMappingIterator - A file format agnostic iterator over coverage mapping data.
- class CoverageMappingReader
- struct CoverageMappingRecord - Coverage mapping information for a single function.
- class CoverageMappingWriter - Writer for instrumentation based coverage mapping data.
- struct CoverageSegment - The execution count information starting at a point in a file. ...
- struct CpuNames
- class CrashRecoveryContext - Crash recovery helper object. This class implements support for...
- class CrashRecoveryContextCleanup - Abstract base class of cleanup handlers. Derived classes overri...
- class CrashRecoveryContextCleanupBase - Base class of cleanup handler that controls recovery of resourc...
- class CrashRecoveryContextCleanupRegistrar - Helper class for managing resource cleanups. Clients create obj...
- class CrashRecoveryContextDeleteCleanup - Cleanup handler that reclaims resource by calling 'delete' on i...
- class CrashRecoveryContextDestructorCleanup - Cleanup handler that reclaims resource by calling destructor on...
- class CrashRecoveryContextReleaseRefCleanup - Cleanup handler that reclaims resource by calling its method 'R...
- class CriticalAntiDepBreaker - This class works in conjunction with the post-RA scheduler to r...
- struct CriticalDependency - A critical data dependency descriptor. Field RegID is set to th...
- struct CriticalEdgeSplittingOptions - Option class for critical edge splitting. This provides a build...
- class CrossDSOCFIPass - A CRTP mix-in to automatically provide informational APIs neede...
- struct CrossModuleExport
- struct CrossModuleImport
- struct CrossModuleImportItem
- class CtorDtorName
- class CtorVtableSpecialName
- class CustomEventRecord
- class CustomEventRecordV5
- struct CustomMappingTraits - This class should be specialized by any type that needs to be c...
- struct CustomTypeNode
- struct CxxUnwindMapEntry
- class CycleSegment - A sequence of cycles. This class can be used as a building bloc...
- class DAGDeltaAlgorithm - DAGDeltaAlgorithm - Implements a "delta debugging" algorithm fo...
- class DAGTypeLegalizer - This takes an arbitrary SelectionDAG as input and hacks on it u...
- class DCEPass - Basic Dead Code Elimination pass.
- class DDGAnalysis - Analysis pass that builds the DDG for a loop.
- class DDGAnalysisPrinterPass - Textual printer pass for the DDG of a loop.
- class DDGBuilder - Concrete implementation of a pure data dependence graph builder...
- class DDGEdge - Data Dependency Graph Edge. An edge in the DDG can represent a ...
- class DDGNode - Data Dependence Graph Node The graph can represent the followin...
- class DFAPacketizer
- class DFCalculateWorkObject
- class DGEdge - Represent an edge in the directed graph. The edge contains the ...
- class DGNode - Represent a node in the directed graph. The node has a (possibl...
- class DGTestEdge - Represent an edge in the directed graph. The edge contains the ...
- class DGTestGraph - Directed graph The graph is represented by a table of nodes. Ea...
- class DGTestNode - Represent a node in the directed graph. The node has a (possibl...
- class DIBasicType - Basic type, like 'int' or 'float'. TODO: Split out DW_TAG_unspe...
- class DIBuilder
- class DICommonBlock - Base class for scope-like contexts. Base class for lexical scop...
- class DICompileUnit - Compile unit.
- class DICompositeType - Composite types. TODO: Detach from DerivedTypeBase (split out M...
- class DIContext
- class DIDerivedType - Derived types. This includes qualified types, pointers, referen...
- struct DIDumpOptions - Container for dump options that control which debug information...
- class DIE - A structured debug information entry. Has an abbreviation whic...
- class DIE - A DWARF debug information entry class used to generate DWARF DI...
- class DIEAbbrev - Dwarf abbreviation, describes the organization of a debug infor...
- class DIEAbbrevData - Dwarf abbreviation data, describes one attribute of a Dwarf abb...
- class DIEAbbrevSet - Helps unique DIEAbbrev objects and assigns abbreviation numbers...
- class DIEBaseTypeRef - A BaseTypeRef DIE.
- class DIEBlock - DIEBlock - Represents a block of values.
- class DIEDelta - A simple label difference DIE.
- class DIEDwarfExpression - DwarfExpression implementation for singular DW_AT_location.
- class DIEEntry - A pointer to another debug information entry. An instance of t...
- class DIEExpr - An expression DIE.
- class DIEHash - An object containing the capability of hashing and adding hash ...
- struct DIEHash::DIEAttrs
- class DIEInlineString - A container for inline string values. This class is used with t...
- class DIEInteger - An integer value DIE.
- class DIELabel - A label DIE.
- class DIELoc - DIELoc - Represents an expression location.
- class DIELocList - Represents a pointer to a location list in the debug_loc sectio...
- class DIEString - A container for string pool string values. This class is used w...
- class DIEUnit - Represents a compile or type unit.
- class DIEValue
- class DIEValueList - A list of DIE values. This is a singly-linked list, but instead...
- struct DIEValueList::Node
- class DIEValueList::const_value_iterator - CRTP base class for adapting an iterator to a different type. T...
- class DIEValueList::value_iterator - CRTP base class for adapting an iterator to a different type. T...
- class DIEnumerator - Enumeration value. TODO: Add a pointer to the context (DW_TAG_e...
- class DIExpression - DWARF expression. This is (almost) a DWARF expression that modi...
- class DIExpression::ExprOperand - A lightweight wrapper around an expression operand. TODO: Store...
- struct DIExpression::FragmentInfo - Holds the characteristics of one fragment of a larger variable.
- class DIExpression::expr_op_iterator - An iterator for expression operands.
- class DIExpressionCursor - Holds a DIExpression and keeps track of how many operands have ...
- class DIFile - File. TODO: Merge with directory/file node (including users). T...
- struct DIFile::ChecksumInfo - A single checksum, represented by a \a Kind and a \a Value (a s...
- struct DIGlobal - Container for description of a global variable.
- class DIGlobalVariable - Global variables. TODO: Remove DisplayName. It's always equal ...
- class DIGlobalVariableExpression - A pair of DIGlobalVariable and DIExpression.
- class DIImportedEntity - An imported module (C++ using directive or similar).
- class DIInliningInfo - A format-neutral container for inlined code description.
- class DILabel - Label.
- class DILexicalBlock - A scope for locals. A legal scope for lexical blocks, local var...
- class DILexicalBlockBase - A scope for locals. A legal scope for lexical blocks, local var...
- class DILexicalBlockFile - A scope for locals. A legal scope for lexical blocks, local var...
- struct DILineInfo - A format-neutral container for source line information.
- struct DILineInfoSpecifier - Controls which fields of DILineInfo container should be filled ...
- struct DILocal
- class DILocalScope - A scope for locals. A legal scope for lexical blocks, local var...
- class DILocalVariable - Local variable. TODO: Split up flags.
- class DILocation - Debug location. A debug location in source code, used for debug...
- class DIMacro - Macro Info DWARF-like metadata node. A metadata node with a DWA...
- class DIMacroFile - Macro Info DWARF-like metadata node. A metadata node with a DWA...
- class DIMacroNode - Macro Info DWARF-like metadata node. A metadata node with a DWA...
- class DIModule - A (clang) module that has been imported by the compile unit.
- class DINamespace - Base class for scope-like contexts. Base class for lexical scop...
- class DINode - Tagged DWARF-like metadata node. A metadata node with a DWARF t...
- class DIObjCProperty - Tagged DWARF-like metadata node. A metadata node with a DWARF t...
- class DIPrinter
- class DIScope - Base class for scope-like contexts. Base class for lexical scop...
- class DISubprogram - Subprogram description.
- class DISubrange - Array subrange. TODO: Merge into node for DW_TAG_array_type, wh...
- class DISubroutineType - Type array for a subprogram. TODO: Fold the array of types in d...
- class DITemplateParameter - Base class for template parameters.
- class DITemplateTypeParameter - Base class for template parameters.
- class DITemplateValueParameter - Base class for template parameters.
- class DIType - Base class for types. TODO: Remove the hardcoded name and conte...
- class DITypeRefArray
- class DITypeRefArray::iterator
- class DIVariable - Base class for variables.
- struct DOTGraphTraits - DOTGraphTraits - Template class that can be specialized to cust...
- class DOTGraphTraitsModulePrinter
- class DOTGraphTraitsModuleViewer
- class DOTGraphTraitsPrinter
- class DOTGraphTraitsViewer
- class DSEPass - This class implements a trivial dead store elimination. We cons...
- class DWARF5AccelTableData - The Data class implementation for DWARF v5 accelerator table. U...
- class DWARF5AccelTableStaticData - Interface which the different types of accelerator table data h...
- class DWARFAbbreviationDeclaration
- struct DWARFAbbreviationDeclaration::AttributeSpec
- struct DWARFAbbreviationDeclaration::FixedSizeInfo - A helper structure that can quickly determine the size in bytes...
- class DWARFAbbreviationDeclarationSet
- class DWARFAcceleratorTable - The accelerator tables are designed to allow efficient random a...
- class DWARFAcceleratorTable::Entry - An abstract class representing a single entry in the accelerato...
- struct DWARFAddressRange
- struct DWARFAttribute - Encapsulates a DWARF attribute value and all of the data requir...
- class DWARFCompileUnit
- class DWARFContext - DWARFContext This data structure is the top level entity that d...
- struct DWARFContext::DIEsForAddress - Wraps the returned DIEs for a given address.
- struct DWARFContext::DWOFile
- class DWARFDataExtractor - A DataExtractor (typically for an in-memory copy of an object-f...
- class DWARFDebugAbbrev
- class DWARFDebugAddrTable - A class representing an address table as specified in DWARF v5....
- struct DWARFDebugAddrTable::Header
- class DWARFDebugArangeSet
- struct DWARFDebugArangeSet::Descriptor
- struct DWARFDebugArangeSet::Header
- class DWARFDebugAranges
- struct DWARFDebugAranges::Range
- struct DWARFDebugAranges::RangeEndpoint
- class DWARFDebugFrame - A parsed .debug_frame or .eh_frame section
- class DWARFDebugInfoEntry - DWARFDebugInfoEntry - A DIE with only the minimum required data.
- class DWARFDebugLine
- struct DWARFDebugLine::ContentTypeTracker - Tracks which optional content types are present in a DWARF file...
- struct DWARFDebugLine::FileNameEntry
- struct DWARFDebugLine::LineTable
- struct DWARFDebugLine::ParsingState
- struct DWARFDebugLine::Prologue
- struct DWARFDebugLine::Row - Standard .debug_line state machine structure.
- class DWARFDebugLine::SectionParser - Helper to allow for parsing of an entire .debug_line section in...
- struct DWARFDebugLine::Sequence - Represents a series of contiguous machine instructions. Line ta...
- class DWARFDebugLoc - An abstract base class for various kinds of location tables (.d...
- struct DWARFDebugLoc::LocationList - A list of locations that contain one variable.
- class DWARFDebugLoclists - An abstract base class for various kinds of location tables (.d...
- class DWARFDebugMacro
- struct DWARFDebugMacro::Entry - A single macro entry within a macro list.
- class DWARFDebugNames - .debug_names section consists of one or more units. Each unit s...
- struct DWARFDebugNames::Abbrev - Abbreviation describing the encoding of Name Index entries.
- struct DWARFDebugNames::AbbrevMapInfo - DenseMapInfo for struct Abbrev.
- struct DWARFDebugNames::AttributeEncoding - Index attribute and its encoding.
- class DWARFDebugNames::Entry - DWARF v5-specific implementation of an Accelerator Entry.
- struct DWARFDebugNames::Header - DWARF v5 Name Index header.
- struct DWARFDebugNames::HeaderPOD - The fixed-size part of a DWARF v5 Name Index header
- class DWARFDebugNames::NameIndex - Represents a single accelerator table within the DWARF v5 .debu...
- class DWARFDebugNames::NameIterator
- class DWARFDebugNames::NameTableEntry - A single entry in the Name Table (DWARF v5 sect. 6.1.1.4.6) of ...
- class DWARFDebugNames::SentinelError - Error returned by NameIndex::getEntry to report it has reached ...
- class DWARFDebugNames::ValueIterator
- class DWARFDebugPubTable - Represents structure for holding and parsing .debug_pub* tables.
- struct DWARFDebugPubTable::Entry
- struct DWARFDebugPubTable::Set - Each table consists of sets of variable length entries. Each se...
- class DWARFDebugRangeList
- struct DWARFDebugRangeList::RangeListEntry
- class DWARFDebugRnglist - A class representing a single rangelist.
- class DWARFDebugRnglistTable - A class representing a table of lists as specified in the DWARF...
- class DWARFDie - Utility class that carries the DWARF compile/type unit and the ...
- class DWARFDie::attribute_iterator - CRTP base class which implements the entire standard iterator f...
- class DWARFDie::iterator - CRTP base class which implements the entire standard iterator f...
- class DWARFExpression
- class DWARFExpression::Operation - This class represents an Operation in the Expression. Each oper...
- class DWARFExpression::iterator - An iterator to go through the expression operations.
- class DWARFFormValue
- struct DWARFFormValue::UnitOffset
- struct DWARFFormValue::ValueType
- class DWARFGdbIndex
- struct DWARFGdbIndex::AddressEntry
- struct DWARFGdbIndex::CompUnitEntry
- struct DWARFGdbIndex::SymTableEntry
- struct DWARFGdbIndex::TypeUnitEntry
- struct DWARFListEntryBase - A base class for DWARF list entries, such as range or location ...
- class DWARFListTableBase - A class representing a table of lists as specified in the DWARF...
- class DWARFListTableHeader - A class representing the header of a list table such as the ran...
- struct DWARFListTableHeader::Header
- class DWARFListType - A base class for lists of entries that are extracted from a par...
- struct DWARFLocationEntry - A single location within a location list. Entries are stored in...
- struct DWARFLocationExpression - Represents a single DWARF expression, whose value is location-d...
- class DWARFLocationTable - An abstract base class for various kinds of location tables (.d...
- class DWARFObject
- struct DWARFSection
- class DWARFTypeUnit
- class DWARFUnit
- class DWARFUnitHeader - Base class describing the header of any kind of "unit." Some i...
- class DWARFUnitIndex
- class DWARFUnitIndex::Entry
- struct DWARFUnitIndex::Header
- class DWARFUnitVector - Describe a collection of units. Intended to hold all units eith...
- class DWARFVerifier - A class that verifies DWARF debug information given a DWARF Con...
- struct DWARFVerifier::DieRangeInfo - A class that keeps the address range information for a single D...
- class DagInit - (v a, b) - Represent a DAG tree value. DAG inits are required ...
- class DagRecTy - 'dag' - Represent a dag fragment
- class DataDependenceGraph - Data Dependency Graph
- class DataExtractor
- class DataExtractor::Cursor - A class representing a position in a DataExtractor, as well as ...
- class DataLayout
- class DataMemberRecord
- struct DataRegionData
- class DataSym
- class DbgAddrIntrinsic
- class DbgCallSiteParam - Used for tracking debug info about call site parameters.
- class DbgDeclareInst
- class DbgEntity - This class is defined as the common parent of DbgVariable and D...
- class DbgInfoIntrinsic
- class DbgLabel - This class is used to track label information. Labels are colle...
- class DbgLabelInst
- class DbgLabelInstrMap - For each inlined instance of a source-level label, keep the cor...
- class DbgValueHistoryMap - For each user variable, keep a list of instruction ranges where...
- class DbgValueHistoryMap::Entry - Specifies a change in a variable's debug value history. There e...
- class DbgValueInst
- class DbgValueLoc - A single location or constant.
- class DbgValueLocation - Describes a location by number along with some flags about the ...
- class DbgVariable - This class is used to track local variable information. Variabl...
- struct DbgVariable::FrameIndexExpr
- class DbgVariableIntrinsic
- struct DbgVariableLocation - Represents the location at which a variable is stored.
- class DeadArgumentEliminationPass - Eliminate dead arguments (and return values) from functions.
- struct DeadArgumentEliminationPass::RetOrArg - Struct that represents (part of) either a return value or a fun...
- class DeadExpression
- class DebugChecksumsSubsection
- class DebugChecksumsSubsectionRef
- class DebugCounter
- struct DebugCounter::CounterInfo
- class DebugCrossModuleExportsSubsection
- class DebugCrossModuleExportsSubsectionRef
- class DebugCrossModuleImportsSubsection
- class DebugCrossModuleImportsSubsectionRef
- class DebugEpochBase
- class DebugEpochBase::HandleBase
- class DebugFrameDataSubsection
- class DebugFrameDataSubsectionRef
- class DebugHandlerBase - Base class for debug information backends. Common functionality...
- class DebugInfoFinder - Utility to find all debug info in a module. DebugInfoFinder tri...
- class DebugInlineeLinesSubsection
- struct DebugInlineeLinesSubsection::Entry
- class DebugInlineeLinesSubsectionRef
- class DebugLinesSubsection
- struct DebugLinesSubsection::Block
- class DebugLinesSubsectionRef
- class DebugLoc
- class DebugLocDwarfExpression - DwarfExpression implementation for .debug_loc entries.
- struct DebugLocDwarfExpression::TempBuffer
- class DebugLocEntry - This struct describes location entries emitted in the .debug_lo...
- class DebugLocStream - Byte stream of .debug_loc entries. Stores a unified stream of ....
- struct DebugLocStream::Entry
- class DebugLocStream::EntryBuilder - Builder for DebugLocStream entries.
- struct DebugLocStream::List
- class DebugLocStream::ListBuilder - Builder for DebugLocStream lists.
- class DebugStringTableSubsection - Represents a read-write view of a CodeView string table. DebugS...
- class DebugStringTableSubsectionRef - Represents a read-only view of a CodeView string table. This i...
- class DebugSubsection
- struct DebugSubsectionHeader
- class DebugSubsectionRecord
- class DebugSubsectionRecordBuilder
- class DebugSubsectionRef
- class DebugSubsectionVisitor
- class DebugSymbolRVASubsection
- class DebugSymbolRVASubsectionRef
- class DebugSymbolsSubsection
- class DebugSymbolsSubsectionRef
- class DebugUnknownSubsectionRef
- class DebugVariable - Identifies a unique instance of a variable. Storage for identif...
- struct DebugifyStatistics - Track how much `debugify` information has been lost.
- struct DecIntegerState - Specialization of the integer state for a decreasing value, hen...
- class DeclContext - A DeclContext is a named program scope that is used for ODR uni...
- class DeclContextTree - This class gives a tree-like API to the DenseMap that stores th...
- struct DeclMapInfo - Info type for the DenseMap storing the DeclContext pointers.
- struct DecodedAnnotation
- class DefInit - AL - Represent a reference to a 'def' in the description
- class DefRangeFramePointerRelFullScopeSym
- struct DefRangeFramePointerRelHeader
- class DefRangeFramePointerRelSym
- struct DefRangeRegisterHeader
- struct DefRangeRegisterRelHeader
- class DefRangeRegisterRelSym
- class DefRangeRegisterSym
- struct DefRangeSubfieldRegisterHeader
- class DefRangeSubfieldRegisterSym
- class DefRangeSubfieldSym
- class DefRangeSym
- struct DefaultAnalysisGraphTraits - Default traits class for extracting a graph from an analysis pa...
- struct DefaultContextualFoldingSetTrait - DefaultContextualFoldingSetTrait - Like DefaultFoldingSetTrait,...
- struct DefaultDOTGraphTraits - DefaultDOTGraphTraits - This class provides the default impleme...
- struct DefaultFoldingSetTrait - DefaultFoldingSetTrait - This class provides default implementa...
- class DefaultResourceStrategy - Default resource allocation strategy used by processor resource...
- class DefaultSchedulerStrategy - Default instruction selection strategy used by class Scheduler.
- class DefaultVLIWScheduler - A ScheduleDAG for scheduling lists of MachineInstr.
- struct DefsOnlyTag
- struct DefsetRecord
- class DeleteExpr
- struct DelimitedScope
- class DeltaAlgorithm - DeltaAlgorithm - Implements the delta debugging algorithm (A. Z...
- struct DeltaInfo
- class DemandedBits
- class DemandedBitsAnalysis - An analysis that produces \c DemandedBits for a function.
- class DemandedBitsPrinterPass - Printer pass for DemandedBits
- class DemandedBitsWrapperPass - FunctionPass class - This class is used to implement most globa...
- class Demangler
- class DenseMap
- struct DenseMapAPFloatKeyInfo
- struct DenseMapAPIntKeyInfo
- class DenseMapBase
- struct DenseMapInfo
- class DenseMapIterator
- struct DenseMapPair
- class DenseSet - Implements a dense probed hash-table based set.
- struct DenseSetEmpty
- class DenseSetImpl - Base class for DenseSet and DenseSmallSet. MapTy should be eith...
- class DenseSetImpl::ConstIterator
- class DenseSetImpl::Iterator
- class DenseSetPair
- class Dependence - Dependence - This class represents a dependence between two mem...
- struct Dependence::DVEntry - Dependence::DVEntry - Each level in the distance/direction vect...
- class DependenceAnalysis - AnalysisPass to compute dependence information in a function
- struct DependenceAnalysisPrinterPass - Printer pass to dump DA results.
- class DependenceAnalysisWrapperPass - Legacy pass manager pass to access dependence information
- class DependenceGraphInfo - Encapsulate some common data and functionality needed for diffe...
- class DependenceInfo - DependenceInfo - This class is the main dependence-analysis dri...
- struct DependenceInfo::BoundInfo
- struct DependenceInfo::CoefficientInfo
- class DependenceInfo::Constraint - Constraint - This private class represents a constraint, as def...
- struct DependenceInfo::Subscript - Subscript - This private struct represents a pair of subscripts...
- struct DerefState - State for dereferenceable attribute
- class DerivedArgList - DerivedArgList - An ordered collection of driver arguments, who...
- class DerivedUser - Extension point for the Value hierarchy. All classes outside of...
- struct DescriptorInfo
- struct DestSourcePair
- struct DevirtCallSite - A call site that could be devirtualized.
- class DevirtSCCRepeatedPass - A helper that repeats an SCC pass each time an indirect call is...
- struct DiagnosticHandler - This is the base class for diagnostic handling in LLVM. The han...
- class DiagnosticInfo - This is the base abstract class for diagnostic reporting in the...
- class DiagnosticInfoDebugMetadataVersion - Diagnostic information for debug metadata version reporting. Th...
- class DiagnosticInfoIROptimization - Common features for diagnostics dealing with optimization remar...
- class DiagnosticInfoISelFallback - Diagnostic information for ISel fallback path.
- class DiagnosticInfoIgnoringInvalidDebugMetadata - Diagnostic information for stripping invalid debug metadata.
- class DiagnosticInfoInlineAsm - Diagnostic information for inline asm reporting. This is basica...
- class DiagnosticInfoMIROptimization - Common features for diagnostics dealing with optimization remar...
- struct DiagnosticInfoMIROptimization::MachineArgument - MI-specific kinds of diagnostic Arguments.
- class DiagnosticInfoMIRParser - Diagnostic information for machine IR parser.
- class DiagnosticInfoMisExpect - Diagnostic information for MisExpect analysis.
- class DiagnosticInfoOptimizationBase - Common features for diagnostics dealing with optimization remar...
- struct DiagnosticInfoOptimizationBase::Argument - Used in the streaming interface as the general argument type. ...
- struct DiagnosticInfoOptimizationBase::setExtraArgs - When an instance of this is inserted into the stream, the argum...
- struct DiagnosticInfoOptimizationBase::setIsVerbose - Used to set IsVerbose via the stream interface.
- class DiagnosticInfoOptimizationFailure - Diagnostic information for optimization failures.
- class DiagnosticInfoPGOProfile - Diagnostic information for the PGO profiler.
- class DiagnosticInfoResourceLimit - Diagnostic information for stack size etc. reporting. This is b...
- class DiagnosticInfoSampleProfile - Diagnostic information for the sample profiler.
- class DiagnosticInfoStackSize - Diagnostic information for stack size etc. reporting. This is b...
- class DiagnosticInfoUnsupported - Diagnostic information for unsupported feature in backend.
- class DiagnosticInfoWithLocationBase - Common features for diagnostics with an associated location.
- class DiagnosticLocation
- struct DiagnosticPredicate
- class DiagnosticPrinter - Interface for custom diagnostic printing.
- class DiagnosticPrinterRawOStream - Basic diagnostic printer that uses an underlying raw_ostream.
- struct DirIterImpl - An interface for virtual file systems to provide an iterator ov...
- struct DirIterState - Keeps state for the directory_iterator.
- class DirectedGraph - Directed graph The graph is represented by a table of nodes. Ea...
- class DispatchStage
- class DistinctMDOperandPlaceholder - Placeholder metadata for operands of distinct MDNodes. This is ...
- struct DivRemMapKey
- struct DivRemPairWorklistEntry - A thin wrapper to store two values that we matched as div-rem p...
- struct DivRemPairsPass - Hoist/decompose integer division and remainder instructions to ...
- class DivergenceAnalysis - Generic divergence analysis for reducible CFGs.
- struct DivergencePropagator
- struct DlIteratePhdrData
- class DoNothingMemorySSAWalker - A MemorySSAWalker that does no alias queries, or anything else....
- class Document - A YAML Stream is a sequence of Documents. A document contains a...
- struct DocumentListTraits - This class should be specialized by any type that needs to be c...
- struct DomTreeGraphTraitsBase
- class DomTreeNodeBase - Base class for the actual dominator tree node.
- class DomTreeUpdater
- class DomTreeUpdater::CallBackOnDeletion - Value handle with callbacks on RAUW and destruction. This is a ...
- struct DomainValue - A DomainValue is a bit like LiveIntervals' ValNo, but it also k...
- class DominanceFrontier
- class DominanceFrontierAnalysis - Analysis pass which computes a \c DominanceFrontier.
- class DominanceFrontierBase - DominanceFrontierBase - Common base class for computing forward...
- class DominanceFrontierPrinterPass - Printer pass for the \c DominanceFrontier.
- class DominanceFrontierWrapperPass - FunctionPass class - This class is used to implement most globa...
- class DominatorTree - Concrete subclass of DominatorTreeBase that is used to compute ...
- class DominatorTreeAnalysis - Analysis pass which computes a \c DominatorTree.
- class DominatorTreeBase - Core dominator tree base class. This class is a generic templat...
- class DominatorTreePrinterPass - Printer pass for the \c DominatorTree.
- struct DominatorTreeVerifierPass - Verifier pass for the \c DominatorTree.
- class DominatorTreeWrapperPass - Legacy analysis pass which computes a \c DominatorTree.
- class DotSuffix
- class DoubleAPFloat
- class DstOp
- class DtorName
- class DummyCGSCCPass - This pass is required by interprocedural register allocation. I...
- class DwarfCFIException - Emits exception handling directives.
- class DwarfCFIExceptionBase - Emits exception handling directives.
- class DwarfCompileUnit - This dwarf writer support class manages information associated ...
- struct DwarfCompileUnit::BaseTypeRef
- struct DwarfCompileUnit::GlobalExpr - A pair of GlobalVariable and DIExpression.
- class DwarfDebug - Collects and handles dwarf debug information.
- class DwarfDebug::NonTypeUnitContext
- class DwarfEmitter - DwarfEmitter presents interface to generate all debug info tabl...
- class DwarfExpression - Base class containing the logic for constructing DWARF expressi...
- struct DwarfExpression::Register - Holds information about all subregisters comprising a register ...
- class DwarfFile
- struct DwarfFile::ScopeVars - The variables of a lexical scope.
- class DwarfStringPool
- struct DwarfStringPoolEntry - Data for a string pool entry.
- class DwarfStringPoolEntryRef - String pool entry reference.
- class DwarfTypeUnit - This dwarf writer support class manages information associated ...
- class DwarfUnit - This dwarf writer support class manages information associated ...
- class DynamicExceptionSpec
- class DynamicLibrary - This class provides a portable interface to dynamic libraries w...
- class DynamicLibrary::HandleSet
- struct DynamicStructorIdentifierNode
- class ECError - This class wraps a std::error_code in a Error. This is useful i...
- class EHStreamer - Emits exception handling directives.
- struct EHStreamer::ActionEntry - Structure describing an entry in the actions table.
- struct EHStreamer::CallSiteEntry - Structure describing an entry in the call-site table.
- struct EHStreamer::PadRange - Structure holding a try-range and the associated landing pad.
- struct ELFRelocationEntry
- class ELFStub
- struct ELFSymbol
- struct EVT - Extended Value Type. Capable of holding value types which are n...
- struct EVT::compareRawBits - A meaningless but well-behaved order, useful for constructing c...
- struct EarlyCSEPass - A simple and fast domtree-based CSE pass. This pass does a simp...
- class EdgeBundles - MachineFunctionPass - This class adapts the FunctionPass interf...
- class EdgeSequence::call_iterator - An iterator over specifically call edges. This has the same ite...
- class EdgeSequence::iterator - An iterator used for the edges to both entry nodes and child no...
- class ElaboratedTypeSpefType
- class ElementCount
- class EliminateAvailableExternallyPass - A pass that transforms external global definitions into declara...
- struct EmptyContext
- class EnableIfAttr
- class EnclosingExpr
- struct EncodedStringLiteralNode
- class EndBufferRecord
- class EndOfFileError - Base class for user error types. Users should declare their err...
- class EndPrecompRecord
- struct EndianEnums
- struct EndianTypes
- struct Entry
- struct Entry::RegUnitInfo - RegUnitInfo - Information tracked about each RegUnit in PhysReg...
- struct Entry::SectionContribution
- struct EntryExitInstrumenterPass - A CRTP mix-in to automatically provide informational APIs neede...
- class EntryStage
- class EnumAttributeImpl - A set of classes that contain the value of the attribute object...
- struct EnumEntry
- class EnumRecord
- class EnumeratedArray
- class EnumeratorRecord
- class EnvBlockSym
- struct EpilogueScope - ExceptionDataRecord - An entry in the table of exception data (...
- class EquivalenceClasses - EquivalenceClasses - This represents a collection of equivalenc...
- class EquivalenceClasses::ECValue - ECValue - The EquivalenceClasses data structure is just a set o...
- class EquivalenceClasses::member_iterator - member_* Iterate over the members of an equivalence class.
- class Error - Lightweight error class with error context and mandatory checki...
- class ErrorAdapter
- class ErrorAsOutParameter - Helper for Errors used as out-parameters. This helper is for us...
- class ErrorDiagnostic - Class to represent an error holding a diagnostic with location ...
- class ErrorHandlerTraits - Helper for testing applicability of, and applying, handlers for...
- struct ErrorHolder
- class ErrorInfo - Base class for user error types. Users should declare their err...
- class ErrorInfoBase - Base class for error info classes. Do not extend this directly:...
- class ErrorList - Special ErrorInfo subclass representing a list of ErrorInfos. I...
- class ErrorMatchesMono
- class ErrorOr - Represents either an error or a value T. ErrorOr <T > is a poin...
- class ErrorSuccess - Subclass of Error for the sole purpose of identifying the succe...
- class EscapeEnumerator - EscapeEnumerator - This is a little algorithm to find all escap...
- class Evaluator - This class evaluates LLVM IR, producing the Constant representi...
- struct ExactEqualsExpression
- struct Exact_match
- struct ExampleSymbol
- struct ExceptionDataRecord
- class ExecuteStage
- class ExecutionDomainFix
- class ExitOnError - Helper for check-and-exit error handling. For tool use only. NO...
- class ExpandReductionsPass - A CRTP mix-in to automatically provide informational APIs neede...
- class ExpandedSpecialSubstitution
- struct ExpansionRecord - Coverage information for a macro expansion or #included file. W...
- class Expected - Tagged union holding either a T or a Error. This class parallel...
- class ExpectedAsOutParameter - Helper for Expected <T >s used as out-parameters. See ErrorAsOu...
- struct ExpectedHolder
- class ExportSym
- struct ExportedSymbol
- class Expression
- class ExpressionAST - Base class representing the AST of a given expression.
- class ExpressionLiteral - Class representing an unsigned literal in the AST of an express...
- struct ExtName
- struct ExtPoint
- struct ExternalAAWrapperPass - A wrapper pass for external alias analyses. This just squirrels...
- struct ExternalAttribute - We use ExternalAttribute to describe an externally visible Alia...
- struct ExternalRelation - We use ExternalRelation to describe an externally visible alias...
- class ExternalSymbolPseudoSourceValue - A specialized pseudo source value for holding external symbol v...
- class ExternalSymbolSDNode
- class ExtractElementConstantExpr - ExtractElementConstantExpr - This class is private to Constants...
- class ExtractElementInst
- struct ExtractSecondType
- class ExtractValueConstantExpr - ExtractValueConstantExpr - This class is private to Constants.c...
- class ExtractValueInst
- struct ExtractValue_match
- class FCmpInst
- class FDE - DWARF Frame Description Entry (FDE)
- class FDRTraceWriter - The FDRTraceWriter allows us to hand-craft an XRay Flight Data ...
- struct FNeg_match
- class FPExtInst
- class FPMathOperator - Utility class for floating point operations which can have info...
- class FPPassManager - FPPassManager manages BBPassManagers and FunctionPasses. It bat...
- class FPToSIInst
- class FPToUIInst
- class FPTruncInst
- struct FPUFeatureNameInfo
- struct FPUName
- struct Factor - Utility class representing a base and exponent pair which form ...
- class FastFoldingSetNode
- class FastISel - This is a fast-path instruction selection class that generates ...
- struct FastISel::CallLoweringInfo
- struct FastISel::InstOrderMap
- struct FastISel::SavePoint
- class FastMathFlags - Convenience struct for specifying and reasoning about fast-math...
- class FaultMapParser - A parser for the __llvm_faultmaps section generated by the Faul...
- class FaultMapParser::FunctionFaultInfoAccessor
- class FaultMapParser::FunctionInfoAccessor
- class FaultMaps
- struct FaultMaps::FaultInfo
- struct FaultMaps::MCSymbolComparator
- class FeatureBitArray - Class used to store the subtarget bits in the tables created by...
- class FeatureBitset - Container class for subtarget features. This is a constexpr rei...
- class FenceInst
- class FieldInit - X.Y - Represent a reference to a subfield of a variable
- class FieldListDeserializer
- struct FieldListDeserializer::MappingInfo
- class FieldListRecord
- class File - Represents an open file.
- class FileBasedRecordProducer
- class FileBufferByteStream - An implementation of WritableBinaryStream backed by an llvm Fil...
- class FileBufferByteStream::StreamImpl - An implementation of BinaryStream which holds its entire data s...
- class FileCheck - FileCheck class takes the request and exposes various methods t...
- struct FileCheckDiag
- class FileCheckPatternContext - Class holding the Pattern global state, shared by all patterns:...
- struct FileCheckRequest - Contains info about various FileCheck options.
- struct FileCheckString - A check that we found in the input file.
- class FileCheckType
- struct FileChecksumEntry
- struct FileChecksumEntryHeader
- class FileCollector - Collects files into a directory and generates a mapping that ca...
- struct FileEntry - Files in GSYM are contained in FileEntry structs where we split...
- class FileError - This class wraps a filename and another Error. In some cases, a...
- class FileInfo
- struct FileInfo::GCOVCoverage
- struct FileInfo::LineData
- class FileOutputBuffer - FileOutputBuffer - This interface provides simple way to create...
- class FileRemover - FileRemover - This class is a simple object meant to be stack a...
- class FileStaticSym
- class FileSystem - The virtual file system interface.
- class FileWriter - A simplified binary data writer class that doesn't require targ...
- class FilteredPassNameParser - ===------------------------------------------------------------...
- struct FindClosure
- struct FindConstantInAddMulChain
- struct FindSCEVSize
- struct FindUsedLoops
- struct FixedMachineStackObject - Serializable representation of the fixed stack object from the ...
- struct FixedNumOperandTraits - FixedNumOperandTraits - determine the allocation regime of the ...
- struct FixedSizeStorage::with_counts
- class FixedStackPseudoSourceValue - A specialized PseudoSourceValue for holding FixedStack values, ...
- class FixedStreamArray - FixedStreamArray is similar to VarStreamArray, except with each...
- class FixedStreamArrayIterator
- struct FlagsMap
- class FlagsOp
- class FlatIt - Marker class to iterate over the elements of a Region in flat m...
- class Float2IntPass - A CRTP mix-in to automatically provide informational APIs neede...
- class FloatLiteralImpl
- struct FlowFooBar
- struct FlowFooBarDoc
- struct FlowMap
- struct FlowSeq
- struct FlowStringValue - A wrapper around std::string which contains a source range that...
- struct FmtAlign
- class FoldExpr
- class FoldOpInit - !foldl (a, b, expr, start, lst) - Fold over a list.
- class FoldingSet - FoldingSet - This template class is used to instantiate a speci...
- class FoldingSetBase - FoldingSetBase - Implements the folding set functionality. The...
- class FoldingSetBase::Node - Node - This class is used to maintain the singly linked bucket ...
- class FoldingSetBucketIterator
- class FoldingSetBucketIteratorImpl - FoldingSetBucketIteratorImpl - This is the common bucket iterat...
- class FoldingSetImpl - FoldingSetImpl - An implementation detail that lets us share co...
- class FoldingSetIterator
- class FoldingSetIteratorImpl - FoldingSetIteratorImpl - This is the common iterator support sh...
- class FoldingSetNodeID
- class FoldingSetNodeIDRef - FoldingSetNodeIDRef - This class describes a reference to an in...
- class FoldingSetNodeWrapper - FoldingSetNodeWrapper - This template class is used to "wrap" a...
- struct FoldingSetTrait - FoldingSetTrait - This trait class is used to define behavior o...
- class FoldingSetVector - FoldingSetVector - This template class combines a FoldingSet an...
- struct FooBar
- struct FooBarContainer
- struct FooBarMap
- struct FooBarMapMap
- struct ForceFunctionAttrsPass - Pass which forces specific function attributes into the IR, pri...
- struct ForeachLoop - ForeachLoop - Record the iteration state associated with a for ...
- struct FormClassTable
- class FormatAdapter
- class FormattedBytes
- class FormattedNumber - This is a helper class used for format_hex() and format_decimal...
- class FormattedString - This is a helper class for left_justify, right_justify, and cen...
- class FortifiedLibCallSimplifier - This class implements simplifications for calls to fortified li...
- class ForwardDominanceFrontierBase - DominanceFrontier Class - Concrete subclass of DominanceFrontie...
- struct ForwardTemplateReference - A forward-reference to a template argument that was not known a...
- struct ForwardedRegister - Describes a register that needs to be forwarded from the prolog...
- struct Fragment - Describes the allocas introduced by rewritePartition in order t...
- class FrameCookieSym
- struct FrameData - Data in the SUBSEC_FRAMEDATA subection.
- class FrameEntry - An entry in either debug_frame or eh_frame. This entry can be a...
- class FrameIndexSDNode
- struct FrameInfo
- class FrameProcSym
- struct FreeDeleter
- class FreezeInst
- class FullDependence - FullDependence - This class represents a dependence between two...
- class FuncIdRecord
- class FuncletPadInst
- class Function
- class Function::ProfileCount - Class to represent profile counts. This class represents both r...
- class FunctionAnalysisManagerCGSCCProxy - A proxy from a \c FunctionAnalysisManager to an \c SCC. When a ...
- class FunctionAnalysisManagerCGSCCProxy::Result
- class FunctionCallee - A handy container for a FunctionType+Callee-pointer pair, which...
- class FunctionComparator - FunctionComparator - Compares two functions to determine whethe...
- class FunctionEncoding
- struct FunctionHandle
- class FunctionImportGlobalProcessing - Class to handle necessary GlobalValue changes required by ThinL...
- class FunctionImportPass - The function importing pass
- class FunctionImporter - The function importer is automatically importing function from ...
- struct FunctionImporter::ImportFailureInfo - Information optionally tracked for candidates the importer deci...
- struct FunctionInfo - Function information in GSYM files encodes information for one ...
- struct FunctionInfo::AlignedMap - Build a wrapper struct that has 8-byte alignment. All heap allo...
- struct FunctionInfo::AlignedMapPointerTraits - Pointer traits for our aligned map.
- class FunctionLoweringInfo
- struct FunctionLoweringInfo::LiveOutInfo
- struct FunctionLoweringInfo::StatepointSpillMap
- class FunctionParam
- class FunctionPass - FunctionPass class - This class is used to implement most globa...
- class FunctionPassManager - FunctionPassManager manages FunctionPasses.
- class FunctionPassManagerImpl - FunctionPassManagerImpl manages FPPassManagers
- struct FunctionPointerLikeTypeTraits - Provide suitable custom traits struct for function pointers. Fu...
- struct FunctionRecord - Code coverage information for a single function.
- class FunctionRecord
- class FunctionRecordIterator - Iterator over Functions, optionally filtered to a single file.
- class FunctionSamples - Representation of the samples collected for a function. This da...
- struct FunctionSignatureNode
- class FunctionSummary - Function summary information to aid decisions and implementatio...
- struct FunctionSummary::ConstVCall - A specification for a virtual function call with all constant i...
- struct FunctionSummary::FFlags - Flags specific to function summaries.
- struct FunctionSummary::TypeIdInfo - All type identifier related information. Because these fields a...
- struct FunctionSummary::VFuncId - An "identifier" for a virtual function. This contains the type ...
- struct FunctionSummaryYaml
- struct FunctionSymbolNode
- class FunctionToLoopPassAdaptor - Adaptor that maps from a function to its loops. Designed to all...
- class FunctionType - Class to represent function types
- class FunctionType
- struct FunctionTypeKeyInfo
- struct FunctionTypeKeyInfo::KeyTy
- class GCFunctionInfo - Garbage collection metadata for a single function. Currently, ...
- class GCMetadataPrinter - GCMetadataPrinter - Emits GC metadata as assembly code. Instan...
- class GCModuleInfo - An analysis pass which caches information about the entire Modu...
- class GCOVBlock - GCOVBlock - Collects block information.
- struct GCOVBlock::EdgeWeight
- class GCOVBuffer - GCOVBuffer - A wrapper around MemoryBuffer to provide GCOV spec...
- struct GCOVEdge - GCOVEdge - Collects edge information.
- class GCOVFile - GCOVFile - Collects coverage information for one pair of covera...
- class GCOVFunction - GCOVFunction - Collects function information.
- struct GCOVOptions
- class GCOVProfilerPass - The gcov-style instrumentation pass
- struct GCPoint - GCPoint - Metadata for a collector-safe point in machine code.
- class GCProjectionInst - Common base class for representing values projected from a stat...
- class GCRelocateInst - Represents calls to the gc.relocate intrinsic.
- class GCResultInst - Represents calls to the gc.result intrinsic.
- struct GCRoot - GCRoot - Metadata for a pointer to an object managed by the gar...
- class GCStrategy - GCStrategy describes a garbage collector algorithm's code gener...
- class GEPOperator
- class GISelCSEAnalysisWrapper
- class GISelCSEAnalysisWrapperPass
- class GISelCSEInfo
- class GISelChangeObserver
- class GISelInstProfileBuilder
- class GISelKnownBits - Abstract class that contains various methods for clients to not...
- class GISelKnownBitsAnalysis - Eventually add other features such as caching/ser/deserializing...
- class GISelMITest
- class GISelObserverWrapper
- class GISelWorkList
- class GPUDivergenceAnalysis - Divergence analysis frontend for GPU kernels.
- struct GUID - This represents the 'GUID' type from windows.h.
- class GVMaterializer
- class GVN - The core GVN pass object. FIXME: We should have a good summary ...
- struct GVN::Expression
- struct GVN::LeaderTableEntry - A mapping from value numbers to lists of Value*'s that have tha...
- class GVN::ValueTable - This class holds the mapping between values and value numbers. ...
- class GVNHoist
- class GVNHoistLegacyPass - FunctionPass class - This class is used to implement most globa...
- struct GVNHoistPass - A simple and fast domtree-based GVN pass to hoist common expres...
- class GVNLegacyPass - FunctionPass class - This class is used to implement most globa...
- struct GVNSinkPass - Uses an "inverted" value numbering to decide the similarity of ...
- class Generator - A DWARF generator. Generate DWARF for unit tests by creating an...
- class GenericDINode - Generic tagged DWARF-like metadata node. An un-specialized DWAR...
- struct GenericOptionValue
- class GenericScheduler - GenericScheduler shrinks the unscheduled zone using heuristics ...
- class GenericSchedulerBase - Base class for GenericScheduler. This class maintains informati...
- struct GenericSchedulerBase::CandPolicy - Policy for scheduling the next instruction in the candidate's z...
- struct GenericSchedulerBase::SchedCandidate - Store the state used by GenericScheduler heuristics, required f...
- struct GenericSchedulerBase::SchedResourceDelta - Status of an instruction's critical resource consumption.
- class GetElementPtrConstantExpr - GetElementPtrConstantExpr - This class is private to Constants....
- class GetElementPtrInst
- struct GetFirstType - Find the first type in a list of types.
- class GlobPattern
- struct Global
- class GlobalAddressSDNode
- class GlobalAlias
- class GlobalDCEPass - Pass to remove unused function declarations.
- class GlobalIFunc
- class GlobalIndirectSymbol - This is an important base class in LLVM. It provides the common...
- struct GlobalLayoutBuilder - This class implements a layout algorithm for globals referenced...
- class GlobalNumberState - GlobalNumberState assigns an integer to each global value in th...
- struct GlobalNumberState::Config - This class defines the default behavior for configurable aspect...
- class GlobalObject - This is an important base class in LLVM. It provides the common...
- class GlobalOptPass - Optimize globals that never have their address taken.
- class GlobalQualifiedName
- class GlobalSplitPass - Pass to perform split of global variables.
- struct GlobalStatus - As we analyze each global, keep track of some information about...
- class GlobalTypeTableBuilder
- class GlobalValue - This is an important base class in LLVM. It provides the common...
- class GlobalValuePseudoSourceValue - A specialized pseudo source value for holding GlobalValue value...
- class GlobalValueSummary - Function and variable summary information to aid decisions and ...
- struct GlobalValueSummary::GVFlags - Group flags (Linkage, NotEligibleToImport, etc.) as a bitfield.
- struct GlobalValueSummaryInfo
- union GlobalValueSummaryInfo::NameOrGV
- class GlobalVarSummary - Global variable summary information to aid decisions and implem...
- struct GlobalVarSummary::GVarFlags
- class GlobalVariable
- struct GloballyHashedType - A globally hashed type represents a hash value that is sufficie...
- class GlobalsAA - Analysis pass providing a never-invalidated alias analysis resu...
- class GlobalsAAResult - An alias analysis result set for globals. This focuses on handl...
- struct GlobalsAAResult::DeletionCallbackHandle - Handle to clear this analysis on deletion of values.
- class GlobalsAAResult::FunctionInfo - The mod/ref information collected for a particular function. We...
- class GlobalsAAWrapperPass - Legacy wrapper pass to provide the GlobalsAAResult object.
- class GlobalsMetadata - Frontend-provided metadata for global variables.
- struct GlobalsMetadata::Entry
- class Graph - PBQP Graph class. Instances of this class describe PBQP problem...
- class Graph - A Graph object represents a Directed Graph and is used in XRay ...
- class Graph - Graph <N > - A graph with N nodes. Note that N can be at most ...
- class Graph::AdjEdgeIdSet
- class Graph::ChildIterator - ChildIterator - Visit all children of a node.
- class Graph::EdgeEntry
- class Graph::EdgeIdSet
- class Graph::EdgeItr
- class Graph::EdgeView - A class for ranging over all the edges in the graph. Like all v...
- class Graph::InOutEdgeView - A class for ranging over the incoming edges incident to a verte...
- class Graph::NeighborEdgeIteratorT - An Iterator adapter using an InnerInvGraphT::iterator as a base...
- class Graph::NodeEntry
- class Graph::NodeIdSet
- class Graph::NodeItr
- class Graph::NodeSubset - NodeSubset - A subset of the graph's nodes.
- class Graph::VertexView - A class for ranging over the vertices in the graph. Like all vi...
- class GraphBase
- class GraphDiff
- class GraphMetadata - Holds graph-level metadata relevant to PBQP RA problems.
- struct GraphTraits
- struct GraphTraits::ChildIteratorType - Add the VectorizableTree to the index iterator to be able to re...
- class GraphTraits::nodes_iterator - For the node iterator we just need to turn the TreeEntry iterat...
- class GraphWriter
- class GsymCreator - GsymCreator is used to emit GSYM data to a stand alone file or ...
- class GsymReader - GsymReader is used to read GSYM data from a file or buffer. Thi...
- struct GsymReader::SwappedData - When the GSYM file's endianness doesn't match the host system t...
- struct GuardWideningPass - A CRTP mix-in to automatically provide informational APIs neede...
- class GuidAdapter
- class HWAddressSanitizerPass - This is a public interface to the hardware address sanitizer pa...
- class HWEventListener
- class HWInstructionDispatchedEvent
- class HWInstructionEvent
- class HWInstructionIssuedEvent
- class HWInstructionRetiredEvent
- class HWPressureEvent
- class HWStallEvent
- class HandleSDNode
- struct HardwareLoopInfo - Attributes of a target dependent hardware loop.
- class HardwareUnit
- struct HasCachedHash::SFINAE
- struct HasCreateNode - Type trait to check for a traits class that has a createNode me...
- struct HasCreateNode::SFINAE
- struct HasCreateSentinel - Type trait to check for a traits class that has a createSentine...
- struct HasDereference
- struct HasDereference::SFINAE
- struct HasGetNext - Type trait to check for a traits class that has a getNext membe...
- struct HasGetNext::SFINAE
- struct HasObsoleteCustomization
- struct HasPointerLikeTypeTraits
- class HasReferenceResolver - Do not resolve anything, but keep track of whether a given vari...
- class HashingByteStreamer
- struct Header - The GSYM header. The GSYM header is found at the start of a sta...
- struct Header
- struct Header
- class HeapAllocationSiteSym
- class HelperFunctions
- struct HexNumber
- class HostTest
- class HotColdSplitting
- class HotColdSplittingPass - Pass to outline cold regions.
- struct HungoffOperandTraits - HungoffOperandTraits - determine the allocation regime of the U...
- class ICFLoopSafetyInfo - This implementation of LoopSafetyInfo use ImplicitControlFlowTr...
- class ICallPromotionAnalysis
- class ICmpInst
- class IDFCalculator
- class IDFCalculatorBase - Determine the iterated dominance frontier, given a set of defin...
- class IEEEFloat - A self-contained host- and target-independent arbitrary-precisi...
- union IEEEFloat::Significand - A binary fraction with an explicit integer bit. The significand...
- struct IITDescriptor - This is a type descriptor which explains the type requirements ...
- struct ILPValue - Represent the ILP of the subDAG rooted at a DAG node. ILPValues...
- class IMSFFile
- class IO
- class IPSCCPPass - Pass to perform interprocedural constant propagation.
- struct IRAttribute - Helper class that provides common functionality to manifest IR ...
- struct IRAttributeManifest - Helper struct necessary as the modular build fails if the virtu...
- class IRBuilder
- class IRBuilderBase
- class IRBuilderBase::FastMathFlagGuard
- class IRBuilderBase::InsertPoint
- class IRBuilderBase::InsertPointGuard
- class IRBuilderCallbackInserter
- class IRBuilderDefaultInserter - This provides the default implementation of the IRBuilder 'Inse...
- class IRCEPass - A CRTP mix-in to automatically provide informational APIs neede...
- class IRMover
- class IRMover::IdentifiedStructTypeSet
- struct IRMover::StructTypeKeyInfo
- class IRMutationStrategy - Base class for describing how to mutate a module. mutation func...
- class IRMutator - Entry point for configuring and running IR mutations.
- struct IRPosition - Helper to describe and deal with positions in the LLVM-IR. A po...
- class IRTranslator
- class IRTranslator::GISelSwitchLowering
- class IRTranslator::ValueToVRegInfo
- class IVStrideUse - IVStrideUse - Keep track of one use of a strided induction vari...
- class IVUsers
- class IVUsersAnalysis - Analysis pass that exposes the \c IVUsers for a loop.
- class IVUsersPrinterPass - Printer pass for the \c IVUsers for a loop.
- class IVUsersWrapperPass - Pass interface - Implemented by all 'passes'. Subclass this if...
- class IVVisitor - Interface for visiting interesting IV users that are recognized...
- struct IdentifierNode
- class IdentifyingPassPtr - Discriminated union of Pass ID types. The PassConfig API prefer...
- class ImmutableCallSite - Establish a view to a call site for examination.
- class ImmutableList - ImmutableList - This class represents an immutable (functional)...
- class ImmutableList::iterator
- class ImmutableListFactory
- class ImmutableListImpl
- class ImmutableMap
- struct ImmutableMap::CBWrapper
- struct ImmutableMap::CBWrapperRef
- class ImmutableMap::Factory
- class ImmutableMap::iterator
- class ImmutableMapRef
- class ImmutableMapRef::iterator
- class ImmutablePass - ImmutablePass class - This class is used to provide information...
- class ImmutableSet
- class ImmutableSet::Factory
- class ImmutableSetRef
- class ImmutableStatepoint - A specialization of it's base class for read only access to a g...
- class ImplicitControlFlowTracking - This class allows to keep track on instructions with implicit c...
- class ImportedFunctionsInliningStatistics - Calculate and dump ThinLTO specific inliner stats. The main sta...
- struct ImportedFunctionsInliningStatistics::InlineGraphNode - InlineGraphNode represents node in graph of inlined functions.
- class ImutAVLFactory
- class ImutAVLTree
- class ImutAVLTreeGenericIterator
- class ImutAVLTreeInOrderIterator
- struct ImutAVLValueIterator - Generic iterator that wraps a T::TreeTy::iterator and exposes i...
- struct ImutContainerInfo - ImutContainerInfo - Generic definition of comparison operations...
- struct ImutKeyValueInfo - ImutKeyValueInfo -Traits class used by ImmutableMap. While bot...
- struct ImutProfileInfo - Generic profile template. The default behavior is to invoke th...
- struct ImutProfileInteger - Profile traits for integers.
- class InMemoryDirectory - The in memory file system is a tree of Nodes. Every node can ei...
- class InMemoryFile - The in memory file system is a tree of Nodes. Every node can ei...
- class InMemoryFileSystem - An in-memory file system.
- class InMemoryFileSystemTest
- class InMemoryNode - The in memory file system is a tree of Nodes. Every node can ei...
- struct IncIntegerState - Specialization of the integer state for an increasing value, he...
- struct IncrementGlobalCleanup - Abstract base class of cleanup handlers. Derived classes overri...
- class IndVarSimplifyPass - A CRTP mix-in to automatically provide informational APIs neede...
- class IndexListEntry - This class represents an entry in the slot index list held in t...
- class IndexedInstrProfReader - Reader for the indexed binary instrprof format.
- struct IndexedLoadStoreMatchInfo
- class IndexedMap
- class IndexedReference - Represents a memory reference as a base pointer and a set of in...
- class IndirectBrInst
- struct IndirectBrInst::const_succ_op_iterator
- struct IndirectBrInst::succ_op_iterator
- class IndirectCallPromotionPlugin - ------------------------ IndirectCallPromotionPlugin ----------...
- struct IndirectSymbolData
- class InductionDescriptor - A struct for saving information about induction variables.
- struct InferFunctionAttrsPass - A pass which infers function attributes from the names and sign...
- struct InformationCache - Data structure to hold cached (LLVM-IR) information. All attrib...
- class Init
- class InitLLVM
- class InitListExpr
- class InitializeCOMRAII
- class InjectTLIMappings - A CRTP mix-in to automatically provide informational APIs neede...
- class InjectTLIMappingsLegacy - FunctionPass class - This class is used to implement most globa...
- class InjectorIRStrategy - Strategy that injects operations into the function.
- class InlineAsm - LLVM Value Representation This is a very important LLVM class. ...
- struct InlineAsm::ConstraintInfo
- struct InlineAsm::SubConstraintInfo
- struct InlineAsmIdentifierInfo
- struct InlineAsmIdentifierInfo::EnumIdentifier
- struct InlineAsmIdentifierInfo::LabelIdentifier
- struct InlineAsmIdentifierInfo::VariableIdentifier
- struct InlineAsmKeyType
- class InlineCost - Represents the cost of inlining a function. This supports speci...
- class InlineFunctionInfo - This class captures the data input to the InlineFunction call, ...
- struct InlineInfo - Inline information stores the name of the inline function along...
- struct InlineParams - Thresholds to tune inline cost analysis. The inline cost analys...
- struct InlineResult - InlineResult is basically true or false. For false results the ...
- class InlineSiteSym
- struct InlineeSourceLine
- struct InlineeSourceLineHeader
- class InlinerPass - The inliner pass for the new pass manager. This pass wires toge...
- class InnerAnalysisManagerProxy - An analysis over an "outer" IR unit that provides access to an ...
- class InnerAnalysisManagerProxy::Result
- class InnerLoopUnroller - InnerLoopVectorizer vectorizes loops which contain only one bas...
- class InnerLoopVectorizer - InnerLoopVectorizer vectorizes loops which contain only one bas...
- class Input - The Input class is used to parse a yaml document into in-memory...
- class Input::EmptyHNode
- class Input::HNode
- class Input::MapHNode
- class Input::ScalarHNode
- class Input::SequenceHNode
- struct InputArg - InputArg - This struct carries flags and type information about...
- class InputArgList - ArgList - Ordered collection of driver arguments. The ArgList c...
- class InputFile - An input file. This is a symbol table wrapper that only exposes...
- class InputFile::Symbol - The purpose of this class is to only expose the symbol informat...
- class InsertElementConstantExpr - InsertElementConstantExpr - This class is private to Constants....
- class InsertElementInst
- class InsertPointAnalysis - Determines the latest safe point in a block in which we can ins...
- class InsertValueConstantExpr - InsertValueConstantExpr - This class is private to Constants.cp...
- class InsertValueInst
- struct InsertionInfo::Compare
- class InsnInfo
- class InstCombinePass - A CRTP mix-in to automatically provide informational APIs neede...
- class InstCombineWorklist - InstCombineWorklist - This is the worklist management logic for...
- class InstCombiner - The core instruction combiner logic. This class provides both t...
- class InstDeleterIRStrategy - Base class for describing how to mutate a module. mutation func...
- class InstIterator
- class InstRef - An InstRef contains both a SourceMgr index and Instruction pair...
- class InstSimplifyPass - Run instruction simplification across each instruction in the f...
- class InstVisitor - Base class for instruction visitors Instruction visitors are us...
- struct InstantiatedAttr - This is the result of instantiating ExternalAttribute at a part...
- struct InstantiatedRelation - This is the result of instantiating ExternalRelation at a parti...
- struct InstantiatedValue - This is the result of instantiating InterfaceValue at a particu...
- class InstantiationGroup - An instantiation group contains a \c FunctionRecord list, such ...
- struct InstrAspect - Legalization is decided based on an instruction's opcode, which...
- class InstrBuilder - A builder class that knows how to construct Instruction objects...
- struct InstrDesc - An instruction descriptor
- class InstrEmitter
- struct InstrInfoQuery - InstrInfoQuery provides an interface to query additional inform...
- struct InstrItinerary - An itinerary represents the scheduling information for an instr...
- class InstrItineraryData - Itinerary data supplied by a subtarget to be used by a target.
- class InstrOrderFilePass - The instrumentation pass for recording function order.
- class InstrProfError - Base class for user error types. Users should declare their err...
- class InstrProfIncrementInst
- class InstrProfIncrementInstStep
- class InstrProfIterator - A file format agnostic iterator over profiling data.
- class InstrProfLookupTrait - Trait for lookups into the on-disk hash table for the binary in...
- struct InstrProfOptions - Options for the frontend instrumentation based profiling pass.
- class InstrProfReader - Base class and interface for reading profiling data of any know...
- class InstrProfReaderIndex
- struct InstrProfReaderIndexBase
- class InstrProfReaderItaniumRemapper - A remapper that applies remappings based on a symbol remapping ...
- class InstrProfReaderRemapper - Name matcher supporting fuzzy matching of symbol names to names...
- struct InstrProfRecord - Profiling information for a single function.
- struct InstrProfRecord::ValueProfData
- class InstrProfRecordWriterTrait - Writer for instrumentation based profile data.
- class InstrProfSummaryBuilder
- class InstrProfSymtab - A symbol table used for function PGO name look-up with keys (su...
- struct InstrProfValueData
- class InstrProfValueProfileInst
- struct InstrProfValueSiteRecord
- class InstrProfWriter
- class InstrProfiling - Instrumentation based profiling lowering pass. This pass lowers...
- struct InstrProfiling::PerFunctionProfileData
- struct InstrStage - These values represent a non-pipelined step in the execution of...
- struct Instruction
- struct Instruction
- class Instruction
- class Instruction - An instruction propagated through the simulated instruction pip...
- class InstructionBase - Base class for instructions consumed by the simulation pipeline...
- class InstructionCombiningPass - The legacy pass manager's instcombine pass. This is a basic who...
- class InstructionError
- class InstructionPrecedenceTracking
- class InstructionSelect - This pass is responsible for selecting generic machine instruct...
- class InstructionSelector - Provides the logic to select generic machine instructions.
- struct InstructionSelector::ISelInfoTy
- struct InstructionSelector::MatcherState
- class InstructionTables
- class InstrumentationMap - The InstrumentationMap represents the computed function id's an...
- class IntAttributeImpl - A set of classes that contain the value of the attribute object...
- class IntEqClasses
- class IntInit - '7' - Represent an initialization by a literal integer value.
- class IntRecTy - 'int' - Represent an integer value of no particular size
- class IntToPtrInst
- class IntegerCastExpr
- class IntegerLiteral
- struct IntegerLiteralNode
- struct IntegerRangeState - State for an integer range.
- struct IntegerStateBase - Simple state with integers encoding. The interface ensures that...
- class IntegerType - Class to represent integer types. Note that this class is also ...
- struct IntelExpr
- struct InterceptRefCounted - A CRTP mixin class that adds reference counting to a type. The ...
- class InterfaceFile - Defines the interface file.
- struct InterfaceFile::const_symbol_iterator - CRTP base class for adapting an iterator to a different type. T...
- class InterfaceFileRef - Reference to an interface file.
- struct InterfaceValue - We use InterfaceValue to describe parameters/return value, as w...
- class InterferenceCache
- struct InterferenceCache::BlockInterference - BlockInterference - information about the interference in a sin...
- class InterferenceCache::Cursor - Cursor - The primary query interface for the block interference...
- class InterferenceCache::Entry - Entry - A cache entry containing interference information for a...
- class InterleaveGroup - The group of interleaved loads/stores sharing the same stride a...
- class InterleavedAccessInfo - Drive the analysis of interleaved memory accesses in the loop. ...
- struct InterleavedAccessInfo::StrideDescriptor - The descriptor for a strided memory access.
- class InternalizePass - A pass that internalizes all functions and variables other than...
- class Interval - Interval Class - An Interval is a set of nodes defined such tha...
- class IntervalIterator
- class IntervalMap
- struct IntervalMap::RootBranchData
- class IntervalMap::const_iterator
- class IntervalMap::iterator
- struct IntervalMapHalfOpenInfo
- struct IntervalMapInfo
- class IntervalMapOverlaps - IntervalMapOverlaps - Iterate over the overlaps of mapped inter...
- class IntervalPartition - FunctionPass class - This class is used to implement most globa...
- struct IntervalPressure - RegisterPressure computed within a region of instructions delim...
- struct IntrinsicFunctionIdentifierNode
- struct IntrinsicID_match - Intrinsic matchers.
- class IntrinsicInst
- class IntrinsicLowering
- struct IntrinsicNode
- class IntrusiveBackList
- class IntrusiveBackList::const_iterator
- class IntrusiveBackList::iterator
- struct IntrusiveBackListBase
- struct IntrusiveBackListNode
- class IntrusiveRefCntPtr - A smart pointer to a reference-counted object that inherits fro...
- struct IntrusiveRefCntPtrInfo - Class you can specialize to provide custom retain/release funct...
- struct InvalidateAllAnalysesPass
- struct InvalidateAnalysisPass - A no-op pass template which simply forces a specific analysis r...
- struct Inverse
- class InvokeInst
- struct IrreducibleGraph - Graph of irreducible control flow. This graph is used for deter...
- struct IrreducibleGraph::IrrNode
- class IsAOpInit - !isa <type >(expr) - Dynamically determine the type of an expre...
- class IsBytewiseValueTest
- struct IsFlowSequenceBase
- struct IsPointerLike
- struct IsValidPointer
- struct IsValidReference
- struct IsaVersion - Instruction set architecture version.
- class ItaniumManglingCanonicalizer - Canonicalizer for mangled names. This class allows specifying a...
- struct ItaniumManglingCanonicalizer::Impl
- struct ItaniumPartialDemangler - "Partial" demangler. This supports demangling a string into an ...
- class JamCRC
- struct JumpTable
- struct JumpTableHeader
- class JumpTableSDNode
- class JumpThreadingPass - This pass performs 'jump threading', which looks at blocks that...
- class KeyValueNode - A key and value pair. While not technically a Node under the YA...
- struct KindAndFlags
- struct KnownBits
- class LCSSAPass - Converts loops into loop-closed SSA form.
- struct LCSSAVerificationPass - FunctionPass class - This class is used to implement most globa...
- class LICMPass - Performs Loop Invariant Code Motion Pass.
- class LLLexer
- class LLParser
- struct LLParser::ArgInfo
- struct LLParser::MDRef
- struct LLParser::ParamInfo
- class LLParser::PerFunctionState
- class LLT
- class LLVMContext - This is an important class for using LLVM in a threaded context...
- class LLVMContextImpl
- class LLVMDisasmContext
- struct LLVMMCJITCompilerOptions
- struct LLVMOpInfo1
- struct LLVMOpInfoSymbol1 - The initial support in LLVM MC for the most general form of a r...
- struct LLVMOpaqueModuleFlagEntry
- struct LLVMOpaqueValueMetadataEntry
- class LLVMSymbolizer
- struct LLVMSymbolizer::Options
- class LPMUpdater - This class provides an interface for updating the loop pass man...
- class LPPassManager - FunctionPass class - This class is used to implement most globa...
- class LSBaseSDNode
- class LSUnit - Default Load/Store Unit (LS Unit) for simulated processors. Eac...
- class LSUnitBase - Abstract base interface for LS (load/store) units in llvm-mca.
- class LShrOperator
- class LTO - This class implements a resolution-based interface to LLVM's LT...
- struct LTO::GlobalResolution
- struct LTO::RegularLTOState
- struct LTO::ThinLTOState
- struct LTOCodeGenerator - C++ class which implements the opaque lto_code_gen_t type.
- struct LTOLLVMContext - A derived class of LLVMContext that initializes itself accordin...
- struct LTOLLVMDiagnosticHandler - This is the base class for diagnostic handling in LLVM. The han...
- struct LTOModule - C++ class which implements the opaque lto_module_t type.
- struct LTOModule::NameAndAttributes
- struct LTOObjectBuffer - Type to wrap a single object returned by ThinLTO.
- class LabelRecord
- class LabelSDNode
- class LabelSym
- class LambdaExpr
- struct LandingPadInfo
- class LandingPadInst
- struct LaneBitmask
- struct LargeTestInteger
- class Latch
- class LatencyPriorityQueue - This interface is used to plug different priorities computation...
- struct LatticeKeyInfo - A template for translating between LLVM Values and LatticeKeys....
- struct LayoutAlignElem - Layout alignment element. Stores the alignment data associated ...
- class LazyBlockFrequencyInfo - Wraps a BFI to allow lazy computation of the block frequencies....
- class LazyBlockFrequencyInfoPass - This is an alternative analysis pass to BlockFrequencyInfoWrapp...
- class LazyBranchProbabilityInfoPass - This is an alternative analysis pass to BranchProbabilityInfoWr...
- class LazyBranchProbabilityInfoPass::LazyBranchProbabilityInfo - Wraps a BPI to allow lazy computation of the branch probabiliti...
- class LazyCallGraph - A lazily constructed view of the call graph of a module. With t...
- class LazyCallGraph::Edge - A class used to represent edges in the call graph. The lazy cal...
- class LazyCallGraph::EdgeSequence - The edge sequence object. This typically exists entirely within...
- class LazyCallGraph::Node - A node in the call graph. This represents a single node. It's p...
- class LazyCallGraph::RefSCC - A RefSCC of the call graph. This models a Strongly Connected Co...
- class LazyCallGraph::SCC - An SCC of the call graph. This represents a Strongly Connected ...
- class LazyCallGraph::postorder_ref_scc_iterator - A post-order depth-first RefSCC iterator over the call graph. T...
- class LazyCallGraphAnalysis - An analysis pass which computes the call graph for a module.
- class LazyCallGraphDOTPrinterPass - A pass which prints the call graph as a DOT file to a \c raw_os...
- class LazyCallGraphPrinterPass - A pass which prints the call graph to a \c raw_ostream. This is...
- class LazyMachineBlockFrequencyInfoPass - This is an alternative analysis pass to MachineBlockFrequencyIn...
- class LazyRandomTypeCollection - Provides amortized O(1) random access to a CodeView type stream...
- struct LazyRandomTypeCollection::CacheEntry
- class LazyValueAnalysis - Analysis to compute lazy value information.
- class LazyValueInfo - This pass computes, caches, and vends lazy value constraint inf...
- class LazyValueInfoWrapperPass - Wrapper around LazyValueInfo.
- struct LeadingZerosCounter
- class LeafNode
- class LegacyAARGetter - This class is a functor to be used in legacy module or SCC pass...
- class LegacyDivergenceAnalysis - FunctionPass class - This class is used to implement most globa...
- struct LegacyInlinerBase - This class contains all of the helper code which is used to per...
- struct LegalityQuery
- struct LegalityQuery::MemDesc
- class LegalizationArtifactCombiner
- struct LegalizeActionStep - The result of a query. It either indicates a final answer of Le...
- class LegalizeRule
- class LegalizeRuleSet
- class Legalizer - MachineFunctionPass - This class adapts the FunctionPass interf...
- struct Legalizer::MFResult
- class LegalizerHelper
- class LegalizerInfo
- struct LessRecord - Sorting predicate to sort record pointers by name.
- struct LessRecordByID - Sorting predicate to sort record pointers by their unique ID. I...
- struct LessRecordFieldName - Sorting predicate to sort record pointers by their name field.
- struct LessRecordRegister
- struct LessRecordRegister::RecordParts
- struct LetRecord
- class LexicalScope - LexicalScope - This class is used to track scope information.
- class LexicalScopes - LexicalScopes - This class provides interface to collect and u...
- class LibCallSimplifier - LibCallSimplifier - This class implements a collection of optim...
- class LibCallsShrinkWrapPass - A CRTP mix-in to automatically provide informational APIs neede...
- class LifetimeSDNode
- class Line
- struct LineBlockFragmentHeader
- struct LineColumnEntry
- class LineColumnExtractor
- class LineCoverageIterator - An iterator over the \c LineCoverageStats objects for lines des...
- class LineCoverageStats - Coverage statistics for a single line.
- class LineEditor
- struct LineEditor::CompleterConcept
- struct LineEditor::CompleterModel
- struct LineEditor::Completion - A possible completion at a given cursor position.
- struct LineEditor::CompletionAction - The action to perform upon a completion request.
- struct LineEditor::InternalData
- struct LineEditor::ListCompleterConcept
- struct LineEditor::ListCompleterModel
- class LineEditorTest
- struct LineEntry - Line entries are used to encode the line tables in FunctionInfo...
- struct LineFragmentHeader
- class LineInfo
- struct LineLocation - Represents the relative location of an instruction. Instruction...
- struct LineNumberEntry
- class LineTable - A DWARF line unit-like class used to generate DWARF line units....
- class LineTable - LineTable class contains deserialized versions of line tables f...
- struct LineTable::ValueAndLength
- class LinkDiagnosticInfo - This is the base abstract class for diagnostic reporting in the...
- class Linker - This class provides the core functionality of linking in LLVM. ...
- class ListContinuationRecord - LF_INDEX - Used to chain two large LF_FIELDLIST or LF_METHODLIS...
- class ListInit - [AL, AH, CL] - Represent a list of defs
- class ListRecTy - 'list <Ty >' - Represent a list of values, all of which must be...
- class LiteralOperator
- struct LiteralOperatorIdentifierNode
- class LiveDebugVariables - MachineFunctionPass - This class adapts the FunctionPass interf...
- class LiveInterval - LiveInterval - This class represents the liveness of a register...
- class LiveInterval::SingleLinkedListIterator
- class LiveInterval::SubRange - A live range for subregisters. The LaneMask specifies which par...
- class LiveIntervalUnion - Union of live intervals that are strong candidates for coalesci...
- class LiveIntervalUnion::Array
- class LiveIntervalUnion::Query - Query interferences between a single live virtual register and ...
- class LiveIntervals - MachineFunctionPass - This class adapts the FunctionPass interf...
- class LiveIntervals::HMEditor - Toolkit used by handleMove to trim or extend live intervals.
- class LivePhysRegs
- class LiveQueryResult - Result of a LiveRange query. This class hides the implementatio...
- class LiveRange - This class represents the liveness of a register, stack slot, e...
- struct LiveRange::Segment - This represents a simple continuous liveness interval for a val...
- class LiveRangeCalc
- struct LiveRangeCalc::LiveInBlock - LiveInBlock - Information about a basic block where a live rang...
- class LiveRangeEdit
- class LiveRangeEdit::Delegate - Callback methods for LiveRangeEdit owners.
- struct LiveRangeEdit::Remat - Remat - Information needed to rematerialize at a specific locat...
- class LiveRangeUpdater - Helper class for performant LiveRange bulk updates. Calling Liv...
- class LiveRegMatrix - MachineFunctionPass - This class adapts the FunctionPass interf...
- class LiveRegSet - A set of live virtual registers and physical register units. Th...
- struct LiveRegSet::IndexMaskPair
- struct LiveRegUnit
- class LiveRegUnits
- class LiveStacks - MachineFunctionPass - This class adapts the FunctionPass interf...
- class LiveVariables - MachineFunctionPass - This class adapts the FunctionPass interf...
- struct LiveVariables::VarInfo - VarInfo - This represents the regions where a virtual register ...
- class LoadAndStorePromoter - Helper class for promoting a collection of loads and stores int...
- class LoadExpression
- class LoadInfo
- class LoadInst
- class LoadSDNode
- class LoadStoreVectorizerPass - A CRTP mix-in to automatically provide informational APIs neede...
- class LoadedObjectInfo - An inferface for inquiring the load address of a loaded object ...
- struct LoadedObjectInfoHelper
- struct Local
- class LocalAsMetadata
- struct LocalName
- struct LocalStaticGuardIdentifierNode
- struct LocalStaticGuardVariableNode
- class LocalSym
- struct LocalVariableAddrGap
- struct LocalVariableAddrRange
- class Localizer - This pass implements the localization mechanism described at th...
- struct LocallyHashedType - A locally hashed type represents a straightforward hash code of...
- struct LocationClass
- struct LocationMetadata - Frontend-provided metadata for source location.
- class LocationSize
- class LockFileManager - Class that manages the creation of a lock file to aid implicit ...
- class LogBuilder - The LogBuilder class allows for creating ad-hoc collections of ...
- class LogBuilderConsumer
- struct LookupResult
- class Loop - Represents a single loop in the control flow graph. Note that ...
- class Loop::LocRange - A range representing the start and end location of a loop.
- struct Loop::LoopBounds - Below are some utilities to get the loop guard, loop bounds and...
- class LoopAccessAnalysis - This analysis provides dependence information for the memory ac...
- class LoopAccessInfo - Drive the analysis of memory accesses in the loop This class is...
- class LoopAccessInfoPrinterPass - Printer pass for the \c LoopAccessInfo results.
- class LoopAccessLegacyAnalysis - This analysis provides dependence information for the memory ac...
- class LoopAnalysis - Analysis pass that exposes the \c LoopInfo for a function.
- class LoopBase - Instances of this class are used to represent loops that are de...
- class LoopBlocksDFS - Store the result of a depth first search within basic blocks co...
- class LoopBlocksRPO - Wrapper class to LoopBlocksDFS that provides a standard begin()...
- class LoopBlocksTraversal - Traverse the blocks in a loop using a depth-first search.
- struct LoopBodyTraits
- struct LoopBodyTraits::LoopBodyFilter
- class LoopBodyTraits::WrappedSuccIterator - CRTP base class for adapting an iterator to a different type. T...
- class LoopCachePrinterPass - Printer pass for the \c CacheCost results.
- class LoopDataPrefetchPass - An optimization pass inserting data prefetches in loops.
- class LoopDeletionPass - A CRTP mix-in to automatically provide informational APIs neede...
- class LoopDistributePass - A CRTP mix-in to automatically provide informational APIs neede...
- class LoopFullUnrollPass - Loop unroll pass that only does full loop unrolling.
- class LoopFusePass - A CRTP mix-in to automatically provide informational APIs neede...
- class LoopIdiomRecognizePass - Performs Loop Idiom Recognize Pass.
- class LoopInfo
- class LoopInfoBase - This class builds and contains all of the top-level loop struct...
- class LoopInfoWrapperPass - The legacy pass manager's analysis pass to compute loop informa...
- class LoopInstSimplifyPass - Performs Loop Inst Simplify Pass.
- struct LoopLoadEliminationPass - Pass to forward loads in a loop around the backedge to subseque...
- class LoopPass - Pass interface - Implemented by all 'passes'. Subclass this if...
- class LoopPredicationPass - Performs Loop Predication Pass.
- class LoopPrinterPass - Printer pass for the \c LoopAnalysis results.
- class LoopRotatePass - A simple loop rotation transformation.
- class LoopSafetyInfo - Captures loop safety information. It keep information for loop ...
- class LoopSimplifyCFGPass - Performs basic CFG simplifications to assist other loop passes.
- class LoopSimplifyPass - This pass is responsible for loop canonicalization.
- class LoopSinkPass - A pass that does profile-guided sinking of instructions into lo...
- struct LoopStandardAnalysisResults - The adaptor from a function pass to a loop pass computes these ...
- class LoopStrengthReducePass - Performs Loop Strength Reduce Pass.
- class LoopTraversal - This class provides the basic blocks traversal order used by pa...
- struct LoopTraversal::MBBInfo
- struct LoopTraversal::TraversedMBBInfo
- class LoopUnrollAndJamPass - A simple loop rotation transformation.
- struct LoopUnrollOptions - A set of parameters used to control various transforms performe...
- class LoopUnrollPass - Loop unroll pass that will support both full and partial unroll...
- class LoopVectorizationCostModel - LoopVectorizationCostModel - estimates the expected speedups du...
- struct LoopVectorizationCostModel::RegisterUsage - A struct that represents some properties of the register usage ...
- class LoopVectorizationLegality - LoopVectorizationLegality checks if it is legal to vectorize a ...
- class LoopVectorizationPlanner - Planner drives the vectorization process after having passed Le...
- struct LoopVectorizationPlanner::VPCallbackILV - This class is used to enable the VPlan to invoke a method of IL...
- class LoopVectorizationRequirements - This holds vectorization requirements that must be verified lat...
- class LoopVectorizeHints - Utility class for getting and setting loop vectorizer hints in ...
- struct LoopVectorizeHints::Hint - Hint - associates name and validation with the hint value.
- struct LoopVectorizeOptions
- struct LoopVectorizePass - The LoopVectorize Pass.
- struct LoopVerifierPass - Verifier pass for the \c LoopAnalysis results.
- class LoopVersioning - This class emits a version of the loop where run-time checks en...
- class LowerAtomicPass - A pass that lowers atomic intrinsic into non-atomic intrinsics.
- struct LowerConstantIntrinsicsPass - A CRTP mix-in to automatically provide informational APIs neede...
- struct LowerExpectIntrinsicPass - A CRTP mix-in to automatically provide informational APIs neede...
- struct LowerGuardIntrinsicPass - A CRTP mix-in to automatically provide informational APIs neede...
- class LowerInvokePass - A CRTP mix-in to automatically provide informational APIs neede...
- struct LowerMatrixIntrinsicsPass - A CRTP mix-in to automatically provide informational APIs neede...
- class LowerTypeTestsPass - A CRTP mix-in to automatically provide informational APIs neede...
- struct LowerWidenableConditionPass - A CRTP mix-in to automatically provide informational APIs neede...
- struct LowererBase
- struct MBB2NumberFunctor
- class MCAlignFragment - An ilist node that can access its parent list. Requires \c Node...
- class MCAsmBackend - Generic interface to target specific assembler backends.
- class MCAsmInfo - This class is intended to be used as a base class for asm prope...
- class MCAsmInfoCOFF - This class is intended to be used as a base class for asm prope...
- class MCAsmInfoDarwin - This class is intended to be used as a base class for asm prope...
- class MCAsmInfoELF - This class is intended to be used as a base class for asm prope...
- class MCAsmInfoGNUCOFF - This class is intended to be used as a base class for asm prope...
- class MCAsmInfoMicrosoft - This class is intended to be used as a base class for asm prope...
- class MCAsmInfoWasm - This class is intended to be used as a base class for asm prope...
- class MCAsmInfoXCOFF - This class is intended to be used as a base class for asm prope...
- class MCAsmLayout - Encapsulates the layout of an assembly file at a particular poi...
- class MCAsmLexer - Generic assembler lexer interface, for use by target specific a...
- struct MCAsmMacro
- struct MCAsmMacroParameter
- class MCAsmParser - Generic assembler parser interface, for use by target specific ...
- struct MCAsmParser::MCPendingError
- class MCAsmParserExtension - Generic interface for extending the MCAsmParser, which is imple...
- class MCAsmParserSemaCallback - Generic Sema callback for assembly parser.
- class MCAssembler
- struct MCAssembler::CGProfileEntry
- struct MCAssembler::VersionInfoType - MachO specific deployment target version info.
- class MCBinaryExpr - Binary assembler expressions.
- class MCBoundaryAlignFragment - Represents required padding such that a particular other set of...
- class MCCFIInstruction
- class MCCVDefRangeFragment - Fragment representing the .cv_def_range directive.
- struct MCCVFunctionInfo - Information describing a function or inlined call site introduc...
- struct MCCVFunctionInfo::LineInfo
- class MCCVInlineLineTableFragment - Fragment representing the binary annotations produced by the .c...
- class MCCVLoc - Instances of this class represent the information from a .cv_lo...
- class MCCodeEmitter - MCCodeEmitter - Generic instruction encoding interface.
- class MCCompactEncodedInstFragment - This is a compact (memory-size-wise) fragment for holding an en...
- class MCConstantExpr - / Represent a constant integer expression.
- class MCContext - Context object for machine code objects. This class owns all o...
- struct MCContext::COFFSectionKey
- struct MCContext::ELFSectionKey
- struct MCContext::WasmSectionKey
- struct MCContext::XCOFFSectionKey
- class MCDataFragment - Fragment for data and encoded instructions.
- class MCDisassembler - Superclass for all disassemblers. Consumes a memory region and ...
- class MCDummyFragment - An ilist node that can access its parent list. Requires \c Node...
- class MCDwarfCallFrameFragment - Interface implemented by fragments that contain encoded instruc...
- class MCDwarfDwoLineTable
- struct MCDwarfFile - Instances of this class represent the name of the dwarf .file d...
- class MCDwarfFrameEmitter
- struct MCDwarfFrameInfo
- class MCDwarfLineAddr
- class MCDwarfLineAddrFragment - Interface implemented by fragments that contain encoded instruc...
- class MCDwarfLineEntry - Instances of this class represent the line information for the ...
- class MCDwarfLineStr - Manage the .debug_line_str section contents, if we use it.
- class MCDwarfLineTable
- struct MCDwarfLineTableHeader
- struct MCDwarfLineTableParams
- class MCDwarfLoc - Instances of this class represent the information from a dwarf ...
- class MCELFObjectTargetWriter - Base class for classes that define behaviour that is specific t...
- class MCELFStreamer - Streaming object file generation interface. This class provides...
- class MCEncodedFragment - Interface implemented by fragments that contain encoded instruc...
- class MCEncodedFragmentWithContents - Interface implemented by fragments that contain encoded instruc...
- class MCEncodedFragmentWithFixups - Interface implemented by fragments that contain encoded instruc...
- class MCExpr - Base class for the full range of assembler expressions which ar...
- class MCExternalSymbolizer - Symbolize using user-provided, C API, callbacks. See llvm-c/Dis...
- struct MCExtraProcessorInfo - Provide extra details about the machine processor. This is a co...
- class MCFillFragment - An ilist node that can access its parent list. Requires \c Node...
- class MCFixup - Encode information on a single operation to perform on a byte s...
- struct MCFixupKindInfo - Target independent information on a fixup kind.
- class MCFragment - An ilist node that can access its parent list. Requires \c Node...
- class MCGenDwarfInfo
- class MCGenDwarfLabelEntry
- class MCInst - Instances of this class represent a single low-level machine in...
- class MCInstBuilder
- class MCInstPrinter - This is an instance of a target assembly language printer that ...
- class MCInstrAnalysis
- class MCInstrDesc - Describe properties that are true of each instruction in the ta...
- class MCInstrInfo - Interface to description of machine instruction set.
- class MCLEBFragment - An ilist node that can access its parent list. Requires \c Node...
- class MCLOHContainer
- class MCLOHDirective - Store Linker Optimization Hint information (LOH).
- class MCLabel - Instances of this class represent a label name in the MC file, ...
- class MCLineSection - Instances of this class represent the line information for a co...
- class MCMachObjectTargetWriter - Base class for classes that define behaviour that is specific t...
- class MCObjectFileInfo
- class MCObjectStreamer - Streaming object file generation interface. This class provides...
- struct MCObjectStreamer::PendingMCFixup
- class MCObjectTargetWriter - Base class for classes that define behaviour that is specific t...
- class MCObjectWriter - Defines the object file and target independent interfaces used ...
- class MCOperand - Instances of this class represent operands of the MCInst class....
- class MCOperandInfo - This holds information about one operand of a machine instructi...
- class MCOrgFragment - An ilist node that can access its parent list. Requires \c Node...
- class MCParsedAsmOperand - MCParsedAsmOperand - This abstract class represents a source-le...
- struct MCProcResourceDesc - Define a kind of processor resource that will be modeled by the...
- struct MCReadAdvanceEntry - Specify the number of cycles allowed after instruction issue be...
- class MCRegAliasIterator - MCRegAliasIterator enumerates all registers aliasing Reg. If I...
- class MCRegUnitIterator - DiffListIterator - Base iterator class that can traverse the di...
- class MCRegUnitMaskIterator - MCRegUnitMaskIterator enumerates a list of register units and t...
- class MCRegUnitRootIterator - MCRegUnitRootIterator enumerates the root registers of a regist...
- class MCRegister - Wrapper class representing physical registers. Should be passed...
- class MCRegisterClass - MCRegisterClass - Base class of TargetRegisterClass.
- struct MCRegisterCostEntry - Specify the cost of a register definition in terms of number of...
- struct MCRegisterDesc - MCRegisterDesc - This record contains information about a parti...
- struct MCRegisterFileDesc - A register file descriptor. This struct allows to describe proc...
- class MCRegisterInfo
- class MCRegisterInfo::DiffListIterator - DiffListIterator - Base iterator class that can traverse the di...
- struct MCRegisterInfo::DwarfLLVMRegPair - DwarfLLVMRegPair - Emitted by tablegen so Dwarf < ->LLVM reg ma...
- struct MCRegisterInfo::SubRegCoveredBits - SubRegCoveredBits - Emitted by tablegen: bit range covered by a...
- class MCRegisterInfo::mc_difflist_iterator - Forward iterator using DiffListIterator.
- class MCRegisterInfo::mc_subreg_iterator
- class MCRegisterInfo::mc_superreg_iterator
- class MCRelaxableFragment - A relaxable fragment holds on to its MCInst, since it may need ...
- class MCRelocationInfo - Create MCExprs from relocations found in an object file.
- struct MCSchedClassDesc - Summarize the scheduling resources required for an instruction ...
- struct MCSchedModel - Machine model for scheduling, bundling, and heuristics. The mac...
- class MCSection - Instances of this class represent a uniqued identifier for a se...
- struct MCSection::PendingLabel - State for tracking labels that don't yet have Fragments
- class MCSectionCOFF - This represents a section on Windows
- class MCSectionELF - This represents a section on linux, lots of unix variants and s...
- class MCSectionMachO - This represents a section on a Mach-O system (used by Mac OS X)...
- class MCSectionWasm - This represents a section on wasm.
- class MCSectionXCOFF - Instances of this class represent a uniqued identifier for a se...
- class MCStreamer - Streaming machine code generation interface. This interface is ...
- class MCSubRegIndexIterator - Iterator that enumerates the sub-registers of a Reg and the ass...
- class MCSubRegIterator - MCSubRegIterator enumerates all sub-registers of Reg. If Includ...
- class MCSubtargetInfo - Generic base class for all target subtargets.
- class MCSuperRegIterator - MCSuperRegIterator enumerates all super-registers of Reg. If In...
- class MCSymbol - MCSymbol - Instances of this class represent a symbol name in t...
- union MCSymbol::NameEntryStorageTy - The name for a symbol. MCSymbol contains a uint64_t so is proba...
- class MCSymbolCOFF - MCSymbol - Instances of this class represent a symbol name in t...
- class MCSymbolELF - MCSymbol - Instances of this class represent a symbol name in t...
- class MCSymbolIdFragment - Represents a symbol table index fragment.
- class MCSymbolMachO - MCSymbol - Instances of this class represent a symbol name in t...
- class MCSymbolRefExpr - Represent a reference to a symbol from inside an expression. A ...
- class MCSymbolSDNode
- class MCSymbolWasm - MCSymbol - Instances of this class represent a symbol name in t...
- class MCSymbolXCOFF - MCSymbol - Instances of this class represent a symbol name in t...
- class MCSymbolizer - Symbolize and annotate disassembled instructions. For now this ...
- class MCTargetAsmParser - MCTargetAsmParser - Generic interface to target specific assemb...
- class MCTargetExpr - This is an extension point for target-specific MCExpr subclasse...
- class MCTargetOptions
- class MCTargetStreamer - Target specific streamer interface. This is used so that target...
- class MCUnaryExpr - Unary assembler expressions.
- class MCValue - This represents an "assembler immediate". In its most general f...
- class MCWasmObjectTargetWriter - Base class for classes that define behaviour that is specific t...
- class MCWasmStreamer - Streaming object file generation interface. This class provides...
- class MCWinCOFFObjectTargetWriter - Base class for classes that define behaviour that is specific t...
- class MCWinCOFFStreamer - Streaming object file generation interface. This class provides...
- struct MCWriteLatencyEntry - Specify the latency in cpu cycles for a particular scheduling c...
- struct MCWriteProcResEntry - Identify one of the processor resource kinds consumed by a part...
- class MCXCOFFObjectTargetWriter - Base class for classes that define behaviour that is specific t...
- class MCXCOFFStreamer - Streaming object file generation interface. This class provides...
- class MD5
- struct MD5::MD5Result
- class MDAttachmentMap - Map-like storage for metadata attachments.
- class MDBuilder
- struct MDBuilder::TBAAStructField
- class MDGlobalAttachmentMap - Multimap-like storage for metadata attachments for globals. Thi...
- struct MDGlobalAttachmentMap::Attachment
- class MDMatrix
- class MDNode
- struct MDNode::HasCachedHash
- struct MDNodeInfo - DenseMapInfo for MDNode subclasses.
- class MDNodeOpsKey - Structure for hashing arbitrary MDNode operands.
- class MDNodeSDNode
- struct MDNodeSubsetEqualImpl - Configuration point for MDNodeInfo::isEqual().
- class MDOperand - Tracking metadata reference owned by Metadata. Similar to \a Tr...
- class MDString - A single uniqued string. These are used to efficiently contain ...
- class MDTuple
- class MDTupleTypedArrayWrapper - Typed, array-like tuple of metadata. This is a wrapper for \a M...
- class MDVector
- class MIBundleBuilder
- class MIBundleOperandIteratorBase
- class MIBundleOperands
- class MIPrinter - This class prints out the machine instructions using the MIR se...
- class MIRFormatter - MIRFormater - Interface to format MIR operand based on target
- class MIRParser - This class initializes machine functions by applying the state ...
- class MIRParserImpl - This class implements the parsing of LLVM IR that's embedded in...
- class MIRPrinter - This class prints out the machine functions using the MIR seria...
- struct MIToken - A token produced by the machine instruction lexer.
- class MMIAddrLabelMap
- struct MMIAddrLabelMap::AddrLabelSymEntry
- class MMIAddrLabelMapCallbackPtr
- class MSFBuilder
- class MSFError - Base class for errors originating when parsing raw PDB files
- struct MSFLayout
- class MSFStreamLayout - Describes the layout of a stream in an MSF layout. A "stream" ...
- class MSVCPError - Lightweight error class with error context and mandatory checki...
- class MSVCPExpected
- class MVT - Machine Value Type. Every type that is supported natively by so...
- struct MVT::mvt_iterator - A simple iterator over the MVT::SimpleValueType enum.
- class MachObjectWriter - Defines the object file and target independent interfaces used ...
- struct MachObjectWriter::MachSymbolData - Helper struct for containing some precomputed information on sy...
- struct MachObjectWriter::RelAndSymbol - @ {
- class MachineBasicBlock
- struct MachineBasicBlock::RegisterMaskPair - Pair of physical register and lane mask. This is not simply a s...
- class MachineBlockFrequencyInfo - MachineBlockFrequencyInfo pass uses BlockFrequencyInfoImpl impl...
- class MachineBranchProbabilityInfo - ImmutablePass class - This class is used to provide information...
- class MachineConstantPool - The MachineConstantPool class keeps track of constants referenc...
- class MachineConstantPoolEntry - This class is a data container for one entry in a MachineConsta...
- class MachineConstantPoolValue - Abstract base class for all machine specific constantpool value...
- struct MachineConstantPoolValue
- struct MachineDomTreeGraphTraitsBase - DominatorTree GraphTraits specialization so the DominatorTree c...
- class MachineDominanceFrontier - MachineFunctionPass - This class adapts the FunctionPass interf...
- class MachineDominatorTree - DominatorTree Class - Concrete subclass of DominatorTreeBase th...
- struct MachineDominatorTree::CriticalEdge - Helper structure used to hold all the basic blocks involved in ...
- class MachineFrameInfo
- struct MachineFrameInfo - Serializable representation of MachineFrameInfo. Doesn't serial...
- struct MachineFrameInfo::StackObject
- struct MachineFunction
- class MachineFunction
- struct MachineFunction::ArgRegPair - Structure used to represent pair of argument number after call ...
- class MachineFunction::Delegate
- struct MachineFunction::VariableDbgInfo
- struct MachineFunctionInfo - Targets should override this in a way that mirrors the implemen...
- struct MachineFunctionInfo - MachineFunctionInfo - This class can be derived from and used b...
- struct MachineFunctionLiveIn
- class MachineFunctionPass
- class MachineFunctionProperties
- class MachineIRBuilder - Helper class to build MachineInstr. It keeps internally the ins...
- struct MachineIRBuilderState - Class which stores all the state required in a MachineIRBuilder...
- class MachineInstr
- class MachineInstr::ExtraInfo
- class MachineInstrBuilder
- class MachineInstrBundleIterator - MachineBasicBlock iterator that automatically skips over MIs th...
- struct MachineInstrExpressionTrait
- class MachineInstrSpan
- struct MachineJumpTable
- struct MachineJumpTable::Entry
- struct MachineJumpTableEntry - MachineJumpTableEntry - One jump table in the jump table info.
- class MachineJumpTableInfo
- class MachineLocation
- class MachineLoop
- class MachineLoopInfo - MachineFunctionPass - This class adapts the FunctionPass interf...
- class MachineMemOperand
- struct MachineMemOperand::MachineAtomicInfo - Atomic information for this memory operation.
- class MachineModuleAnalysis - An analysis that produces \c MachineInfo for a module.
- class MachineModuleInfo - This class contains meta information specific to a module. Que...
- class MachineModuleInfoCOFF - MachineModuleInfoCOFF - This is a MachineModuleInfoImpl impleme...
- class MachineModuleInfoELF - MachineModuleInfoELF - This is a MachineModuleInfoImpl implemen...
- class MachineModuleInfoImpl - This class can be derived from and used by targets to hold priv...
- class MachineModuleInfoMachO - MachineModuleInfoMachO - This is a MachineModuleInfoImpl implem...
- class MachineModuleInfoWrapperPass - ImmutablePass class - This class is used to provide information...
- class MachineOperand
- union MachineOperand::ContentsUnion
- class MachineOptimizationRemark - Diagnostic information for applied optimization remarks.
- class MachineOptimizationRemarkAnalysis - Diagnostic information for optimization analysis remarks.
- class MachineOptimizationRemarkEmitter - The optimization diagnostic interface. It allows reporting when...
- class MachineOptimizationRemarkEmitterPass
- class MachineOptimizationRemarkMissed - Diagnostic information for missed-optimization remarks.
- class MachinePassRegistry - MachinePassRegistry - Track the registration of machine passes.
- class MachinePassRegistryListener - MachinePassRegistryListener - Listener to adds and removals of ...
- class MachinePassRegistryNode - MachinePassRegistryNode - Machine pass node stored in registrat...
- class MachinePipeliner - The main class in the implementation of the target independent ...
- struct MachinePipeliner::LoopInfo - Cache the target analysis information about the loop.
- struct MachinePointerInfo
- class MachinePostDominatorTree - MachinePostDominatorTree - an analysis pass wrapper for Dominat...
- class MachineRegion
- class MachineRegionInfo
- class MachineRegionInfoPass - MachineFunctionPass - This class adapts the FunctionPass interf...
- class MachineRegionNode
- class MachineRegisterInfo
- class MachineRegisterInfo::Delegate
- class MachineRegisterInfo::defusechain_instr_iterator - defusechain_iterator - This class provides iterator support for...
- class MachineRegisterInfo::defusechain_iterator - defusechain_iterator - This class provides iterator support for...
- class MachineSDNode
- class MachineSSAUpdater - MachineSSAUpdater - This class updates SSA form for a set of vi...
- struct MachineSchedContext - MachineSchedContext provides enough context from the MachineSch...
- struct MachineSchedPolicy - Define a generic scheduling policy for targets that don't provi...
- class MachineSchedRegistry - MachineSchedRegistry provides a selection of available machine ...
- class MachineSchedStrategy - MachineSchedStrategy - Interface to the scheduling algorithm us...
- struct MachineStackObject - Serializable representation of stack object from the MachineFra...
- class MachineTraceMetrics - MachineFunctionPass - This class adapts the FunctionPass interf...
- class MachineTraceMetrics::Ensemble - A trace ensemble is a collection of traces selected using the s...
- struct MachineTraceMetrics::FixedBlockInfo - Per-basic block information that doesn't depend on the trace th...
- struct MachineTraceMetrics::InstrCycles - InstrCycles represents the cycle height and depth of an instruc...
- struct MachineTraceMetrics::LiveInReg - A virtual register or regunit required by a basic block or its ...
- class MachineTraceMetrics::Trace - A trace represents a plausible sequence of executed basic block...
- struct MachineTraceMetrics::TraceBlockInfo - Per-basic block information that relates to a specific trace th...
- struct MakeGuardsExplicitPass - A CRTP mix-in to automatically provide informational APIs neede...
- class MallocAllocator - CRTP base class providing obvious overloads for the core \c All...
- class ManagedStatic - ManagedStatic - This transparently changes the behavior of glob...
- class ManagedStaticBase - ManagedStaticBase - Common base class for ManagedStatic instanc...
- class Mangler
- struct ManglingParser
- struct Map - StringMap - This is an unconventional map that is specialized f...
- class MapResolver - Resolve arbitrary mappings.
- struct MapResolver::MappedValue
- class MapVector - This class implements a map that also provides access to all st...
- struct MapVectorMappedTypeTest
- class MappedBlockStream - MappedBlockStream represents data stored in an MSF file into ch...
- struct MappingContext
- struct MappingContextTraits - This class is similar to MappingTraits <T > but allows you to p...
- class MappingNode - Represents a YAML map created from either a block map for a flo...
- struct MappingNormalization
- struct MappingNormalizationHeap
- struct MappingTraits - This class should be specialized by any type that needs to be c...
- class MappingTraits::NormalizedSeconds
- struct MappingTraits::NormalizedTBD
- struct MappingTraits::NormalizedTBD_V4
- struct MaskOps - This is used by foldAnyOrAllBitsSet() to capture a source value...
- class MaskedGatherSDNode
- class MaskedGatherScatterSDNode
- class MaskedLoadSDNode
- class MaskedLoadStoreSDNode
- class MaskedScatterSDNode
- class MaskedStoreSDNode
- struct MatchRange
- class Matrix - PBQP Matrix class
- class MatrixMetadata - Metadata to speed allocatability test. Keeps track of the numbe...
- struct MaxMin_match
- struct MaybeAlign - This struct is a compact representation of a valid (power of tw...
- class MemCpyInst
- class MemCpyOptPass - A CRTP mix-in to automatically provide informational APIs neede...
- class MemDepResult - A memory dependence query can return one of three different ans...
- class MemIntrinsic
- class MemIntrinsicBase
- struct MemIntrinsicInfo - Information about a load/store intrinsic defined by the target.
- class MemIntrinsicPlugin - --------------------------- MemIntrinsicPlugin ----------------...
- class MemIntrinsicSDNode
- class MemMoveInst
- class MemSDNode
- class MemSetBase - Common base class for all memset intrinsics. Simply provides co...
- class MemSetInst
- class MemTransferBase - Common base class for all memory transfer intrinsics. Simply pr...
- class MemTransferInst
- struct MemberAttributes - Equvalent to CV_fldattr_t in cvinfo.h.
- class MemberExpr
- class MemberFuncIdRecord
- class MemberFunctionRecord
- class MemberPointerInfo
- class Memory - This class provides various memory handling functions that mani...
- class MemoryAccess - Extension point for the Value hierarchy. All classes outside of...
- class MemoryBlock - This class encapsulates the notion of a memory block which has ...
- class MemoryBuffer - This interface provides simple read-only access to a block of m...
- class MemoryBufferByteStream - An implementation of BinaryStream whose data is backed by an ll...
- class MemoryBufferRef
- class MemoryDef - Represents a read-write access to memory, whether it is a must-...
- class MemoryDepChecker - Checks memory dependences among accesses to the same underlying...
- struct MemoryDepChecker::Dependence - Dependece between memory access instructions.
- class MemoryDependenceAnalysis - An analysis that produces \c MemoryDependenceResults for a func...
- class MemoryDependenceResults - Provides a lazy, caching interface for making common memory ali...
- struct MemoryDependenceResults::NonLocalPointerInfo - This record is the information kept for each (value, is load) p...
- class MemoryDependenceWrapperPass - A wrapper analysis pass for the legacy pass manager that expose...
- class MemoryExpression
- class MemoryGroup - A node of a memory dependency graph. A MemoryGroup describes a ...
- class MemoryLocation - Representation for a specific memory location. This abstraction...
- class MemoryPhi - Represents phi nodes for memory accesses. These have the same s...
- class MemorySSA - Encapsulates MemorySSA, including all data associated with memo...
- class MemorySSA::CachingWalker - A MemorySSAWalker that does AA walks to disambiguate accesses. ...
- class MemorySSA::ClobberWalkerBase
- class MemorySSA::OptimizeUses - This class is a batch walker of all MemoryUse's in the program,...
- class MemorySSA::SkipSelfWalker
- class MemorySSAAnalysis - An analysis that produces \c MemorySSA for a function.
- struct MemorySSAAnalysis::Result
- class MemorySSAAnnotatedWriter - An assembly annotator class to print Memory SSA information in ...
- class MemorySSAPrinterLegacyPass - FunctionPass class - This class is used to implement most globa...
- class MemorySSAPrinterPass - Printer pass for \c MemorySSA.
- class MemorySSATest - There's a lot of common setup between these tests. This fixture...
- struct MemorySSATest::TestAnalyses
- class MemorySSAUpdater
- class MemorySSAUtil
- struct MemorySSAVerifierPass - Verifier pass for \c MemorySSA.
- class MemorySSAWalker - This is the generic walker interface for walkers of MemorySSA. ...
- class MemorySSAWrapperPass - Legacy analysis pass which computes \c MemorySSA.
- struct MemorySanitizerOptions
- struct MemorySanitizerPass - A function pass for msan instrumentation. Instruments functions...
- class MemoryUse - Represents read-only accesses to memory In particular, the set ...
- class MemoryUseOrDef - Class that has the common methods + fields of memory uses/defs....
- class MemoryWriteTracking
- class MergeFunctionsPass - Merge identical functions.
- struct MergeICmpsPass - A CRTP mix-in to automatically provide informational APIs neede...
- struct MergedLoadStoreMotionOptions
- class MergedLoadStoreMotionPass - A CRTP mix-in to automatically provide informational APIs neede...
- class MergingTypeTableBuilder
- struct MetaSerializer - This is the base class for a remark metadata serializer.
- struct Metadata - In-memory representation of kernel argument metadata.
- class Metadata - Root of the metadata hierarchy. This is a root class for typele...
- struct Metadata - In-memory representation of kernel debug properties metadata.
- struct Metadata - In-memory representation of kernel code properties metadata.
- struct Metadata - In-memory representation of HSA metadata.
- struct Metadata - In-memory representation of kernel attributes metadata.
- struct Metadata - In-memory representation of kernel metadata.
- class MetadataAsValue - Metadata wrapper in the Value hierarchy. A member of the \a Val...
- class MetadataLoader - Helper class that handles loading Metadatas and keeping them av...
- class MetadataLoader::MetadataLoaderImpl
- class MetadataRecord
- class MetadataTracking - API for tracking metadata references through RAUW and deletion....
- class MethodOverloadListRecord
- class MicroOpQueueStage - A stage that simulates a queue of instruction opcodes.
- class ModifierRecord
- class Module
- struct Module::ModuleFlagEntry
- class Module::debug_compile_units_iterator - An iterator for DICompileUnits that skips those marked NoDebug.
- class ModuleAddressSanitizerPass - Public interface to the address sanitizer module pass for instr...
- class ModulePass - ModulePass class - This class is used to implement unstructured...
- class ModuleSanitizerCoveragePass - This is the ModuleSanitizerCoverage pass used in the new pass m...
- class ModuleSlotTracker - Manage lifetime of a slot tracker for printing IR. Wrapper arou...
- class ModuleSummaryIndex - Class to hold module path string table and global value map, an...
- class ModuleSummaryIndexAnalysis - Analysis pass to provide the ModuleSummaryIndex object.
- class ModuleSummaryIndexWrapperPass - Legacy wrapper pass to provide the ModuleSummaryIndex object.
- class ModuleToFunctionPassAdaptor - Trivial adaptor that maps from a module to its functions. Desig...
- class ModuleToPostOrderCGSCCPassAdaptor - The core module pass which does a post-order walk of the SCCs a...
- class ModuloSchedule - Represents a schedule for a single-block loop. For every instru...
- class ModuloScheduleExpander - The ModuloScheduleExpander takes a ModuloSchedule and expands i...
- class ModuloScheduleTestAnnotater - Expander that simply annotates each scheduled instruction with ...
- class MulOperator
- struct MultiClass
- struct MultilineStringType
- struct MultilineStringTypeMap
- struct MustBeExecutedContextExplorer - A "must be executed context" for a given program point PP is th...
- struct MustBeExecutedIterator - Must be executed iterators visit stretches of instructions that...
- class MutableArrayRef - MutableArrayRef - Represent a mutable reference to an array (0 ...
- class MutableBinaryByteStream - An implementation of BinaryStream which holds its entire data s...
- struct MyCustomType
- struct MyCustomTypeMap
- struct MyDouble
- struct MyValidation
- struct NameAndNumbers
- struct NameAndNumbersFlow
- class NameAnonGlobalPass - Simple pass that provides a name to every anonymous globals.
- class NameType
- struct NameWithTemplateArgs
- struct NamedIdentifierNode
- struct NamedInstrProfRecord - Profiling information for a single function.
- class NamedMDNode
- class NamedMDNode::op_iterator_impl
- struct NamedRegionTimer - This class is basically a combination of TimeRegion and Timer. ...
- class NaryReassociatePass - A CRTP mix-in to automatically provide informational APIs neede...
- class NativeObjectStream - This class wraps an output stream for a native object. Most cli...
- class NearMissInfo
- struct NearMissInfo::MissedOpInfo
- struct NearMissInfo::TooFewOperandsInfo
- class Negative
- struct NeonFeatureNameInfo
- struct NestedMap
- struct NestedName
- class NestedTypeRecord
- class NewBufferRecord
- class NewCPUIDRecord
- class NewExpr
- class NewGVNPass - A CRTP mix-in to automatically provide informational APIs neede...
- struct NewPMCheckDebugifyPass - A CRTP mix-in to automatically provide informational APIs neede...
- struct NewPMDebugifyPass - A CRTP mix-in to automatically provide informational APIs neede...
- struct NfaStatePair - Forward define the pair type used by the automata transition in...
- class NfaTranscriber - The internal class that maintains all possible paths through an...
- struct NfaTranscriber::PathSegment - A simple linked-list of traversed states that can have a shared...
- class NoFolder - NoFolder - Create "constants" (actually, instructions) with no ...
- class Node
- class Node - Abstract base class for all Nodes.
- struct Node
- struct NodeAccess - An access class for ilist_node private API. This gives access t...
- class NodeArray
- struct NodeArrayNode
- struct NodeArrayNode
- class NodeBase
- struct NodeList
- class NodeMetadata - Holds solver state and other metadata relevant to each PBQP RA ...
- class NodeRef
- struct NodeRef::CacheAlignedPointerTraits
- class NodeSet - A NodeSet contains a set of SUnit DAG nodes with additional inf...
- struct NodeSizer
- class NoexceptSpec
- class NonLocalDepEntry - This is an entry in the NonLocalDepInfo cache. For each BasicBl...
- class NonLocalDepResult - This is a result from a NonLocal dependence query. For each Bas...
- struct NonPOD
- class NonRelocatableStringpool - A string table that doesn't need relocations. Use this class wh...
- class NonTypeTemplateParamDecl - A non-type template parameter declaration, 'int N'.
- class NoopStatistic
- class NotFoundError - Base class for user error types. Users should declare their err...
- class NullNode - A null value. Example: !!null null
- class NumericSubstitution - Class representing a substitution to perform in the RegExStr st...
- class NumericVariable - Class representing a numeric variable and its associated curren...
- class NumericVariableUse - Class representing the use of a numeric variable in the AST of ...
- class OStream - for (const Event &E : Events) { J.objectBegin(); J.attribute("...
- struct OStream::State
- class ObjCARCAA - Analysis pass providing a never-invalidated alias analysis resu...
- class ObjCARCAAResult - This is a simple alias analysis implementation that uses knowle...
- class ObjCARCAAWrapperPass - Legacy wrapper pass to provide the ObjCARCAAResult object.
- class ObjCProtoName
- struct ObjFileAddressRange - Partial address range. Besides an offset, only the HighPC is st...
- class ObjNameSym
- class Object - An Object is a JSON object, which maps strings to heterogenous ...
- struct Object::KV
- class ObjectKey - ObjectKey is a used to capture keys in Object. Like Value but: ...
- class ObjectMapper - Helper for mapping JSON objects onto protocol structs. Example:
- class ObjectSizeOffsetEvaluator - Evaluate the size and offset of an object pointed to by a Value...
- class ObjectSizeOffsetVisitor - Evaluate the size and offset of an object pointed to by a Value...
- struct ObjectSizeOpts - Various options to control the behavior of getObjectSize.
- struct OffsetsTag
- class OnDiskChainedHashTable - Provides lookup on an on disk hash table. This needs an \c Info...
- class OnDiskChainedHashTable::iterator
- class OnDiskChainedHashTableGenerator - Generates an on disk hash table. This needs an \c Info that han...
- struct OnDiskChainedHashTableGenerator::Bucket - A linked list of values in a particular hash bucket.
- class OnDiskChainedHashTableGenerator::Item - A single item in the hash table.
- class OnDiskIterableChainedHashTable - Provides lookup and iteration over an on disk hash table. \copy...
- class OnDiskIterableChainedHashTable::data_iterator - Iterates over all the entries in the table, returning the data.
- class OnDiskIterableChainedHashTable::iterator_base - Iterates over all of the keys in the table.
- class OnDiskIterableChainedHashTable::key_iterator - Iterates over all of the keys in the table.
- class OneMethodRecord
- struct OneOps_match - Matches instructions with Opcode and three operands.
- struct OneUse_match
- struct OneUse_match
- struct OpDescriptor - A description of some operation we can build while fuzzing IR.
- class OpInit - Base class for operators
- class OpenMPIRBuilder - An interface to create LLVM-IR for OpenMP directives. Each Open...
- struct OpenMPIRBuilder::FinalizationInfo
- struct OpenMPIRBuilder::LocationDescription - Description of a LLVM-IR insertion point (IP) and a debug/sourc...
- class OperandBundleDefT
- struct OperandBundleUse
- struct OperandSpecifier - The specification for how to extract and interpret one operand.
- struct Operation::Description - Description of the encoding of one expression Op.
- class Operator - This is a utility class that provides an abstraction for the co...
- class OptBisect - This class implements a mechanism to disable passes and individ...
- class OptLevelChanger - This class is used by SelectionDAGISel to temporarily override ...
- class OptPassGate - Extensions to this class implement mechanisms to disable passes...
- class OptSpecifier - OptSpecifier - Wrapper class for abstracting references to opti...
- class OptTable - Provide access to the Option info table. The OptTable class pro...
- struct OptTable::Info - Entry for a single option instance in the option data table.
- class OptimizationRemark - Diagnostic information for applied optimization remarks.
- class OptimizationRemarkAnalysis - Diagnostic information for optimization analysis remarks.
- class OptimizationRemarkAnalysisAliasing - Diagnostic information for optimization analysis remarks relate...
- class OptimizationRemarkAnalysisFPCommute - Diagnostic information for optimization analysis remarks relate...
- class OptimizationRemarkEmitter - The optimization diagnostic interface. It allows reporting when...
- class OptimizationRemarkEmitterAnalysis - A CRTP mix-in that provides informational APIs needed for analy...
- class OptimizationRemarkEmitterWrapperPass - OptimizationRemarkEmitter legacy analysis pass Note that this p...
- class OptimizationRemarkMissed - Diagnostic information for missed-optimization remarks.
- struct OptimizeUses::MemlocStackInfo - This represents where a given memorylocation is in the stack.
- class Option
- class Option - Option - Abstract representation for a single form of driver ar...
- class OptionCategory
- struct OptionDiffPrinter
- struct OptionEnumValue
- struct OptionValue
- struct OptionValueBase
- class OptionValueCopy
- class Optional
- struct OptionalOperandTraits - OptionalOperandTraits - when the number of operands may change ...
- class OptionalStorage - Storage for any type.
- struct OptionalTest
- struct OptionalTestSeq
- struct Options - A struct for passing gcov options between functions.
- struct Or
- class OrderedBasicBlock
- class OrderedInstructions
- class OuterAnalysisManagerProxy - An analysis over an "inner" IR unit that provides access to an ...
- class OuterAnalysisManagerProxy::Result
- struct OutlinedFunction
- class Output - The Output class is used to generate a yaml document from in-me...
- struct OutputArg - OutputArg - This struct carries flags and a value for a single ...
- class OutputStream
- struct OverflowingBinaryOp_match
- class OverflowingBinaryOperator - Utility class for integer operators which may exhibit overflow ...
- struct OverlapFuncFilters
- struct OverlapStats
- class OverlayFileSystem - A file system that allows overlaying one \p AbstractFileSystem ...
- class OverloadedMethodRecord - For method overload sets. LF_METHOD
- class OwningArrayRef - This is a MutableArrayRef that owns its array.
- class OwningMemoryBlock - Owning version of MemoryBlock.
- class PBQPRAConstraint - Abstract base for classes implementing PBQP register allocation...
- class PBQPRAConstraintList - PBQP register allocation constraint composer. Constraints added...
- class PBQPRAGraph - PBQP Graph class. Instances of this class describe PBQP problem...
- class PGOIndirectCallPromotion - The indirect function call promotion pass.
- struct PGOIndirectCallVisitor - Base class for instruction visitors Instruction visitors are us...
- class PGOInstrumentationGen - The instrumentation (profile-instr-gen) pass for IR based PGO.
- class PGOInstrumentationGenCreateVar - The instrumentation (profile-instr-gen) pass for IR based PGO.
- class PGOInstrumentationUse - The profile annotation (profile-instr-use) pass for IR based PG...
- class PGOMemOPSizeOpt - The profile size based optimization pass for memory intrinsics.
- struct PGOOptions - A struct capturing PGO tunables.
- struct PHIDenseMapInfo
- class PHIExpression
- class PHINode
- class PHITransAddr - PHITransAddr - An address value which tracks and handles phi tr...
- class PIDRecord
- class PMDataManager - PMDataManager provides the common place to manage the analysis ...
- class PMStack - PMStack - This class implements a stack data structure of PMDat...
- class PMTopLevelManager - PMTopLevelManager manages LastUser info and collects common API...
- struct PMTopLevelManager::AUFoldingSetNode - A wrapper around AnalysisUsage for the purpose of uniqueing. T...
- class PODSmallVector
- class PSetIterator - Iterate over the pressure sets affected by the given physical o...
- class PackedVector - Store a vector of values using a specific number of bits for ea...
- class PackedVector::reference
- class PackedVersion
- class PadAdapter
- class ParameterPack - An unexpanded parameter pack (either in the expression or type ...
- class ParameterPackExpansion - A pack expansion. Below this node, there are some unexpanded Pa...
- class ParseError - Base class for user error types. Users should declare their err...
- struct ParseInstructionInfo
- struct ParsedBranchProtection
- struct ParsedModuleAndIndex - Holds the Module and ModuleSummaryIndex returned by the interfa...
- struct ParsedStringTable - In-memory representation of the string table parsed from a buff...
- class PartialInlinerPass - Pass to remove unused function declarations.
- class PartiallyInlineLibCallsPass - A CRTP mix-in to automatically provide informational APIs neede...
- class Partition - A partition of the slices. An ephemeral representation for a ra...
- class Pass - Pass interface - Implemented by all 'passes'. Subclass this if...
- class PassArgFilter - ===------------------------------------------------------------...
- class PassBuilder - This class provides access to building LLVM's passes. Its membe...
- struct PassBuilder::PipelineElement - A struct to capture parsed pass pipeline names. A pipeline is d...
- struct PassConcept - Template for the abstract base class used to dispatch polymorph...
- class PassConfigImpl
- class PassInfo
- struct PassInfoMixin - A CRTP mix-in to automatically provide informational APIs neede...
- class PassInstrumentation - This class provides instrumentation entry points for the Pass M...
- class PassInstrumentationAnalysis
- class PassInstrumentationCallbacks
- class PassManager - PassManager manages ModulePassManagers
- class PassManager
- class PassManagerBase - PassManagerBase - An abstract interface to allow code to add pa...
- class PassManagerBuilder - PassManagerBuilder - This class is used to set up a standard op...
- class PassManagerImpl - PassManagerImpl manages MPPassManagers
- class PassManagerPrettyStackEntry - PassManagerPrettyStackEntry - This is used to print informative...
- struct PassModel - A template wrapper used to implement the polymorphic API. Can b...
- class PassNameParser - PassRegistrationListener class - This class is meant to be deri...
- class PassPlugin - A loaded pass plugin. An instance of this class wraps a loaded ...
- struct PassPluginLibraryInfo - Information about the plugin required to load its passes This s...
- struct PassRegistrationListener - PassRegistrationListener class - This class is meant to be deri...
- class PassRegistry
- struct PatchItem
- struct PatchLocation
- class PatchPointOpers - MI-level patchpoint operands. MI patchpoint operations take the...
- class Path
- struct Path::Entry - Entry - Each step in the path is a node pointer and an offset i...
- class Pattern
- struct Pattern::NumericVariableMatch - Structure representing the definition of a numeric variable in ...
- struct Pattern::VariableProperties - Parsing information about a variable.
- struct PatternsForOpcode - Map from opcode to pattern list by binary search.
- class PeelingModuloScheduleExpander - A reimplementation of ModuloScheduleExpander. It works by gener...
- struct PerFunctionMIParsingState
- struct PerTargetMIParsingState
- class PhiValues - Class for calculating and caching the underlying values of phis...
- class PhiValues::PhiValuesCallbackVH - A CallbackVH to notify PhiValues when a value is deleted or rep...
- class PhiValuesAnalysis - The analysis pass which yields a PhiValues The analysis does no...
- class PhiValuesPrinterPass - A pass for printing the PhiValues for a function. This pass doe...
- class PhiValuesWrapperPass - Wrapper pass for the legacy pass manager
- struct PhysRegInfo - Information about how a physical register Reg is used by a set ...
- struct PhysRegSUOper - Record a physical register access. For non-data-dependent uses,...
- class PhysicalRegisterUsageInfo - ImmutablePass class - This class is used to provide information...
- class PiBlockDDGNode - Subclass of DDGNode representing a pi-block. A pi-block represe...
- struct PickAlignment - ::value is either alignment, or alignof(T) if alignment is 0.
- class Pipeline - A pipeline for a specific subtarget. It emulates an out-of-orde...
- class PipelineConsumer
- struct PipelineOptions - This is a convenience struct to hold the parameters necessary f...
- class PipelineTuningOptions - Tunable parameters for passes in the default pipelines.
- class PixelVectorType
- struct PluginLoader
- struct PointerAlignElem - Layout pointer alignment element. Stores the alignment data ass...
- class PointerEmbeddedInt - Utility to embed an integer into a pointer-like type. This is s...
- struct PointerEmbeddedInt::RawValueTag
- class PointerIntPair - PointerIntPair - This class implements a pair of a pointer and ...
- struct PointerIntPairInfo
- class PointerRecord
- class PointerSumType - A sum type over pointer-like types. This is a normal tagged uni...
- union PointerSumType::StorageT
- struct PointerSumTypeHelper - A helper template for implementing \c PointerSumType. It provid...
- struct PointerSumTypeHelper::Checker
- struct PointerSumTypeHelper::Lookup
- struct PointerSumTypeHelper::Min
- struct PointerSumTypeMember - A compile time pair of an integer tag and the pointer-like type...
- class PointerToMemberType
- class PointerType - Class to represent pointers.
- class PointerType
- struct PointerTypeNode
- class PointerUnion - A discriminated union of two or more pointer types, with the di...
- struct PointerUnionTypeSelector - Get a type based on whether two types are the same or not. For:...
- struct PointerUnionTypeSelectorReturn
- class PointerUnionUIntTraits - Provide PointerLikeTypeTraits for void* that is used by Pointer...
- struct PoisonCheckingPass - A CRTP mix-in to automatically provide informational APIs neede...
- class PoisoningVH
- struct Poly
- struct PolymorphicTraits - This class should be specialized by any type that can be repres...
- class PoolCostAllocator
- class PooledStringPtr - PooledStringPtr - A pointer to an interned string. Use operator...
- class PopulateLoopsDFS - Populate all loop data in a stable order during a single forwar...
- struct PopulationCounter
- class PossiblyExactOperator - A udiv or sdiv instruction, which can be marked as "exact", ind...
- class PostDominatorTree - PostDominatorTree Class - Concrete subclass of DominatorTree th...
- class PostDominatorTreeAnalysis - Analysis pass which computes a \c PostDominatorTree.
- class PostDominatorTreePrinterPass - Printer pass for the \c PostDominatorTree.
- struct PostDominatorTreeWrapperPass - FunctionPass class - This class is used to implement most globa...
- class PostGenericScheduler - PostGenericScheduler - Interface to the scheduling algorithm us...
- struct PostOrderFunctionAttrsPass - Computes function attributes in post-order over the call graph....
- class PostfixExpr
- class PostfixQualifiedType
- struct PreISelIntrinsicLoweringPass - A CRTP mix-in to automatically provide informational APIs neede...
- class PrecompRecord
- struct PredInfo
- class PredIterator
- class PredIteratorCache - PredIteratorCache - This class is an extremely trivial cache fo...
- class PredicateAssume - An intrusive list node. A base class to enable membership in in...
- class PredicateBase - An intrusive list node. A base class to enable membership in in...
- class PredicateBitsetImpl - Container class for CodeGen predicate results. This is convenie...
- class PredicateBranch - An intrusive list node. A base class to enable membership in in...
- class PredicateInfo - Encapsulates PredicateInfo, including all data associated with ...
- struct PredicateInfo::ValueInfo
- class PredicateInfoAnnotatedWriter - An assembly annotator class to print PredicateInfo information ...
- class PredicateInfoPrinterLegacyPass - FunctionPass class - This class is used to implement most globa...
- class PredicateInfoPrinterPass - Printer pass for \c PredicateInfo.
- struct PredicateInfoVerifierPass - Verifier pass for \c PredicateInfo.
- class PredicateSwitch - An intrusive list node. A base class to enable membership in in...
- class PredicateWithCondition - An intrusive list node. A base class to enable membership in in...
- class PredicateWithEdge - An intrusive list node. A base class to enable membership in in...
- class PredicatedScalarEvolution - An interface layer with SCEV used to manage how we see SCEV exp...
- struct PreferredTuple
- class PrefixExpr
- class PreservedAnalyses
- class PreservedAnalyses::PreservedAnalysisChecker - A checker object that makes it easy to query for whether an ana...
- class PressureChange - Capture a change in pressure for a single pressure set. UnitInc...
- class PressureDiff - List of PressureChanges in order of increasing, unique PSetID. ...
- class PressureDiffs - Array of PressureDiffs.
- class PrettyStackTraceEntry - PrettyStackTraceEntry - This class is used to represent a frame...
- class PrettyStackTraceFormat - PrettyStackTraceFormat - This object prints a string (which may...
- class PrettyStackTraceProgram - PrettyStackTraceProgram - This object prints a specified progra...
- class PrettyStackTraceString - PrettyStackTraceString - This object prints a specified string ...
- struct PrimitiveTypeNode
- class PrintFunctionPass - Pass for printing a Function as LLVM's text IR assembly. Note: ...
- class PrintIRInstrumentation - Instrumentation to print IR before/after passes. Needs state to...
- class PrintLoopPass - Pass for printing a loop's contents as textual IR.
- class PrintModulePass - Pass for printing a Module as LLVM's text IR assembly. Note: Th...
- class Printable
- class PriorityQueue - PriorityQueue - This class behaves like std::priority_queue and...
- class PriorityWorklist - A FILO worklist that prioritizes on re-insertion without duplic...
- class PriorityWorklist::TestAndEraseFromMap - A wrapper predicate designed for use with std::remove_if. This ...
- class ProcRefSym
- class ProcSym
- class ProcedureRecord
- class Process - A collection of legacy interfaces for querying information abou...
- struct ProcessInfo - This struct encapsulates information about a process.
- class ProfOStream
- class Profile - Profile instances are thread-compatible.
- struct Profile::Block
- struct Profile::Data
- struct Profile::TrieNode
- struct ProfileData
- class ProfileSummary
- class ProfileSummaryAnalysis
- class ProfileSummaryBuilder
- struct ProfileSummaryEntry
- class ProfileSummaryInfo
- class ProfileSummaryInfoWrapperPass
- class ProfileSummaryPrinterPass
- class ProfileSymbolList - ProfileSymbolList records the list of function symbols shown up...
- class PromotePass - A CRTP mix-in to automatically provide informational APIs neede...
- class ProvenanceAnalysis - This is similar to BasicAliasAnalysis, and it uses many of the ...
- class ProxyFileSystem - By default, this delegates all calls to the underlying file sys...
- class PseudoSourceValue - Special value supplied for machine level alias analysis. It ind...
- class PseudoSourceValueManager
- struct PtrAddChain
- struct PtrLikeInt
- class PtrState - This class summarizes several per-pointer runtime properties wh...
- class PtrToIntInst
- class PtrToIntOperator
- class PtrUseVisitor - A base class for visitors over the uses of a pointer value. Onc...
- class PtrUseVisitorBase - Implementation of non-dependent functionality for \c PtrUseVisi...
- class PtrUseVisitorBase::PtrInfo - This class provides information about the result of a visit. Af...
- struct PtrUseVisitorBase::UseToVisit - A struct of the data needed to visit a particular use. This is ...
- class PublicSym32
- class QualType
- class QualifiedName
- struct QualifiedNameNode
- class RAIIDelegateInstaller - A simple RAII based CSEInfo installer. Use this in a scope to i...
- class RAIIDiagnosticChecker
- class RGPassManager - The pass manager to schedule RegionPasses.
- class RNSuccIterator - Hierarchical RegionNode successor iterator. This iterator itera...
- struct RRInfo - Unidirectional information about either a retain-decrement-use-...
- struct RandomIRBuilder
- class RandomNumberGenerator - A random number generator. Instances of this class should not b...
- struct RangeListEntry - A class representing a single range list entry.
- struct RangeSpan
- struct RangeSpanList
- class RawCoverageFilenamesReader - Reader for the raw coverage filenames.
- class RawCoverageMappingDummyChecker - Checks if the given coverage mapping data is exported for an un...
- class RawCoverageMappingReader - Reader for the raw coverage mapping data.
- class RawCoverageReader - Base class for the raw coverage mapping and filenames data read...
- class RawInstrProfReader - Reader for the raw instrprof binary format from runtime. This f...
- class ReachingDefAnalysis - This class provides the reaching def analysis.
- struct ReadDescriptor - A register read descriptor.
- class ReadState - Tracks register operand latency in cycles. A read may be depend...
- class ReadyQueue - ReadyQueue encapsulates vector of "ready" SUnits with basic con...
- class ReassociatePass - Reassociate commutative expressions.
- struct ReassociatePass::PairMapValue
- struct RebasedConstantInfo - This represents a constant that has been rebased with respect t...
- struct RecDirIterState - Keeps state for the recursive_directory_iterator.
- struct RecDirIterState - Keeps state for the recursive_directory_iterator.
- class RecTy
- class Record
- class Record
- class RecordConsumer
- class RecordInitializer
- class RecordKeeper
- struct RecordPrefix
- class RecordPrinter
- class RecordProducer
- class RecordRecTy - '[classname]' - Type of record values that have zero or more su...
- class RecordResolver - Resolve all variables from a record except for unset variables.
- class RecordVal
- class RecordValResolver - Resolve all references to a specific RecordVal.
- class RecordVisitor
- struct RecordsEntry - RecordsEntry - Can be either a record or a foreach loop.
- class RecurrenceDescriptor - This struct holds information about recurrence variables.
- class RecurrenceDescriptor::InstDesc - This POD struct holds information about a potential recurrence ...
- class Recycler - Recycler - This class manages a linked-list of deallocated node...
- struct Recycler::FreeNode
- class RecyclingAllocator - RecyclingAllocator - This class wraps an Allocator, adding the ...
- class RedirectingFileSystem - A virtual file system parsed from a YAML file. Currently, this ...
- class RedirectingFileSystem::Entry - A single file or directory in the VFS.
- class RedirectingFileSystem::RedirectingDirectoryEntry - A single file or directory in the VFS.
- class RedirectingFileSystem::RedirectingFileEntry - A single file or directory in the VFS.
- class RedirectingFileSystemParser - A helper class to hold the common YAML parsing state.
- struct RedirectingFileSystemParser::KeyStatus
- class RefCountedBase - A CRTP mixin class that adds reference counting to a type. The ...
- class ReferenceType
- class RegAllocBase - RegAllocBase provides the register allocation driver and interf...
- class RegAllocSolverImpl
- struct RegAllocSolverImpl::EdgeMetadata
- class RegAllocSolverImpl::SpillCostComparator
- class RegBankSelect
- class RegBankSelect::EdgeInsertPoint - Insertion point on an edge.
- class RegBankSelect::InsertPoint - Abstract class used to represent an insertion point in a CFG. T...
- class RegBankSelect::InstrInsertPoint - Insertion point before or after an instruction.
- class RegBankSelect::MBBInsertPoint - Insertion point at the beginning or end of a basic block.
- class RegBankSelect::MappingCost - Helper class used to represent the cost for mapping an instruct...
- class RegBankSelect::RepairingPlacement
- struct RegClassWeight - Each TargetRegisterClass has a per register weight, and weight ...
- struct RegImmPair - Used to describe a register and immediate addition.
- struct RegPressureDelta - Store the effects of a change in pressure on things that MI sch...
- class RegPressureTracker - Track the current register pressure at some position in the ins...
- class RegRelativeSym
- class RegScavenger
- struct RegScavenger::ScavengedInfo - Information on scavenged registers (held in a spill slot).
- class Regex
- class Region
- class RegionBase - A single entry single exit Region. A Region is a connected subg...
- class RegionBase::block_iterator_wrapper
- class RegionInfo
- class RegionInfoAnalysis - Analysis pass that exposes the \c RegionInfo for a function.
- class RegionInfoBase - Analysis that detects all canonical Regions. The RegionInfo pas...
- class RegionInfoPass - FunctionPass class - This class is used to implement most globa...
- class RegionInfoPrinterPass - Printer pass for the \c RegionInfo.
- struct RegionInfoVerifierPass - Verifier pass for the \c RegionInfo.
- class RegionNode
- class RegionNodeBase - A RegionNode represents a subregion or a BasicBlock that is par...
- class RegionPass - A pass that runs on each Region in a function. RegionPass is ma...
- struct RegionPressure - RegisterPressure computed within a region of instructions delim...
- struct RegionTraits
- class Register - Wrapper class representing virtual and physical registers. Shou...
- class RegisterAGBase
- struct RegisterAnalysisGroup
- struct RegisterAsmPrinter - RegisterAsmPrinter - Helper template for registering a target s...
- class RegisterBank
- class RegisterBankInfo
- class RegisterBankInfo::InstructionMapping - Helper class that represents how the value of an instruction ma...
- class RegisterBankInfo::OperandsMapper
- struct RegisterBankInfo::PartialMapping - Helper struct that represents how a value is partially mapped i...
- struct RegisterBankInfo::ValueMapping - Helper struct that represents how a value is mapped through dif...
- class RegisterClassInfo
- struct RegisterClassInfo::RCInfo
- class RegisterFile - Manages hardware register files, and tracks register definition...
- struct RegisterFile::RegisterMappingTracker
- struct RegisterFile::RegisterRenamingInfo
- struct RegisterMCAsmBackend - RegisterMCAsmBackend - Helper template for registering a target...
- struct RegisterMCAsmInfo - RegisterMCAsmInfo - Helper template for registering a target as...
- struct RegisterMCAsmInfoFn - RegisterMCAsmInfoFn - Helper template for registering a target ...
- struct RegisterMCAsmParser - RegisterMCAsmParser - Helper template for registering a target ...
- struct RegisterMCCodeEmitter - RegisterMCCodeEmitter - Helper template for registering a targe...
- struct RegisterMCInstrAnalysis - RegisterMCInstrAnalysis - Helper template for registering a tar...
- struct RegisterMCInstrAnalysisFn - RegisterMCInstrAnalysisFn - Helper template for registering a t...
- struct RegisterMCInstrInfo - RegisterMCInstrInfo - Helper template for registering a target ...
- struct RegisterMCInstrInfoFn - RegisterMCInstrInfoFn - Helper template for registering a targe...
- struct RegisterMCRegInfo - RegisterMCRegInfo - Helper template for registering a target re...
- struct RegisterMCRegInfoFn - RegisterMCRegInfoFn - Helper template for registering a target ...
- struct RegisterMCSubtargetInfo - RegisterMCSubtargetInfo - Helper template for registering a tar...
- struct RegisterMCSubtargetInfoFn - RegisterMCSubtargetInfoFn - Helper template for registering a t...
- struct RegisterMaskPair
- class RegisterMaskSDNode
- class RegisterOperands - List of registers defined and used by a machine instruction.
- struct RegisterPass
- class RegisterPassParser - RegisterPassParser class - Handle the addition of new machine p...
- struct RegisterPressure - Base class for register pressure results.
- class RegisterRegAlloc - RegisterRegAllocBase class - Track the registration of register...
- class RegisterRegAllocBase - RegisterRegAllocBase class - Track the registration of register...
- class RegisterSDNode
- class RegisterScheduler - MachinePassRegistryNode - Machine pass node stored in registrat...
- class RegisterStandardPasses - Registers a function for adding a standard set of passes. This...
- class RegisterSym
- struct RegisterTarget - RegisterTarget - Helper template for registering a target, for ...
- struct RegisterTargetMachine - RegisterTargetMachine - Helper template for registering a targe...
- class Registry - A global registry used in conjunction with static constructors ...
- class Registry::Add - A static registration template. Use like such: Registry <Collec...
- class Registry::iterator - Iterators for registry entries.
- class Registry::node - Node in linked list of entries.
- struct RegsForValue - This struct represents the registers (physical or virtual) that...
- struct RegularLTOState::AddedModule
- struct RegularLTOState::CommonResolution
- struct RelocAddrEntry - RelocAddrEntry contains relocated value and section index. Sect...
- struct RemappedRecord
- struct Remark - A remark type used for both emission and parsing.
- struct RemarkLinker
- struct RemarkLinker::RemarkPtrCompare - Compare through the pointers.
- struct RemarkLocation - The debug location used to track a remark back to the source fi...
- struct RemarkParser - Parser used to parse a raw buffer to remarks::Remark objects.
- struct RemarkSerializer - This is the base class for a remark serializer. It includes sup...
- struct RemarkSetupErrorInfo
- struct RemarkSetupFileError
- struct RemarkSetupFormatError
- struct RemarkSetupPatternError
- class RemarkStreamer - Streamer for remarks.
- class RepeatAdapter
- class RepeatedPass - A utility pass template that simply runs another pass multiple ...
- class ReplaceableMetadataImpl
- struct ReplacementItem
- struct RequireAnalysisPass - A utility pass template to force an analysis result to be avail...
- class ReservoirSampler - Randomly selects an item by sampling into a set with an unknown...
- class Resolver - Interface for looking up the initializer for a variable name, u...
- class ResourceCycles - This class represents the number of cycles per resource (fracti...
- class ResourceManager - A resource manager for processor resource units and groups. Thi...
- class ResourceManager
- class ResourcePriorityQueue - This interface is used to plug different priorities computation...
- class ResourceState - A processor resource descriptor. There is an instance of this c...
- class ResourceStrategy - Resource allocation strategy used by hardware scheduler resourc...
- struct ResourceUsage - Helper used by class InstrDesc to describe how hardware resourc...
- struct ResponseFileRecord
- class ResultHasInvalidateMethod - SFINAE metafunction for computing whether \c ResultT provides a...
- struct ResultHasInvalidateMethod::Checker
- struct ResultHasInvalidateMethod::CheckerBase
- struct ResultHasInvalidateMethod::DisabledType
- struct ResultHasInvalidateMethod::Nonce
- class ResumeInst
- struct RetireControlUnit - This class checks on every cycle if/which instructions can be r...
- struct RetireControlUnit::RUToken
- class RetireStage
- class ReturnInst
- class ReversePostOrderFunctionAttrsPass - A pass to do RPO deduction and propagation of function attribut...
- class ReversePostOrderTraversal
- class RewriteDescriptor - The basic entity representing a rewrite operation. It serves a...
- class RewriteMapParser
- struct RewriteStatepointsForGC - A CRTP mix-in to automatically provide informational APIs neede...
- class RewriteSymbolPass - A CRTP mix-in to automatically provide informational APIs neede...
- class RootDDGNode - Subclass of DDGNode representing the root node of the graph. Th...
- struct RoundUpToPowerOfTwo - RoundUpToPowerOfTwo - This is a helper template that rounds N u...
- struct RoundUpToPowerOfTwoH - RoundUpToPowerOfTwoH - If N is not a power of two, increase it....
- struct RttiBaseClassDescriptorNode
- struct RuntimeFunction - RuntimeFunction - An entry in the table of functions with unwin...
- class RuntimeFunction - RuntimeFunction - An entry in the table of procedure data (.pda...
- class RuntimePointerChecking - Holds information about the memory runtime legality checks to v...
- struct RuntimePointerChecking::CheckingPtrGroup - A grouping of pointers. A single memcheck is required between t...
- struct RuntimePointerChecking::PointerInfo
- struct S
- class SCCPPass - This pass performs function-level constant propagation and merg...
- class SCEV - This class represents an analyzed expression in the program. T...
- class SCEVAA - Analysis pass providing a never-invalidated alias analysis resu...
- class SCEVAAResult - A simple alias analysis implementation that uses ScalarEvolutio...
- class SCEVAAWrapperPass - Legacy wrapper pass to provide the SCEVAAResult object.
- class SCEVAddExpr - This node represents an addition of some number of SCEVs.
- class SCEVAddRecExpr - This node represents a polynomial recurrence on the trip count ...
- class SCEVCastExpr - This is the base class for unary cast operator classes.
- class SCEVCommutativeExpr - This node is the base class for n'ary commutative operators.
- class SCEVConstant - This class represents a constant integer value.
- struct SCEVCouldNotCompute - An object of this class is returned by queries that could not b...
- class SCEVEqualPredicate - This class represents an assumption that two SCEV expressions a...
- class SCEVExpander - This class uses information about analyze scalars to rewrite ex...
- class SCEVExpander::SCEVInsertPointGuard
- class SCEVLoopAddRecRewriter - The SCEVLoopAddRecRewriter takes a scalar evolution expression ...
- struct SCEVMapper - This visitor recursively visits a SCEV expression and re-writes...
- class SCEVMinMaxExpr - This node is the base class min/max selections.
- class SCEVMulExpr - This node represents multiplication of some number of SCEVs.
- class SCEVNAryExpr - This node is a base class providing common functionality for n'...
- class SCEVParameterRewriter - The SCEVParameterRewriter takes a scalar evolution expression a...
- class SCEVPredicate - This class represents an assumption made using SCEV expressions...
- class SCEVRewriteVisitor - This visitor recursively visits a SCEV expression and re-writes...
- class SCEVSMaxExpr - This class represents a signed maximum selection.
- class SCEVSMinExpr - This class represents a signed minimum selection.
- class SCEVSignExtendExpr - This class represents a sign extension of a small integer value...
- class SCEVTraversal - Visit all nodes in the expression tree using worklist traversal...
- class SCEVTruncateExpr - This class represents a truncation of an integer value to a sma...
- class SCEVUDivExpr - This class represents a binary unsigned division operation.
- class SCEVUMaxExpr - This class represents an unsigned maximum selection.
- class SCEVUMinExpr - This class represents an unsigned minimum selection.
- class SCEVUnionPredicate - This class represents a composition of other SCEV predicates, a...
- class SCEVUnknown - This means that we are dealing with an entirely unknown SCEV va...
- struct SCEVVisitor - This class defines a simple visitor class that may be used for ...
- class SCEVWrapPredicate - This class represents an assumption made on an AddRec expressio...
- class SCEVZeroExtendExpr - This class represents a zero extension of a small integer value...
- class SDDbgInfo
- class SDDbgLabel - Holds the information from a dbg_label node through SDISel. We ...
- class SDDbgValue - Holds the information from a dbg_value node through SDISel. We ...
- class SDLoc
- class SDNode
- class SDNode::ConstantSDNodeBitfields
- class SDNode::LSBaseSDNodeBitfields
- class SDNode::LoadSDNodeBitfields
- class SDNode::MemSDNodeBitfields
- class SDNode::SDNodeBitfields
- class SDNode::StoreSDNodeBitfields
- class SDNode::use_iterator - This class provides iterator support for SDUse operands that us...
- struct SDNode::value_op_iterator
- struct SDNodeFlags - These are IR-level optimization flags that may be propagated to...
- class SDNodeIterator
- class SDUse - Represents a use of a SDNode. This class holds an SDValue, whic...
- struct SDVTList - This represents a list of ValueType's that has been intern'd by...
- class SDVTListNode - Node - This class is used to maintain the singly linked bucket ...
- class SDValue - Unlike LLVM values, Selection DAG nodes may return multiple val...
- class SDep - Scheduling dependency. This represents one direction of an edge...
- class SDivOperator
- struct SEHHandler
- struct SEHUnwindMapEntry - Similar to CxxUnwindMapEntry, but supports SEH filters.
- class SExtInst
- class SHA1 - A class that wrap the SHA1 algorithm.
- class SIToFPInst
- struct SLPVectorizerPass - A CRTP mix-in to automatically provide informational APIs neede...
- class SMDiagnostic - Instances of this class encapsulate one diagnostic report, allo...
- class SMFixIt - Represents a single fixit, a replacement of one range of text w...
- class SMLoc - Represents a location in source code.
- class SMRange - Represents a range in source code. SMRange is implemented using...
- class SMSchedule - This class represents the scheduled code. The main data struct...
- class SMTExpr - Generic base class for SMT exprs
- class SMTSolver - Generic base class for SMT Solvers This class is responsible fo...
- class SMTSort - Generic base class for SMT sorts
- class SROA - An optimization pass providing Scalar Replacement of Aggregates...
- class SROALegacyPass - A legacy pass for the legacy pass manager that wraps the \c SRO...
- class SSAUpdater - Helper class for SSA formation on a set of values defined in mu...
- class SSAUpdaterBulk - Helper class for SSA formation on a set of values defined in mu...
- struct SSAUpdaterBulk::RewriteInfo
- class SSAUpdaterImpl
- class SSAUpdaterImpl::BBInfo - BBInfo - Per-basic block information used internally by SSAUpda...
- class SSAUpdaterTraits::PHI_iterator
- class SSAUpdaterTraits::PHI_iterator - Iterator for PHI operands.
- class SUnit - Scheduling unit. This is a node in the scheduling DAG.
- class SUnitIterator
- class SafepointIRVerifierPass - Create an instance of the safepoint verifier pass which can be ...
- struct SalvageDebugInfoTest
- class SampleProfileLoaderPass
- class SampleProfileReader - Sample-based profile reader. Each profile contains sample count...
- class SampleProfileReaderBinary - Sample-based profile reader. Each profile contains sample count...
- class SampleProfileReaderCompactBinary - Sample-based profile reader. Each profile contains sample count...
- class SampleProfileReaderExtBinary - SampleProfileReaderExtBinaryBase/SampleProfileWriterExtBinaryBa...
- class SampleProfileReaderExtBinaryBase - SampleProfileReaderExtBinaryBase/SampleProfileWriterExtBinaryBa...
- class SampleProfileReaderGCC - Sample-based profile reader. Each profile contains sample count...
- class SampleProfileReaderItaniumRemapper - SampleProfileReaderItaniumRemapper remaps the profile data from...
- class SampleProfileReaderRawBinary - Sample-based profile reader. Each profile contains sample count...
- class SampleProfileReaderText - Sample-based profile reader. Each profile contains sample count...
- class SampleProfileSummaryBuilder
- class SampleProfileWriter - Sample-based profile writer. Base class.
- class SampleProfileWriterBinary - Sample-based profile writer (binary format).
- class SampleProfileWriterCompactBinary - Sample-based profile writer (binary format).
- class SampleProfileWriterExtBinary - Sample-based profile writer (binary format).
- class SampleProfileWriterExtBinaryBase - Sample-based profile writer (binary format).
- class SampleProfileWriterRawBinary - Sample-based profile writer (binary format).
- class SampleProfileWriterText - Sample-based profile writer (text format).
- class SampleRecord - Representation of a single sample record. A sample record is re...
- struct SampleRecord::CallTargetComparator
- class SampleSorter - Sort a LocationT->SampleT map by LocationT. It produces a sorte...
- struct SanitizerCoverageOptions
- struct SanitizerStatReport
- class SaturatingInst
- struct SaveAndRestore - A utility class that uses RAII to save and restore the value of...
- struct Scalar
- struct ScalarBitSetTraits - This class should be specialized by any integer type that is a ...
- struct ScalarEnumerationTraits - This class should be specialized by any integral type that conv...
- class ScalarEvolution - The main scalar evolution driver. Because client code (intentio...
- class ScalarEvolution::BackedgeTakenInfo - Information about the backedge-taken count of a loop. This curr...
- struct ScalarEvolution::ExitLimit - Information about the number of loop iterations for which a loo...
- class ScalarEvolution::ExitLimitCache
- struct ScalarEvolution::ExitNotTakenInfo - Information about the number of times a particular loop exit ma...
- struct ScalarEvolution::LoopProperties
- class ScalarEvolution::SCEVCallbackVH - A CallbackVH to arrange for ScalarEvolution to be notified when...
- class ScalarEvolutionAnalysis - Analysis pass that exposes the \c ScalarEvolution for a functio...
- class ScalarEvolutionPrinterPass - Printer pass for the \c ScalarEvolutionAnalysis results.
- class ScalarEvolutionVerifierPass - Verifier pass for the \c ScalarEvolutionAnalysis results.
- class ScalarEvolutionWrapperPass - FunctionPass class - This class is used to implement most globa...
- class ScalarEvolutionsTest
- class ScalarNode - A scalar node is an opaque datum that can be presented as a ser...
- struct ScalarTraits - This class should be specialized by type that requires custom c...
- class ScalarizerPass - A CRTP mix-in to automatically provide informational APIs neede...
- class ScaledNumber - Simple representation of a scaled number. ScaledNumber is a num...
- class ScaledNumberBase
- class Scanner - Scans YAML tokens from a MemoryBuffer.
- class SchedBoundary - Each Scheduling boundary is associated with ready queues. It tr...
- class SchedDFSImpl - Internal state used to compute SchedDFSResult.
- struct SchedDFSImpl::RootData
- class SchedDFSResult - Compute the values of each DAG node for various metrics during ...
- struct SchedDFSResult::Connection - Record a connection between subtrees and the connection level.
- struct SchedDFSResult::NodeData - Per-SUnit data computed during DFS for various metrics. A node'...
- struct SchedDFSResult::TreeData - Per-Subtree data computed during DFS.
- struct SchedRemainder - Summarize the unscheduled region.
- class ScheduleDAG
- class ScheduleDAGInstrs - A ScheduleDAG for scheduling lists of MachineInstr.
- class ScheduleDAGInstrs::Value2SUsMap - A map from ValueType to SUList, used during DAG construction, a...
- class ScheduleDAGMI - ScheduleDAGMI is an implementation of ScheduleDAGInstrs that si...
- class ScheduleDAGMILive - ScheduleDAGMILive is an implementation of ScheduleDAGInstrs tha...
- class ScheduleDAGMutation - Mutate the DAG as a postpass after normal DAG building.
- class ScheduleDAGSDNodes - ScheduleDAGSDNodes - A ScheduleDAG for scheduling SDNode-based ...
- class ScheduleDAGSDNodes::RegDefIter - RegDefIter - In place iteration over the values defined by an S...
- class ScheduleDAGTopologicalSort - This class can compute a topological ordering for SUnits and pr...
- struct ScheduleDataCompare
- class ScheduleHazardRecognizer - HazardRecognizer - This determines whether or not an instructio...
- class Scheduler - Class Scheduler is responsible for issuing instructions to pipe...
- class SchedulerStrategy
- class SchedulingPriorityQueue - This interface is used to plug different priorities computation...
- class ScopeEndSym
- struct ScopedFatalErrorHandler - ScopedFatalErrorHandler - This is a simple helper class which j...
- class ScopedHashTable
- class ScopedHashTableIterator
- class ScopedHashTableScope
- class ScopedHashTableVal
- class ScopedNoAliasAA - Analysis pass providing a never-invalidated alias analysis resu...
- class ScopedNoAliasAAResult - A simple AA result which uses scoped-noalias metadata to answer...
- class ScopedNoAliasAAWrapperPass - Legacy wrapper pass to provide the ScopedNoAliasAAResult object.
- class ScopedPrinter
- class ScoreboardHazardRecognizer - HazardRecognizer - This determines whether or not an instructio...
- class ScoreboardHazardRecognizer::Scoreboard
- struct SecHdrTableEntry
- class SectionKind - SectionKind - This is a simple POD value that classifies the pr...
- struct SectionName
- class SectionSym
- class SelectConstantExpr - SelectConstantExpr - This class is private to Constants.cpp, an...
- class SelectInst
- struct SelectPattern
- struct SelectPatternResult
- class SelectionDAG
- struct SelectionDAG::CallSiteDbgInfo
- struct SelectionDAG::DAGNodeDeletedListener
- struct SelectionDAG::DAGUpdateListener - Clients of various APIs that cause global effects on the DAG ca...
- class SelectionDAGBuilder - SelectionDAGBuilder - This is the common target-independent low...
- class SelectionDAGBuilder::DanglingDebugInfo - Helper type for DanglingDebugInfoMap.
- class SelectionDAGBuilder::SDAGSwitchLowering
- class SelectionDAGBuilder::StackProtectorDescriptor - A class which encapsulates all of the information needed to gen...
- struct SelectionDAGBuilder::StatepointLoweringInfo - Describes a gc.statepoint or a gc.statepoint like thing for the...
- class SelectionDAGISel - SelectionDAGISel - This is the common base class used for Selec...
- class SelectionDAGTargetInfo - Targets can subclass this to parameterize the SelectionDAG lowe...
- struct SemiNCAInfo
- struct SemiNCAInfo::BatchUpdateInfo
- struct SemiNCAInfo::BlockNamePrinter
- struct SemiNCAInfo::ChildrenGetter
- struct SemiNCAInfo::InfoRec
- struct SemiNCAInfo::InsertionInfo
- struct Seq
- struct SequenceElementTraits - This class should be specialized by any type for which vectors ...
- class SequenceNode - Represents a YAML sequence created from either a block sequence...
- struct SequenceTraits - This class should be specialized by any type that needs to be c...
- struct SequenceTraitsImpl
- class SequentialType - This is the superclass of the array and vector type classes. Bo...
- class SetTheory
- class SetTheory::Expander - Expander - A callback function that can transform a Record repr...
- class SetTheory::Operator - Operator - A callback representing a DAG operator.
- class SetVector - A vector that has set insertion semantics. This adapter class p...
- class SetVector::TestAndEraseFromSet - A wrapper predicate designed for use with std::remove_if. This ...
- class ShadowResolver - Delegate resolving to a sub-resolver, but shadow some variable ...
- struct Shape
- struct Shape::RetconLoweringStorage
- struct Shape::SwitchFieldIndex
- struct Shape::SwitchLoweringStorage
- class ShlOperator
- class ShuffleVectorConstantExpr - ShuffleVectorConstantExpr - This class is private to Constants....
- class ShuffleVectorInst
- class ShuffleVectorSDNode
- class SignpostEmitter - Manages the emission of signposts into the recording method sup...
- struct Signum_match
- class SimpleBitstreamCursor - This represents a position within a bitstream. There may be mul...
- class SimpleDDGNode - Subclass of DDGNode representing single or multi-instruction no...
- class SimpleLoopSafetyInfo - Simple and conservative implementation of LoopSafetyInfo that c...
- class SimpleLoopUnswitchPass - This pass transforms loops that contain branches or switches on...
- struct SimpleMap
- class SimpleRegistryEntry - A simple registry entry which provides only a name, description...
- class SimpleTypeSerializer
- struct SimplifyAction
- struct SimplifyCFGOptions - A set of parameters used to control the transforms in the Simpl...
- class SimplifyCFGPass - A pass to simplify and canonicalize the CFG of a function. This...
- struct SimplifyQuery
- struct SinkAndHoistLICMFlags
- class SinkingPass - Move instructions into successor blocks when possible.
- class SizeofParamPackExpr
- union SizerImpl
- struct SledEntry - Represents an XRay instrumentation sled entry from an object fi...
- class SlotIndex - SlotIndex - An opaque wrapper around machine indexes.
- class SlotIndexes - SlotIndexes pass. This pass assigns indexes to each instruction.
- struct SlotMapping - This struct contains the mappings from the slot numbers to unna...
- class SlotTracker - This class provides computation of slot numbers for LLVM Assemb...
- class SmallBitVector - This is a 'bitvector' (really, a variable-sized bit array), opt...
- class SmallBitVector::reference
- class SmallDenseMap
- struct SmallDenseMap::LargeRep
- class SmallDenseSet - Implements a dense probed hash-table based set with some number...
- struct SmallMapVector - A MapVector that performs no allocations if smaller than a cert...
- class SmallPriorityWorklist - A version of \c PriorityWorklist that selects small size optimi...
- class SmallPtrSet - SmallPtrSet - This class implements a set which is optimized fo...
- class SmallPtrSetImpl - A templated base class for \c SmallPtrSet which provides the ty...
- class SmallPtrSetImplBase - SmallPtrSetImplBase - This is the common code shared among all ...
- class SmallPtrSetIterator - SmallPtrSetIterator - This implements a const_iterator for Smal...
- class SmallPtrSetIteratorImpl - SmallPtrSetIteratorImpl - This is the common base class shared ...
- class SmallSet
- class SmallSetIterator - SmallSetIterator - This class implements a const_iterator for S...
- class SmallSetVector - A SetVector that performs no allocations if smaller than a cert...
- class SmallString - SmallString - A SmallString is just a SmallVector with methods ...
- class SmallVector - This is a 'vector' (really, a variable-sized array), optimized ...
- struct SmallVectorAlignmentAndSize - Figure out the offset of the first element.
- class SmallVectorBase - This is all the non-templated stuff common to all SmallVectors.
- class SmallVectorImpl - This class consists of common code factored out of the SmallVec...
- class SmallVectorMemoryBuffer - SmallVector-backed MemoryBuffer instance. This class enables ef...
- struct SmallVectorStorage - Storage for the SmallVector elements. This is specialized for ...
- class SmallVectorTemplateBase - SmallVectorTemplateBase <TriviallyCopyable = false> - This is w...
- class SmallVectorTemplateCommon - This is the part of SmallVectorTemplateBase which does not depe...
- class SmartMutex - SmartMutex - A mutex with a compile time constant parameter tha...
- class SmartRWMutex - SmartMutex - An R/W mutex with a compile time constant paramete...
- class SoftInstrProfErrors
- class Solution - Represents a solution to a PBQP problem. To get the selection f...
- struct SourceLocation
- class SourceMgr
- class SourceMgr - This owns the files read by a parser, handles include stacks, a...
- struct SourceMgr::SrcBuffer
- class SourcePred - A matcher/generator for finding suitable values for the next so...
- class SparseBitVector
- class SparseBitVector::SparseBitVectorIterator
- struct SparseBitVectorElement - SparseBitVector is an implementation of a bitvector that is spa...
- class SparseMultiSet - Fast multiset implementation for objects that can be identified...
- struct SparseMultiSet::SMSNode - The actual data that's stored, as a doubly-linked list implemen...
- class SparseMultiSet::iterator_base - Our iterators are iterators over the collection of objects that...
- class SparseSet - SparseSet - Fast set implmentation for objects that can be iden...
- struct SparseSetValFunctor - SparseSetValFunctor - Helper class for selecting SparseSetValTr...
- struct SparseSetValTraits - SparseSetValTraits - Objects in a SparseSet are identified by k...
- class SparseSolver - SparseSolver - This class is a general purpose solver for Spars...
- class SpecialCaseList
- class SpecialCaseList::Matcher - Represents a set of regular expressions. Regular expressions w...
- struct SpecialCaseList::Section
- class SpecialName
- class SpecialSubstitution
- struct SpecialTableSymbolNode
- class SpecificBumpPtrAllocator - A BumpPtrAllocator that allows only elements of a specific type...
- struct SpecificNodeAccess
- struct SpeculateAroundPHIsPass - This pass handles simple speculating of instructions around PH...
- class SpeculativeExecutionPass - A CRTP mix-in to automatically provide informational APIs neede...
- class SpillPlacement - MachineFunctionPass - This class adapts the FunctionPass interf...
- struct SpillPlacement::BlockConstraint - BlockConstraint - Entry and exit constraints for a basic block.
- struct SpillPlacement::Node - Node - Each edge bundle corresponds to a Hopfield node. The nod...
- class Spiller - Spiller interface. Implementations are utility classes which in...
- class SplitAnalysis - SplitAnalysis - Analyze a LiveInterval, looking for live range ...
- struct SplitAnalysis::BlockInfo - Additional information about basic blocks where the current var...
- class SplitEditor - SplitEditor - Edit machine code and LiveIntervals for live rang...
- struct SplitOffsets
- class SrcOp
- class SrcValueSDNode
- class StackColoring - Compute live ranges of allocas. Live ranges are represented as ...
- struct StackColoring::BlockLifetimeInfo - A class representing liveness information for a single basic bl...
- struct StackColoring::LiveRange - This class represents a set of interesting instructions where a...
- struct StackColoring::Marker
- class StackLayout - Compute the layout of an unsafe stack frame.
- struct StackLayout::StackObject
- struct StackLayout::StackRegion
- class StackMapOpers - MI-level stackmap operands. MI stackmap operations take the for...
- class StackMaps
- struct StackMaps::CallsiteInfo
- struct StackMaps::FunctionInfo
- struct StackMaps::LiveOutReg
- struct StackMaps::Location
- class StackProtector - FunctionPass class - This class is used to implement most globa...
- class StackSafetyAnalysis - StackSafetyInfo wrapper for the new pass manager.
- class StackSafetyGlobalAnalysis - This pass performs the global (interprocedural) stack safety an...
- class StackSafetyGlobalInfoWrapperPass - This pass performs the global (interprocedural) stack safety an...
- class StackSafetyGlobalPrinterPass - Printer pass for the \c StackSafetyGlobalAnalysis results.
- class StackSafetyInfo - Interface to access stack safety analysis results for single fu...
- struct StackSafetyInfo::FunctionInfo - Describes uses of allocas and parameters inside of a single fun...
- class StackSafetyInfoWrapperPass - StackSafetyInfo wrapper for the legacy pass manager
- class StackSafetyPrinterPass - Printer pass for the \c StackSafetyAnalysis results.
- class Stage
- class StandardInstrumentations - This class provides an interface to register all the standard p...
- struct StateWrapper - Helper to tie a abstract state implementation to an abstract at...
- class Statepoint - A specialization of it's base class for read-write access to a ...
- class StatepointBase - A wrapper around a GC intrinsic call, this provides most of the...
- struct StatepointDirectives - Call sites that get wrapped by a gc.statepoint (currently only ...
- class StatepointLoweringState - This class tracks both per-statepoint and per-selectiondag info...
- class StatepointOpers - MI-level Statepoint operands Statepoint operands take the form:...
- class StaticDataMemberRecord
- class StatisticBase
- class Status - The result of a \p status operation.
- struct StdMapStringCustomMappingTraitsImpl - Implementation of CustomMappingTraits for std::map <std ::strin...
- struct StdQualifiedName
- struct StorageUnionT::OutOfLineStorageT
- class StoreExpression
- class StoreInfo
- class StoreInst
- class StoreSDNode
- struct StrOffsetsContributionDescriptor - Represents base address of the CU. Represents a unit's contribu...
- struct StratifiedInfo - NOTE: ^ This can't be a short -- bootstrapping clang has a case...
- struct StratifiedLink - A "link" between two StratifiedSets.
- class StratifiedSets - These are stratified sets, as described in "Fast algorithms for...
- class StratifiedSetsBuilder - Generic Builder class that produces StratifiedSets instances. T...
- struct StratifiedSetsBuilder::BuilderLink - Represents a Stratified Set, with information about the Stratif...
- class Stream - This class represents a YAML stream potentially containing mult...
- class StringAttributeImpl - This class represents a single, uniqued attribute. That attribu...
- struct StringBlockVal - Helper struct for multiline string block literals. Use this typ...
- class StringError - This class wraps a string in an Error. StringError is useful in...
- class StringIdRecord
- class StringInit - "foo" - Represent an initialization by a string value.
- class StringListRecord
- class StringLiteral - A wrapper around a string literal that serves as a proxy for co...
- class StringLiteral
- class StringMap - StringMap - This is an unconventional map that is specialized f...
- class StringMapConstIterator
- class StringMapEntry - StringMapEntry - This is used to represent one value that is in...
- class StringMapEntryBase - StringMapEntryBase - Shared base class of StringMapEntry instan...
- class StringMapEntryStorage - StringMapEntryStorage - Holds the value in a StringMapEntry. Fa...
- class StringMapImpl - StringMapImpl - This is the base class of StringMap that is sha...
- class StringMapIterBase
- class StringMapIterator
- class StringMapKeyIterator
- class StringMatcher - Given a list of strings and code to execute when they match, ou...
- class StringPool - StringPool - An interned string pool. Use the intern method to ...
- struct StringPool::PooledString - PooledString - This is the value of an entry in the pool's inte...
- class StringRecTy - 'string' - Represent an string value
- class StringRef - StringRef - Represent a constant reference to a string, i.e. a ...
- class StringSaver - Saves strings in the provided stable storage and returns a Stri...
- class StringSet - StringSet - A wrapper for StringMap that provides set-like func...
- class StringSubstitution - Class representing a substitution to perform in the RegExStr st...
- class StringSwitch - A switch()-like statement whose cases are string literals. The ...
- struct StringTable - String tables in GSYM files are required to start with an empty...
- struct StringTable - The string table used for serializing remarks. This table can b...
- class StringTableBuilder - Utility for building string tables with deduplicated suffixes.
- class StringToOffsetTable - StringToOffsetTable - This class uniques a bunch of nul-termina...
- struct StringTypes
- struct StringValue - A wrapper around std::string which contains a source range that...
- class StringView
- class StringsAndChecksums
- class StringsAndChecksumsRef
- struct StripDeadPrototypesPass - Pass to remove unused function declarations.
- class StrongType - Helper for making strong types.
- class StructLayout - Used to lazily calculate structure layout information for a tar...
- class StructType - Class to represent struct types. There are two different kinds ...
- struct StructTypeKeyInfo::KeyTy
- struct StructorIdentifierNode
- class StructuredBindingName
- struct SubClassReference
- class SubCommand
- struct SubMultiClassReference
- class SubOperator
- class Substitution - Class representing a substitution to perform in the RegExStr st...
- class SubsumingPositionIterator - A visitor class for IR positions. Given a position P, the Subsu...
- struct SubtargetFeatureKV - Used to provide key value pairs for feature and CPU bit flags.
- class SubtargetFeatures - Manages the enabling and disabling of subtarget specific featur...
- struct SubtargetSubTypeKV - Used to provide key value pairs for feature and CPU bit flags.
- class SuccIterator
- class SuccIterator::SuccessorProxy - Proxy object to allow write access in operator[]
- struct Summary
- struct Summary::Entry
- struct SuperBlock
- class SuperRegClassIterator
- class SwapAndRestore
- class SwiftErrorValueTracking
- class SwingSchedulerDAG - This class builds the dependence graph for the instructions in ...
- class SwingSchedulerDAG::Circuits - Helper class to implement Johnson's circuit finding algorithm.
- struct SwingSchedulerDAG::CopyToPhiMutation - Mutate the DAG as a postpass after normal DAG building.
- struct SwingSchedulerDAG::NodeInfo
- class SwitchInst
- class SwitchInst::CaseHandle
- class SwitchInst::CaseHandleImpl - A handle to a particular switch case. It exposes a convenient i...
- class SwitchInst::CaseIteratorImpl
- class SwitchInstProfUpdateWrapper
- class SwitchLowering
- struct SwitchWorkListItem
- struct SymInfo - SymInfo contains information about symbol: it's address and sec...
- class Symbol
- struct SymbolCU - Helper used to pair up a symbol and its DWARF compile unit.
- class SymbolDeserializer
- struct SymbolDeserializer::MappingInfo
- class SymbolDumpDelegate
- struct SymbolNode
- class SymbolRecord
- class SymbolRecordMapping
- class SymbolRemappingParseError - Base class for user error types. Users should declare their err...
- class SymbolRemappingReader - Reader for symbol remapping files. Remaps the symbol names in p...
- struct SymbolResolution - The resolution for a symbol. The linker must provide a SymbolRe...
- class SymbolSerializer
- class SymbolTableList - List that automatically updates parent links and symbol tables....
- struct SymbolTableListParentType - Template metafunction to get the parent type for a symbol table...
- class SymbolTableListTraits
- class SymbolVisitorCallbackPipeline
- class SymbolVisitorCallbacks
- class SymbolVisitorDelegate
- class SymbolizableModule
- class SymbolizableObjectFile
- struct SymbolizableObjectFile::SymbolDesc
- struct SymbolsMapKey
- class SyncDependenceAnalysis - Relates points of divergent control to join points in reducible...
- class SyntheticCountsPropagation - A CRTP mix-in to automatically provide informational APIs neede...
- class SyntheticCountsUtils - Class with methods to propagate synthetic entry counts. This cl...
- class SyntheticTemplateParamName - An invented name for a template parameter for which we don't ha...
- class TBAAVerifier - Verify that the TBAA Metadatas are valid.
- class TGLexer - TGLexer - TableGen Lexer class.
- struct TGLexer::PreprocessorControlDesc
- class TGLocalVarScope
- class TGParser
- class TSCWrapRecord
- class TagRecord
- struct TagTypeNode
- struct TaggedScalarTraits - This class should be specialized by type that requires custom c...
- struct TailCallElimPass - A CRTP mix-in to automatically provide informational APIs neede...
- class TailDuplicator - Utility class to perform tail duplication.
- class TarWriter
- class Target - Target - Wrapper for Target specific information. For registrat...
- class Target
- class TargetFolder - TargetFolder - Create constants with target dependent folding.
- class TargetFrameLowering - Information about stack frame layout on the target. It holds t...
- struct TargetFrameLowering::SpillSlot
- class TargetIRAnalysis - Analysis pass providing the \c TargetTransformInfo. The core id...
- struct TargetIndexLocation - This struct describes target specific location.
- class TargetIndexSDNode
- class TargetInstrInfo
- struct TargetInstrInfo::MachineBranchPredicate
- class TargetInstrInfo::PipelinerLoopInfo - Object returned by analyzeLoopForPipelining. Allows software pi...
- struct TargetInstrInfo::RegSubRegPair - A pair composed of a register and a sub-register index. Used to...
- struct TargetInstrInfo::RegSubRegPairAndIdx - A pair composed of a pair of a register and a sub-register inde...
- class TargetLibraryAnalysis - Analysis pass providing the \c TargetLibraryInfo. Note that thi...
- class TargetLibraryInfo - Provides information about what library functions are available...
- class TargetLibraryInfoImpl - Implementation of the target library information. This class co...
- class TargetLibraryInfoWrapperPass - ImmutablePass class - This class is used to provide information...
- class TargetLowering
- struct TargetLowering::AsmOperandInfo
- struct TargetLowering::CallLoweringInfo
- struct TargetLowering::DAGCombinerInfo
- struct TargetLowering::MakeLibCallOptions
- struct TargetLowering::TargetLoweringOpt - A convenience struct that encapsulates a DAG, and two SDValues ...
- class TargetLoweringBase
- struct TargetLoweringBase::AddrMode - This represents an addressing mode of: BaseGV + BaseOffs + Base...
- class TargetLoweringBase::ArgListEntry
- struct TargetLoweringBase::IntrinsicInfo
- class TargetLoweringBase::ValueTypeActionImpl
- class TargetLoweringObjectFileCOFF
- class TargetLoweringObjectFileELF
- class TargetLoweringObjectFileMachO
- class TargetLoweringObjectFileWasm
- class TargetLoweringObjectFileXCOFF
- struct TargetMachineBuilder - Helper to gather options relevant to the target machine creation
- class TargetPassConfig - Target-Independent Code Generator Pass Configuration Options. T...
- class TargetRegisterClass
- class TargetRegisterInfo
- struct TargetRegisterInfo::RegClassInfo
- struct TargetRegisterInfoDesc - Extra information, not in MCRegisterDesc, about registers. Thes...
- struct TargetRegistry - TargetRegistry - Generic interface to target specific features.
- class TargetRegistry::iterator
- class TargetSchedModel - Provide an instruction scheduling machine model to CodeGen pass...
- class TargetSubtargetInfo - TargetSubtargetInfo - Generic base class for all target subtarg...
- class TargetTransformInfo - This pass provides access to the codegen interfaces that are ne...
- class TargetTransformInfo::Concept - The abstract base class used to type erase specific TTI impleme...
- struct TargetTransformInfo::LSRCost
- struct TargetTransformInfo::MemCmpExpansionOptions - Returns options for expansion of memcmp. IsZeroCmp is
- class TargetTransformInfo::Model - The template model for the base class which wraps a concrete im...
- struct TargetTransformInfo::ReductionFlags - Flags describing the kind of vector reduction.
- struct TargetTransformInfo::UnrollingPreferences - Parameters that control the generic loop unrolling transformati...
- class TargetTransformInfoImplBase - Base class for use as a mix-in that aids implementing a TargetT...
- class TargetTransformInfoImplCRTPBase - CRTP base class for use as a mix-in that aids implementing a Ta...
- class TargetTransformInfoWrapperPass - Wrapper pass for TargetTransformInfo. This pass can be construc...
- class TaskGroup
- class TaskQueue - TaskQueue executes serialized work on a user-defined Thread Poo...
- struct TaskQueue::Task
- class TaskQueueTest
- class TempFile - Represents a temporary file. The temporary file must be eventua...
- struct TempMDNodeDeleter
- class TemplateArgs
- class TemplateArgumentPack - A variadic template argument. This node represents an occurrenc...
- class TemplateParamPackDecl - A template parameter pack declaration, 'typename ...T'.
- struct TemplateParameterReferenceNode
- class TemplateTemplateParamDecl - A template template parameter declaration, 'template <typename ...
- class TernOpInit - !op (X, Y, Z) - Combine two inits.
- struct TestCase
- struct TestCase
- class TestComparator - A class for testing the FunctionComparator API. The main purpos...
- struct TestFunction - Generates a simple test function.
- struct TestListCompleter
- struct TestModulePass - A CRTP mix-in to automatically provide informational APIs neede...
- struct TestParser
- struct TextAPIContext
- class TextAPIReader
- class TextAPIWriter
- class TextInstrProfReader - Reader for the simple text based instrprof format. This format ...
- class ThinBackendProc - This class defines the interface to the ThinLTO backend.
- class ThinLTOBitcodeWriterPass - A CRTP mix-in to automatically provide informational APIs neede...
- class ThinLTOCodeGenerator - This class define an interface similar to the LTOCodeGenerator,...
- struct ThinLTOCodeGenerator::CachingOptions - These entry points control the ThinLTO cache. The cache is inte...
- class ThreadLocal - ThreadLocal - A class used to abstract thread-local storage. I...
- class ThreadLocalDataSym
- class ThreadLocalImpl
- class ThreadPool - A ThreadPool for asynchronous parallel execution on a defined n...
- class ThreadPoolTest
- class ThreadSafeRefCountedBase - A thread-safe version of \c RefCountedBase.
- struct ThreadSanitizerPass - A function pass for tsan instrumentation. Instruments functions...
- struct ThreeOps_match - Matches instructions with Opcode and three operands.
- class ThrowExpr
- class Thunk32Sym
- struct ThunkSignatureNode
- struct ThunkSignatureNode::ThisAdjustor
- struct TiReference
- class TimePassesHandler - This class implements -time-passes functionality for new pass m...
- class TimeRecord
- class TimeRegion - The TimeRegion class is used as a helper class to call the star...
- struct TimeTraceProfiler
- struct TimeTraceScope - The TimeTraceScope is a helper class to call the begin and end ...
- class Timer - This class is used to track the amount of time spent between in...
- class TimerGroup - The TimerGroup class is used to group together related timers i...
- struct TimerGroup::PrintRecord
- class TinyPtrVector - TinyPtrVector - This class is specialized for cases where there...
- struct Token - Token - A single YAML token.
- class ToolOutputFile - This class contains a raw_fd_ostream and adds a few extra featu...
- class ToolOutputFile::CleanupInstaller - This class is declared before the raw_fd_ostream so that it is ...
- struct TopDownPtrState - This class summarizes several per-pointer runtime properties wh...
- class Trace - A Trace object represents the records that have been loaded fro...
- class Trace
- class TraceExpander
- class TrackUnresolvedResolver - (Optionally) delegate resolving to a sub-resolver, and keep tra...
- class TrackingMDRef - Tracking metadata reference. This class behaves like \a Trackin...
- class TrackingStatistic
- class TrackingVH
- class TrailingObjects - See the file comment for details on the usage of the TrailingOb...
- struct TrailingObjects::FixedSizeStorage - A type where its ::with_counts template member has a ::type mem...
- class TrailingObjects::FixedSizeStorageOwner - A type that acts as the owner for an object placed into fixed s...
- class TrailingObjects::Foo
- class TrailingObjectsAligner
- class TrailingObjectsBase - The base class for TrailingObjects* classes.
- struct TrailingObjectsBase::OverloadToken - OverloadToken's purpose is to allow specifying function overloa...
- class TrailingObjectsImpl
- struct TrailingObjectsImpl::RequiresRealignment
- struct TrailingZerosCounter
- class TrampolineSym
- class TrigramIndex
- class Triple - Triple - Helper class for working with autoconf configuration n...
- class TruncInst
- class TruncInstCombine
- struct TruncInstCombine::Info - Information per each instruction in the expression dag.
- class Twine - Twine - A lightweight data structure for efficiently representi...
- union Twine::Child
- struct TwoOps_match - Matches instructions with Opcode and three operands.
- class Type - The instances of the Type class are immutable: once they are cr...
- class TypeAttributeImpl - A set of classes that contain the value of the attribute object...
- class TypeBasedAA - Analysis pass providing a never-invalidated alias analysis resu...
- class TypeBasedAAResult - A simple AA result that uses TBAA metadata to answer queries.
- class TypeBasedAAWrapperPass - Legacy wrapper pass to provide the TypeBasedAAResult object.
- class TypeCollection
- struct TypeConversionCostTblEntry - Type Conversion Cost Table
- class TypeDeserializer
- struct TypeDeserializer::MappingInfo
- class TypeDumpVisitor - Dumper for CodeView type streams found in COFF object files and...
- class TypeFinder - TypeFinder - Walk over a module, identifying all of the types t...
- struct TypeIdOffsetVtableInfo - The following data structures summarize type metadata informati...
- struct TypeIdSummary
- class TypeIndex - A 32-bit type reference. Types are indexed by their order of ap...
- class TypeIndexIteratorTest
- struct TypeIndexOffset
- struct TypeMap
- struct TypeMemberInfo
- struct TypeNode
- struct TypePairAndMemDesc
- class TypeRecord
- class TypeRecordMapping
- class TypeServer2Record
- class TypeSize
- class TypeTableCollection
- class TypeTemplateParamDecl - A template type parameter declaration, 'typename T'.
- struct TypeTestResolution
- class TypeVisitorCallbackPipeline
- class TypeVisitorCallbacks
- class TypedEventRecord
- class TypedInit - This is the common super-class of types that have a specific, e...
- class TypedMDOperandIterator - Typed iterator through MDNode operands. An iterator that transf...
- class TypedTrackingMDRef - Typed tracking ref. Track refererences of a particular type. I...
- struct UAddWithOverflow_match
- class UDTSym
- class UDivOperator
- class UIToFPInst
- class UUIDOfExpr
- class UdtModSourceLineRecord
- class UdtSourceLineRecord
- struct Uint24 - An auxiliary type to facilitate extraction of 3-byte entities.
- class UnOpInit - !op (X) - Transform an init.
- class UnaryConstantExpr - UnaryConstantExpr - This class is private to Constants.cpp, and...
- class UnaryInstruction
- struct UnaryOp_match
- class UnaryOperator
- class UndefValue - 'undef' values are things that do not have specified contents. ...
- class UndefVarError - Class to represent an undefined variable error, which quotes th...
- struct UnderlyingObject - PointerIntPair - This class implements a pair of a pointer and ...
- struct UnicodeCharRange - Represents a closed range of Unicode code points [Lower, Upper].
- class UnicodeCharSet - Holds a reference to an ordered array of UnicodeCharRange and a...
- struct UnifyFunctionExitNodes - FunctionPass class - This class is used to implement most globa...
- struct UnionRecord
- class UniqueID
- class UniqueMachineInstr - A class that wraps MachineInstrs and derives from FoldingSetNod...
- class UniqueStringSaver - Saves strings in the provided stable storage and returns a Stri...
- struct UniqueTag - It's very easy to introduce bugs by passing the wrong string po...
- class UniqueVector - UniqueVector - This class produces a sequential ID number (base...
- class UnknownExpression
- class UnnamedTypeName
- class UnreachableBlockElimPass - A CRTP mix-in to automatically provide informational APIs neede...
- class UnreachableInst
- struct UnrollLoopOptions
- class UnrolledInstAnalyzer
- struct UnrolledInstAnalyzer::SimplifiedAddress
- class UnsetInit - '?' - Represents an uninitialized value
- struct UnsignedValue - A wrapper around unsigned which contains a source range that's ...
- union UnwindCode - UnwindCode - This union describes a single operation in a funct...
- class UnwindEmitter
- class UnwindEmitter
- struct UnwindInfo - UnwindInfo - An entry in the exception table.
- class Update
- class Use
- struct Use::PrevPointerTraits - Pointer traits for the Prev PointerIntPair. This ensures we alw...
- struct Use::UserRefPointerTraits - Pointer traits for the UserRef PointerIntPair. This ensures we ...
- struct UseListOrder - Structure to hold a use-list order.
- class User - LLVM Value Representation This is a very important LLVM class. ...
- struct User::const_value_op_iterator
- struct User::value_op_iterator
- class UsingNamespaceSym
- struct UstarHeader
- class VAArgInst
- class VACopyInst
- class VAEndInst
- class VAStartInst
- class VFABIAttrTest
- struct VFInfo - Holds the VFShape for a specific scalar to vector function mapp...
- struct VFParameter - Encapsulates information needed to describe a parameter. The de...
- class VFPtrRecord
- struct VFRange - A range of powers-of-2 vectorization factors with fixed start a...
- class VFSFromYAMLTest
- class VFSFromYamlDirIterImpl - An interface for virtual file systems to provide an iterator ov...
- struct VFShape - Contains the information about the kind of vectorization availa...
- class VFShapeAPITest - ///////////////////////////////////////////////////////////////...
- class VFTableRecord
- class VFTableShapeRecord
- class VLIWPacketizerList
- struct VLOperands::OperandData - For each operand we need (i) the value, and (ii) the opcode tha...
- class VNInfo - VNInfo - Value Number Information. This class holds information...
- class VPBasicBlock - VPBasicBlock serves as the leaf of the Hierarchical Control-Flo...
- class VPBlendRecipe - A recipe for vectorizing a phi-node as a sequence of mask-based...
- class VPBlockBase - VPBlockBase is the building block of the Hierarchical Control-F...
- class VPBlockUtils - Class that provides utilities for VPBlockBases in VPlan.
- class VPBranchOnMaskRecipe - A recipe for generating conditional branches on the bits of a m...
- class VPBuilder - VPlan-based builder utility analogous to IRBuilder.
- class VPBuilder::InsertPointGuard - RAII object that stores the current insertion point and restore...
- class VPBuilder::VPInsertPoint - InsertPoint - A saved insertion point.
- struct VPCallback - This class is used to enable the VPlan to invoke a method of IL...
- class VPInstruction - This is a concrete Recipe that models a single VPlan-level inst...
- class VPInterleaveRecipe - VPInterleaveRecipe is a recipe for transforming an interleave g...
- class VPInterleavedAccessInfo
- struct VPIteration - VPIteration represents a single point in the iteration space of...
- class VPLoop - Hold analysis information for every loop detected by VPLoopInfo...
- class VPPredInstPHIRecipe - VPPredInstPHIRecipe is a recipe for generating the phi nodes ne...
- class VPRecipeBase - VPRecipeBase is a base class modeling a sequence of one or more...
- class VPRecipeBuilder - Helper class to create VPRecipies from IR instructions.
- class VPRegionBlock - VPRegionBlock represents a collection of VPBasicBlocks and VPRe...
- class VPReplicateRecipe - VPReplicateRecipe replicates a given instruction producing mult...
- struct VPTransformState - VPTransformState holds information passed down when "executing"...
- struct VPTransformState::CFGState - Hold state information used when constructing the CFG of the ou...
- struct VPTransformState::DataState
- class VPUser - This class augments VPValue with operands which provide the inv...
- class VPValue
- class VPWidenGEPRecipe - A recipe for handling GEP instructions.
- class VPWidenIntOrFpInductionRecipe - A recipe for handling phi nodes of integer and floating-point i...
- class VPWidenMemoryInstructionRecipe - A Recipe for widening load/store operations. TODO: We currently...
- class VPWidenPHIRecipe - A recipe for handling all phi nodes except for integer and FP i...
- class VPWidenRecipe - VPWidenRecipe is a recipe for producing a copy of vector type f...
- class VPlan - VPlan models a candidate for vectorization, encoding various de...
- class VPlanHCFGBuilder - Main class to build the VPlan H-CFG for an incoming IR.
- struct VPlanIngredient
- class VPlanPredicator
- class VPlanPrinter - VPlanPrinter prints a given VPlan to a given output stream. The...
- class VPlanSlp - Class that maps (parts of) an existing VPlan to trees of combin...
- struct VPlanSlp::BundleDenseMapInfo - A DenseMapInfo implementation for using SmallVector <VPValue *,...
- class VPlanTestBase - Helper class to create a module from an assembly string and VPl...
- class VPlanTransforms
- class VPlanVerifier - Class with utility functions that can be used to check the cons...
- struct VReg2SUnit - An individual mapping from virtual register number to SUnit.
- struct VReg2SUnitOperIdx - Mapping from virtual register to SUnit including an operand ind...
- struct VRegInfo
- class VRegRenamer - VRegRenamer - This class is used for renaming vregs in a machin...
- class VRegRenamer::NamedVReg
- class VTSDNode
- struct VTableBits
- struct VTableSlotSummary
- struct ValID - ValID - Represents a reference of a definition of some sort wit...
- class Value - A Value is an JSON value of unknown type. They can be copied, b...
- class Value - LLVM Value Representation This is a very important LLVM class. ...
- class Value::use_iterator_impl
- class Value::user_iterator_impl
- struct ValueAndVReg - Simple struct used to hold a constant integer value and a virtu...
- class ValueAsMetadata
- struct ValueContext
- struct ValueDFS
- struct ValueDFS_Compare
- struct ValueDeleter
- struct ValueEntry
- class ValueEnumerator
- struct ValueEnumerator::MDIndex - Index of information about a piece of metadata.
- struct ValueEnumerator::MDRange - Range of metadata IDs, as a half-open range.
- class ValueHandleBase
- struct ValueInfo - Struct that holds a reference to a particular GUID in a global ...
- class ValueIsMatcher
- class ValueIsMatcher::Impl
- class ValueLatticeElement
- class ValueMap
- class ValueMapCallbackVH
- struct ValueMapConfig - This class defines the default behavior for configurable aspect...
- struct ValueMapConfig::ExtraData
- class ValueMapConstIterator
- struct ValueMapConstIterator::ValueTypeProxy
- class ValueMapIterator
- struct ValueMapIterator::ValueTypeProxy
- class ValueMapTypeRemapper - This is a class that can be implemented by clients to remap typ...
- class ValueMapper - Context for (re-)mapping values (and metadata). A shared contex...
- class ValueMatchesMono
- class ValueMatchesPoly
- class ValueMaterializer - This is a class that can be implemented by clients to materiali...
- class ValuePool
- class ValuePool::PoolEntry
- class ValuePool::PoolEntryDSInfo
- struct ValueProfData - Per-function header/control data structure for value profiling ...
- struct ValueProfRecord - This is the header of the data structure that defines the on-di...
- struct ValueProfRecordClosure
- class ValueProfileCollector - Utility analysis that determines what values are worth profilin...
- struct ValueProfileCollector::CandidateInfo
- class ValueProfileCollector::ValueProfileCollectorImpl - ValueProfileCollectorImpl inherits the API of PluginChainFinal.
- class ValueSymbolTable - This class provides a symbol table of name/value pairs. It is e...
- class ValuesClass
- class VarBitInit - Opcode{0} - Represent access to one bit of a variable or field.
- class VarDefInit - classname <targs ...> - Represent an uninstantiated anonymous c...
- class VarInit - 'Opcode' - Represent a reference to an entire variable object.
- class VarListElementInit - List[4] - Represent access to one element of a var or field.
- class VarStreamArray
- struct VarStreamArrayExtractor - VarStreamArrayExtractor is intended to be specialized to provid...
- class VarStreamArrayIterator - VarStreamArray represents an array of variable length records b...
- class VariableExpression
- struct VariableSymbolNode
- struct VariadicOperandTraits - VariadicOperandTraits - determine the allocation regime of the ...
- struct VcallThunkIdentifierNode
- struct VecDesc - Describes a possible vectorization of a function. Function 'Vec...
- class Vector - PBQP Vector class.
- class VectorType
- class VectorType - Class to represent vector types.
- struct VectorizationFactor - Information about vectorization costs
- struct VectorizeConfig - Vectorize configuration.
- struct VectorizerParams - Collection of parameters shared beetween the Loop Vectorizer an...
- struct VectorizerValueMap - This is a helper struct for maintaining vectorization state. It...
- class VendorExtQualType
- class VerifierAnalysis - Check a module for errors, and report separate error states for...
- struct VerifierAnalysis::Result
- class VerifierPass - Create a verifier pass. Check a module or function for validity...
- struct VerifierSupport
- class VersionTuple - Represents a version number in the form major[.minor[.subminor[...
- struct VirtFuncOffset - The ValueInfo and offset for a function within a vtable definit...
- struct VirtReg2IndexFunctor
- class VirtRegAuxInfo - Calculate auxiliary information for a virtual register such as ...
- struct VirtRegInfo - VirtRegInfo - Information about a virtual register used by a se...
- class VirtRegMap
- class VirtualBaseClassRecord
- struct VirtualCallTarget
- struct VirtualRegisterDefinition
- class WallclockRecord
- class WarnMissedTransformationsPass - A CRTP mix-in to automatically provide informational APIs neede...
- struct WasmEHFuncInfo
- class WasmException - Emits exception handling directives.
- class Watchdog - This class provides an abstraction for a timeout around an oper...
- class WeakTrackingVH
- class WeakVH
- struct WholeProgramDevirtPass - A CRTP mix-in to automatically provide informational APIs neede...
- struct WholeProgramDevirtResolution
- struct WholeProgramDevirtResolution::ByArg
- class WinCFGuard - Collects and handles AsmPrinter objects required to build debug...
- struct WinEHFuncInfo
- struct WinEHHandlerType
- struct WinEHTryBlockMapEntry
- class WinException - Emits exception handling directives.
- class WindowsManifestError - Base class for user error types. Users should declare their err...
- class WindowsManifestMerger
- class WindowsManifestMerger::WindowsManifestMergerImpl
- struct WindowsManifestMergerImpl::XmlDeleter
- class WithColor - An RAII object that temporarily switches an output stream to a ...
- class WithOverflowInst
- struct WithStringField
- struct WorkState
- class WrappedPairNodeDataIterator
- class WritableBinaryStream - A BinaryStream which can be read from as well as written to. N...
- class WritableBinaryStreamRef - Common stuff for mutable and immutable StreamRefs.
- class WritableMappedBlockStream - A BinaryStream which can be read from as well as written to. N...
- class WritableMemoryBuffer - This class is an extension of MemoryBuffer, which allows copy-o...
- struct WriteDescriptor - A register write descriptor.
- class WriteRef - A reference to a register write. This class is mainly used by t...
- class WriteState - Tracks uses of a register definition (e.g. register write). Eac...
- class WriteThroughMemoryBuffer - This class is an extension of MemoryBuffer, which allows write ...
- struct Writer - Adapter to write values to a stream in a particular byte order.
- struct X
- struct XRayFileHeader - XRay traces all have a header providing some top-matter informa...
- struct XRayRecord - An XRayRecord is the denormalized view of data associated in a ...
- class XorOpnd - Utility class representing a non-constant Xor-operand. We class...
- struct YAMLMetaSerializer - This is the base class for a remark metadata serializer.
- class YAMLParseError - Base class for user error types. Users should declare their err...
- struct YAMLRemarkParser - Regular YAML to Remark parser.
- struct YAMLRemarkSerializer - Serialize the remarks to YAML. One remark entry looks like this...
- struct YAMLStrTabMetaSerializer - This is the base class for a remark metadata serializer.
- struct YAMLStrTabRemarkParser - YAML with a string table to Remark parser.
- struct YAMLStrTabRemarkSerializer - Serialize the remarks to YAML using a string table. An remark e...
- struct YAMLVFSEntry
- class YAMLVFSWriter
- struct YAMLXRayFileHeader
- struct YAMLXRayRecord
- struct YAMLXRaySledEntry
- struct YAMLXRayTrace
- class ZExtInst
- class ZExtOperator
- struct ZipLongestItemType
- struct ZipLongestTupleType
- struct ZipTupleType
- struct add_const_past_pointer - If T is a pointer to X, return a pointer to const X. If it is n...
- struct add_lvalue_reference_if_not_pointer - If T is a pointer, just return it. If it is not, return T & .
- class alias
- struct aliasopt
- struct apfloat_match
- struct api_pred_ty - This helper class is used to match scalar and vector constants ...
- struct apint_match
- struct applicator
- struct are_base_of - traits class for checking whether type T is a base class for al...
- class arg_iterator - arg_iterator - Iterates through arguments stored inside an ArgL...
- struct bar
- struct base
- class basic_collection_iterator - This is an iterator abstraction over YAML collections shared by...
- class basic_file_status - Represents the result of a call to directory_iterator::status()...
- class basic_parser
- class basic_parser_impl
- class bf_iterator
- class bf_iterator_storage
- struct bind_const_intval_ty
- struct bind_helper
- struct bind_ty
- struct bind_ty - ///////////////////////////////////////////////////////////////...
- class bits
- class bits_storage
- struct bpf_prog_load_attr
- struct br_match
- struct brc_match
- class buffer_ostream - A raw_ostream that writes to an SmallVector or SmallString. Th...
- struct callback_traits
- struct cast_convert_val
- struct cast_retty
- struct cast_retty_impl
- struct cast_retty_wrap
- struct cat
- struct cb
- class circular_raw_ostream - circular_raw_ostream - A raw_ostream which *can* save its data ...
- struct class_match
- struct compute_node_options
- class concat_iterator - Iterator wrapper that concatenates sequences together. This can...
- class concat_range - Helper to store a sequence of ranges being concatenated and acc...
- struct conjunction
- class const_iterator - Path iterator. This is an input iterator that iterates over the...
- struct const_pointer_or_const_ref
- class const_set_bits_iterator_impl - ForwardIterator for the bits that are set. Iterators get invali...
- struct constantint_match
- union copy_construction_triviality_helper - Internal utility to detect trivial copy construction.
- struct cst_pred_ty - This helper class is used to match scalar and vector integer co...
- struct cstfp_pred_ty - This helper class is used to match scalar and vector floating-p...
- struct dbgstream
- struct decimalInfo
- struct def_chain_iterator - Walks the defining accesses of MemoryDefs. Stops after we hit s...
- struct deferredval_ty - Stores a reference to the Value *, not the Value * itself, thus...
- struct deref - Binary functor that adapts to any other binary functor after de...
- struct derived
- struct desc
- struct df_ext_iterator
- class df_iterator
- struct df_iterator_default_set
- class df_iterator_storage
- class directory_entry - A member of a directory, yielded by a directory_iterator. Only ...
- class directory_entry - directory_entry - A single entry in a directory.
- class directory_iterator - An input iterator over the entries in a virtual path, similar t...
- class directory_iterator - directory_iterator - Iterates through the entries in path. Ther...
- class document_iterator - Iterator abstraction for Documents over a Stream.
- class early_inc_iterator_impl - A pseudo-iterator adaptor that is designed to implement "early ...
- class enumerator
- class enumerator_iter
- struct explicitness - Helper trait for recording whether an option is specified expli...
- struct extrahelp
- class fallible_iterator - A wrapper class for fallible iterators. The fallible_iterator t...
- class file_status - Represents the result of a call to sys::fs::status().
- class filter_iterator_base - An iterator adaptor that filters the elements of given inner it...
- class filter_iterator_impl - Specialization of filter_iterator_base for forward iteration on...
- struct fltSemantics
- struct foo
- class format_adapter
- class format_object
- class format_object_base - This is a helper class used for handling formatted output. It ...
- struct format_provider
- struct format_tuple
- class formatted_raw_ostream - formatted_raw_ostream - A raw_ostream that wraps another one an...
- class formatv_object
- class formatv_object_base
- struct formatv_object_base::create_adapters
- struct fwd_or_bidi_tag - Helper which sets its type member to forward_iterator_tag if th...
- struct fwd_or_bidi_tag_impl
- class generic_gep_type_iterator
- class generic_parser_base
- class generic_parser_base::GenericOptionInfo
- struct has_BlockScalarTraits
- struct has_CustomMappingTraits
- struct has_DocumentListTraits
- class has_FlowTraits
- struct has_FlowTraits::Derived
- struct has_FlowTraits::Fallback
- class has_FormatProvider
- struct has_MappingTraits
- struct has_MappingValidateTraits
- struct has_PolymorphicTraits
- struct has_ScalarBitSetTraits
- struct has_ScalarEnumerationTraits
- struct has_ScalarTraits
- struct has_SequenceMethodTraits
- struct has_SequenceTraits
- class has_StreamOperator
- struct has_TaggedScalarTraits
- struct has_rbegin - Metafunction to determine if T & or T has a member called rbegi...
- class has_rbegin_impl - Helper to determine if type T has a member called rbegin().
- class hash_code - An opaque object representing a hash code. This object represen...
- struct hash_combine_recursive_helper - Helper class to manage the recursive combining of hash_combine ...
- struct hash_state - The intermediate state used during hashing. Currently, the algo...
- struct icmp_pred_with_threshold
- struct identity
- struct idf_ext_iterator
- struct idf_iterator
- struct ilist_alloc_traits - Use delete by default for iplist and ilist. Specialize this to ...
- class ilist_base - Implementations of list algorithms using ilist_node_base.
- struct ilist_callback_traits - Callbacks do nothing by default in iplist and ilist. Specialize...
- class ilist_iterator - Iterator for intrusive lists based on ilist_node.
- struct ilist_noalloc_traits - Custom traits to do nothing on deletion. Specialize ilist_alloc...
- class ilist_node - An intrusive list node. A base class to enable membership in in...
- class ilist_node_impl - Implementation for an ilist node. Templated on an appropriate \...
- struct ilist_node_traits - A fragment for template traits for intrusive list that provides...
- class ilist_node_with_parent - An ilist node that can access its parent list. Requires \c Node...
- class ilist_sentinel
- struct ilist_sentinel_tracking - Option to choose whether to track sentinels. This option affect...
- struct ilist_tag - Option to specify a tag for the node type. This option allows a...
- struct ilist_traits - Template traits for intrusive list. Customize callbacks and all...
- struct in_place_t
- struct initializer
- class int_op_inserter
- class iplist - An intrusive list with ownership and callbacks specified/contro...
- class iplist_impl - A wrapper around an intrusive list with callbacks and non-intru...
- struct ipo_ext_iterator
- struct ipo_iterator
- struct is_all_ones
- struct is_any_apint - ///////////////////////////////////////////////////////////////...
- struct is_any_zero_fp
- struct is_bitmask_enum - Traits class to determine whether an enum has a LLVM_BITMASK_LA...
- struct is_bitwiselogic_op
- struct is_copy_assignable
- struct is_cstring
- struct is_execution_policy
- struct is_hashable_data - Trait to indicate whether a type's bits can be hashed directly....
- struct is_idiv_op
- class is_integral_or_enum - Metafunction that determines whether the given type is either a...
- struct is_irem_op
- struct is_logical_shift_op
- struct is_lowbit_mask
- struct is_maxsignedvalue
- struct is_move_assignable
- struct is_nan
- struct is_neg_zero_fp
- struct is_negated_power2
- struct is_negative
- struct is_nonnegative
- struct is_nonpositive
- struct is_one
- struct is_one_of - traits class for checking whether type T is one of any of the g...
- struct is_pos_zero_fp
- struct is_power2
- struct is_power2_or_zero
- struct is_right_shift_op
- struct is_shift_op
- struct is_sign_mask
- struct is_simple_type
- struct is_strictlypositive
- struct is_trivially_copy_constructible - An implementation of `std::is_trivially_copy_constructible` sin...
- class is_trivially_copyable
- struct is_trivially_move_constructible - An implementation of `std::is_trivially_move_constructible` sin...
- struct is_valid_option - Check whether an option is valid. The steps for adding and enab...
- struct is_zero
- struct is_zero_int
- struct isa_impl
- struct isa_impl_cl
- struct isa_impl_wrap
- class iterator_adaptor_base - CRTP base class for adapting an iterator to a different type. T...
- class iterator_facade_base - CRTP base class which implements the entire standard iterator f...
- class iterator_facade_base::ReferenceProxy - A proxy object for computing a reference via indirecting a copy...
- class iterator_range - A range adaptor for a pair of iterators. This just wraps two it...
- struct kernel_descriptor_t
- struct latency_sort - Sorting functions for the Available queue.
- struct less_first - Function object to check whether the first component of a std::...
- struct less_second - Function object to check whether the second component of a std:...
- class line_iterator - A forward iterator which reads text lines from a buffer. This c...
- class list
- class list_storage
- struct llvm_regex
- struct llvm_regmatch_t
- struct llvm_shutdown_obj - llvm_shutdown_obj - This is a simple helper class that calls ll...
- struct make_const_ptr
- struct make_const_ref
- class mapped_file_region - This class represents a memory mapped file. It is based on boos...
- class mapped_iterator
- struct match_combine_and
- struct match_combine_or - Matching combinators
- struct match_unless - Inverting matcher
- class memoryaccess_def_iterator_base - Iterator base class used to implement const and non-const itera...
- struct missingTraits
- union move_construction_triviality_helper - Internal utility to detect trivial move construction.
- struct multi_val
- struct negation
- struct node_options - Traits for options for \a ilist_node. This is usually computed ...
- struct object_creator - object_creator - Helper method for ManagedStatic.
- struct object_deleter - object_deleter - Helper method for ManagedStatic.
- struct ofmax_pred_ty - Helper class for identifying ordered max predicates.
- struct ofmin_pred_ty - Helper class for identifying ordered min predicates.
- struct on_first - Function object to apply a binary function to the first compone...
- class op_inserter
- struct operand_type_match
- class opt
- class opt_storage
- struct packed_endian_specific_integral
- struct packed_endian_specific_integral::ref
- struct pair_hash
- struct parallel_execution_policy
- class parser
- class parser::OptionInfo
- struct po_ext_iterator
- class po_iterator
- class po_iterator_storage - Default po_iterator_storage implementation with an internal set...
- struct pod
- struct pointee_iterator - An iterator type that allows iterating over the pointees via so...
- class pointer_iterator
- struct postorder_ref_scc_iterator::IsAtEndT - Nonce type to select the constructor for the end iterator.
- class provider_format_adapter
- struct range_item_has_provider
- struct rank - Utility type to build an inheritance chain that makes it easy t...
- class raw_counting_ostream - This class implements an extremely fast bulk output stream that...
- class raw_fd_ostream - A raw_ostream that writes to a file descriptor.
- class raw_null_ostream - A raw_ostream that discards all output.
- class raw_os_ostream - raw_os_ostream - A raw_ostream that writes to an std::ostream. ...
- class raw_ostream - This class implements an extremely fast bulk output stream that...
- class raw_pwrite_stream - An abstract base class for streams implementations that also su...
- class raw_sha1_ostream - A raw_ostream that hash the content using the sha1 algorithm.
- class raw_string_ostream - A raw_ostream that writes to an std::string. This is a simple ...
- class raw_svector_ostream - A raw_ostream that writes to an SmallVector or SmallString. Th...
- class recursive_directory_iterator - An input iterator over the recursive contents of a virtual path...
- class recursive_directory_iterator - recursive_directory_iterator - Same as directory_iterator excep...
- struct resource_sort - Sorting functions for the Available queue.
- struct result_pair
- class reverse_iterator - Reverse path iterator. This is an input iterator that iterates ...
- class scc_iterator - Enumerate the SCCs of a directed graph in reverse topological o...
- struct scc_iterator::StackElement - Element of VisitStack during DFS.
- class scope_exit
- struct sequential_execution_policy
- struct serialize_array_impl
- struct serialize_arrayref_tail_impl
- struct serialize_conditional_impl
- struct serialize_null_term_string_array_impl
- struct serialize_numeric_impl
- struct serialize_vector_tail_impl
- class simple_ilist - A simple intrusive list implementation. This is a simple intrus...
- struct simplify_type
- struct smax_pred_ty - Helper class for identifying signed max predicates.
- struct smin_pred_ty - Helper class for identifying signed min predicates.
- struct space_info - space_info - Self explanatory.
- struct specific_bbval - Match a specified basic block value.
- struct specific_fpval - Match a specified floating point value or vector of all element...
- struct specific_intval - Match a specified integer value or vector of all elements of th...
- struct specificval_ty - Match a specified Value*.
- class stream_operator_format_adapter
- struct sub
- union trivial_helper
- struct ufmax_pred_ty - Helper class for identifying unordered max predicates.
- struct ufmin_pred_ty - Helper class for identifying unordered min predicates.
- struct umax_pred_ty - Helper class for identifying unsigned max predicates.
- struct umin_pred_ty - Helper class for identifying unsigned min predicates.
- struct unique_function::IsSizeLessThanThresholdT
- struct unique_function::NonTrivialCallbacks - A struct we use to aggregate three callbacks when we need full ...
- union unique_function::StorageUnionT
- struct unique_function::TrivialCallback - A struct to hold a single trivial callback with sufficient alig...
- struct unit
- struct unvalidatedMappingTraits
- class upward_defs_iterator - Provide an iterator that walks defs, giving both the memory acc...
- struct use_char_formatter
- struct use_double_formatter
- struct use_integral_formatter
- struct use_pointer_formatter
- struct use_string_formatter
- struct uses_format_member
- struct uses_format_provider
- struct uses_missing_provider
- struct uses_stream_operator
- struct validatedMappingTraits
- struct value_desc
- class value_sequence_iterator
- struct with_counts::type
- struct zip_common
- struct zip_first
- class zip_longest_iterator
- class zip_longest_range
- class zip_shortest
- class zippy