|
| | DECLARATION_REPORT (Message, "message") |
| |
| | DECLARATION_REPORT (Warning, "warning") |
| |
| | DECLARATION_REPORT (Error, "error") |
| |
| | DECLARATION_REPORT (CodeGenerationError, "code generation error") |
| |
| | DECLARATION_REPORT (CodeReflection, "code reflection") |
| |
| | DECLARATION_REPORT (SyntaxError, "syntax error") |
| |
| | DECLARATION_REPORT (ContextError, "context error") |
| |
| | DECLARATION_REPORT (InternalError, "internal error") |
| |
| | DECLARATION_REPORT (In, "in") |
| |
| | DECLARATION_REPORT (Input, "input") |
| |
| | DECLARATION_REPORT (Output, "output") |
| |
| | DECLARATION_REPORT (Anonymous, "anonymous") |
| |
| | DECLARATION_REPORT (Unspecified, "unspecified") |
| |
| | DECLARATION_REPORT (CandidatesAre, "candidates are") |
| |
| | DECLARATION_REPORT (StackUnderflow, "stack underflow[ in {0}]") |
| |
| | DECLARATION_REPORT (VertexShader, "vertex shader") |
| |
| | DECLARATION_REPORT (TessControlShader, "tessellation-control shader") |
| |
| | DECLARATION_REPORT (TessEvaluationShader, "tessellation-evaluation shader") |
| |
| | DECLARATION_REPORT (GeometryShader, "geometry shader") |
| |
| | DECLARATION_REPORT (FragmentShader, "fragment shader") |
| |
| | DECLARATION_REPORT (ComputeShader, "compute shader") |
| |
| | DECLARATION_REPORT (InvalidInputStream, "invalid input stream") |
| |
| | DECLARATION_REPORT (InvalidOutputStream, "invalid output stream") |
| |
| | DECLARATION_REPORT (Implicitly, "implicitly") |
| |
| | DECLARATION_REPORT (ButGot, "[, but got {0}]") |
| |
| | DECLARATION_REPORT (NotImplementedYet, "[{0} ]not implemented yet[ (in '{1}')]") |
| |
| | DECLARATION_REPORT (DeclaredAt, "declared at ({0})") |
| |
| | DECLARATION_REPORT (PrevDefinitionAt, "previous definition at ({0})") |
| |
| | DECLARATION_REPORT (ExceptionThrown, "exception thrown: ") |
| |
| | DECLARATION_REPORT (ZeroBased, "zero-based") |
| |
| | DECLARATION_REPORT (OneBased, "one-based") |
| |
| | DECLARATION_REPORT (Identifier, "identifier") |
| |
| | DECLARATION_REPORT (BoolLiteral, "boolean literal") |
| |
| | DECLARATION_REPORT (IntLiteral, "integer literal") |
| |
| | DECLARATION_REPORT (FloatLiteral, "floating-point literal") |
| |
| | DECLARATION_REPORT (StringLiteral, "string literal") |
| |
| | DECLARATION_REPORT (CharLiteral, "character literal") |
| |
| | DECLARATION_REPORT (NullLiteral, "null literal") |
| |
| | DECLARATION_REPORT (AssignOp, "assign operator[ '{0}']") |
| |
| | DECLARATION_REPORT (BinaryOp, "binary operator[ '{0}']") |
| |
| | DECLARATION_REPORT (UnaryOp, "unary operator[ '{0}']") |
| |
| | DECLARATION_REPORT (TernaryOp, "ternary operator") |
| |
| | DECLARATION_REPORT (StringTypeDen, "string type denoter") |
| |
| | DECLARATION_REPORT (ScalarTypeDen, "scalar type denoter") |
| |
| | DECLARATION_REPORT (VectorTypeDen, "vector type denoter") |
| |
| | DECLARATION_REPORT (MatrixTypeDen, "matrix type denoter") |
| |
| | DECLARATION_REPORT (VoidTypeDen, "void type denoter") |
| |
| | DECLARATION_REPORT (PrimitiveTypeDen, "primitive type denoter") |
| |
| | DECLARATION_REPORT (ReservedWord, "reserved keyword") |
| |
| | DECLARATION_REPORT (VectorGenericTypeDen, "vector generic type denoter") |
| |
| | DECLARATION_REPORT (MatrixGenericTypeDen, "matrix generic type denoter") |
| |
| | DECLARATION_REPORT (SamplerTypeDen, "sampler type denoter") |
| |
| | DECLARATION_REPORT (SamplerState, "sampler state") |
| |
| | DECLARATION_REPORT (BufferTypeDen, "buffer type denoter") |
| |
| | DECLARATION_REPORT (UniformBufferTypeDen, "uniform buffer type denoter") |
| |
| | DECLARATION_REPORT (Keyword, "'{0}' keyword") |
| |
| | DECLARATION_REPORT (LayoutQualifier, "layout qualifier") |
| |
| | DECLARATION_REPORT (MemoryQualifier, "memory qualifier") |
| |
| | DECLARATION_REPORT (InvariantQualifier, "invariant qualifier") |
| |
| | DECLARATION_REPORT (PrecisionQualifier, "precision qualifier") |
| |
| | DECLARATION_REPORT (ImageType, "image type") |
| |
| | DECLARATION_REPORT (StorageBufferType, "storage buffer type") |
| |
| | DECLARATION_REPORT (AtomicCounterType, "atomic counter type") |
| |
| | DECLARATION_REPORT (CtrlTransfer, "control transfer") |
| |
| | DECLARATION_REPORT (InputModifier, "input modifier") |
| |
| | DECLARATION_REPORT (InterpModifier, "interpolation modifier") |
| |
| | DECLARATION_REPORT (TypeModifier, "type modifier") |
| |
| | DECLARATION_REPORT (StorageClass, "storage class") |
| |
| | DECLARATION_REPORT (Comment, "comment") |
| |
| | DECLARATION_REPORT (WhiteSpaces, "white spaces") |
| |
| | DECLARATION_REPORT (NewLineChars, "new-line characters") |
| |
| | DECLARATION_REPORT (VarArgSpecifier, "variadic argument specifier") |
| |
| | DECLARATION_REPORT (Misc, "miscellaneous") |
| |
| | DECLARATION_REPORT (PPDirective, "preprocessor directive") |
| |
| | DECLARATION_REPORT (PPDirectiveConcat, "preprocessor directive concatenation") |
| |
| | DECLARATION_REPORT (PPLineBreak, "preprocessor line break") |
| |
| | DECLARATION_REPORT (EndOfStream, "end-of-stream") |
| |
| | DECLARATION_REPORT (IllegalTypeOfFuncObj, "illegal type denoter of function object '{0}'") |
| |
| | DECLARATION_REPORT (CantDirectlyAccessMembersOf, "cannot directly access members of '{0}'") |
| |
| | DECLARATION_REPORT (CantDirectlyAccessArrayOf, "cannot directly access array of '{0}'") |
| |
| | DECLARATION_REPORT (UnknownTypeOfObjectIdentSymbolRef, "unknown type of symbol reference to derive type denoter of object identifier '{0}'") |
| |
| | DECLARATION_REPORT (InvalidSubscriptBaseType, "invalid base type denoter for vector subscript") |
| |
| | DECLARATION_REPORT (IllegalStaticAccessForSubscript, "illegal static access for subscript '{0}'") |
| |
| | DECLARATION_REPORT (MissingVarIdentSymbolRef, "missing symbol reference to derive type denoter of variable identifier '{0}'") |
| |
| | DECLARATION_REPORT (MissingFuncRefToDeriveExpressionType, "missing function reference to derive expression type") |
| |
| | DECLARATION_REPORT (MissingDeclarationStatementRefToDeriveType, "missing reference to declaration statement to derive type denoter of variable identifier " "'{0}'") |
| |
| | DECLARATION_REPORT (MissingObjectExpressionSymbolRef, "missing symbol reference in object expression[ '{0}']") |
| |
| | DECLARATION_REPORT (FuncDoesntTake1Param, "function '{0}' does not take {1} parameter") |
| |
| | DECLARATION_REPORT (FuncDoesntTakeNParams, "function '{0}' does not take {1} parameters") |
| |
| | DECLARATION_REPORT (TernaryExpression, "ternary expression") |
| |
| | DECLARATION_REPORT (BinaryExpression, "binary expression '{0}'") |
| |
| | DECLARATION_REPORT (OnlyBaseTypeAllowed, "only scalar, vector, and matrix type allowed[ in {0}][, but got '{1}']") |
| |
| | DECLARATION_REPORT (CastExpression, "cast expression") |
| |
| | DECLARATION_REPORT (CantDeriveTypeOfInitializer, "cannot derive type of initializer list without type parameter") |
| |
| | DECLARATION_REPORT (CantDeriveTypeOfEmptyInitializer, "cannot derive type of initializer list with no elements") |
| |
| | DECLARATION_REPORT (CantDeriveTypeOfFunction, "cannot derive type of function object") |
| |
| | DECLARATION_REPORT (CantDeriveTypeOfConstBuffer, "cannot derive type of constant buffer object") |
| |
| | DECLARATION_REPORT (ConditionOfTernaryExpression, "condition of ternary expression") |
| |
| | DECLARATION_REPORT (ExpectedInitializerForArrayAccess, "initializer expression expected for array access") |
| |
| | DECLARATION_REPORT (InvalidNumElementsInInitializer, "invalid number of elements in initializer expression for type '{0}' (expected {1}, but " "got {2})") |
| |
| | DECLARATION_REPORT (NotEnoughElementsInInitializer, "not enough elements in initializer expression") |
| |
| | DECLARATION_REPORT (NotEnoughIndicesForInitializer, "not enough array indices specified for initializer expression") |
| |
| | DECLARATION_REPORT (ArrayIndexOutOfBounds, "array index out of bounds[: {0} is not in range \\[0, {1})]") |
| |
| | DECLARATION_REPORT (DataType, "data type") |
| |
| | DECLARATION_REPORT (SamplerType, "sampler type") |
| |
| | DECLARATION_REPORT (BufferType, "buffer type") |
| |
| | DECLARATION_REPORT (Intrinsic, "intrinsic[ '{0}']") |
| |
| | DECLARATION_REPORT (DomainType, "domain type") |
| |
| | DECLARATION_REPORT (PrimitiveType, "primitive type") |
| |
| | DECLARATION_REPORT (Partitioning, "partitioning") |
| |
| | DECLARATION_REPORT (OutputToplogy, "output toplogy") |
| |
| | DECLARATION_REPORT (Attributes, "attributes") |
| |
| | DECLARATION_REPORT (Undefined, "<undefined>") |
| |
| | DECLARATION_REPORT (UserDefined, "<user-defined>") |
| |
| | DECLARATION_REPORT (FailedToMap, "failed to map {0} to {1}") |
| |
| | DECLARATION_REPORT (VectorSubscriptCantHaveNComps, "vector subscript cannot have {0} components") |
| |
| | DECLARATION_REPORT (IncompleteMatrixSubscript, "incomplete matrix subscript: '{0}'") |
| |
| | DECLARATION_REPORT (InvalidVectorDimension, "invalid vector dimension (must be in the range \\[1, 4\\], but got {0})") |
| |
| | DECLARATION_REPORT (InvalidVectorSubscript, "invalid vector subscript '{0}' for {1}") |
| |
| | DECLARATION_REPORT (InvalidMatrixDimension, "invalid matrix dimension (must be in the range \\[1, 4\\] x \\[1, 4\\], but got {0} x " "{1})") |
| |
| | DECLARATION_REPORT (InvalidMatrixSubscriptMixture, "invalid mixture of zero-based and one-based matrix subscripts[: '{0}']") |
| |
| | DECLARATION_REPORT (InvalidCharInMatrixSubscript, "invalid character '{0}' in [{2} ]matrix subscript: '{1}'") |
| |
| | DECLARATION_REPORT (InvalidIntrinsicArgType, "invalid argument type denoter for intrinsic[ '{0}']") |
| |
| | DECLARATION_REPORT (InvalidIntrinsicArgCount, "invalid number of arguments for intrinsic[ '{0}'][ (expected {1}, but got {2})]") |
| |
| | DECLARATION_REPORT (InvalidIntrinsicArgs, "invalid arguments for intrinsic[ '{0}']") |
| |
| | DECLARATION_REPORT (VarIdentCantBeResolved, "variable identifier cannot be normalize") |
| |
| | DECLARATION_REPORT (TypeHasNoSuchObject, "type '{0}' has no object named '{1}'") |
| |
| | DECLARATION_REPORT (IllegalArrayAccess, "array access not allowed[ for '{0}']") |
| |
| | DECLARATION_REPORT (TooManyArrayDimensions, "too many array dimensions[ for '{0}']") |
| |
| | DECLARATION_REPORT (MissingRefToStructDeclaration, "missing reference to structure declaration[ '{0}']") |
| |
| | DECLARATION_REPORT (MissingRefToAliasDeclaration, "missing reference to alias declaration[ '{0}']") |
| |
| | DECLARATION_REPORT (MissingBaseTypeInArray, "missing base type in array type denoter") |
| |
| | DECLARATION_REPORT (MissingRefInTypeDen, "missing reference to declaration[ in {0}]") |
| |
| | DECLARATION_REPORT (InvalidExpressionForSubTypeDen, "invalid expression to derive sub type denoter[ for '{0}']") |
| |
| | DECLARATION_REPORT (OverloadedFunction, "<overloaded function>") |
| |
| | DECLARATION_REPORT (UndefinedSymbol, "undefined symbol '{0}'") |
| |
| | DECLARATION_REPORT (AmbiguousSymbol, "symbol '{0}' is ambiguous") |
| |
| | DECLARATION_REPORT (AmbiguousFuncCall, "ambiguous function call '{0}({1})'") |
| |
| | DECLARATION_REPORT (AmbiguousIntrinsicCall, "ambiguous intrinsic call[ '{0}']") |
| |
| | DECLARATION_REPORT (IdentIsNotFunc, "identifier '{0}' does not name a function") |
| |
| | DECLARATION_REPORT (IdentIsNotVar, "identifier '{0}' does not name a variable") |
| |
| | DECLARATION_REPORT (IdentIsNotType, "identifier '{0}' does not name a type") |
| |
| | DECLARATION_REPORT (IdentIsNotDeclaration, "identifier '{0}' does not name a declaration object") |
| |
| | DECLARATION_REPORT (IdentIsNotBaseOf, "identifier '{0}' does not name a base of '{1}'") |
| |
| | DECLARATION_REPORT (IdentAlreadyDeclared, "identifier '{0}' already declared in this scope[; previous declaration at ({1})]") |
| |
| | DECLARATION_REPORT (NoActiveScopeToRegisterSymbol, "no active scope to register symbol") |
| |
| | DECLARATION_REPORT (LexicalError, "lexical error") |
| |
| | DECLARATION_REPORT (UnexpectedChar, "unexpected character '{0}'[ (expected '{1}')]") |
| |
| | DECLARATION_REPORT (MissingDigitSequenceAfterExpression, "missing digit-sequence after exponent part") |
| |
| | DECLARATION_REPORT (MissingDecimalPartInFloat, "missing decimal part in floating-point number") |
| |
| | DECLARATION_REPORT (UnexpectedToken, "unexpected token[: {0}[ ({1})]]") |
| |
| | DECLARATION_REPORT (UnexpectedEndOfStream, "unexpected end-of-stream") |
| |
| | DECLARATION_REPORT (UnexpectedTokenSpell, "unexpected token spelling '{0}'[ (expected '{1}')]") |
| |
| | DECLARATION_REPORT (Expected, "expected {0}") |
| |
| | DECLARATION_REPORT (ExpectedPrimaryExpression, "expected primary expression") |
| |
| | DECLARATION_REPORT (ExpectedLiteralExpression, "expected literal expression") |
| |
| | DECLARATION_REPORT (ExpectedTypeDen, "expected type denoter") |
| |
| | DECLARATION_REPORT (ExpectedBaseTypeDen, "expected base type denoter[, but got '{0}']") |
| |
| | DECLARATION_REPORT (ExpectedIntLiteral, "expected integer literal[, but got '{0}']") |
| |
| | DECLARATION_REPORT (InFunction, " (in function: {0})") |
| |
| | DECLARATION_REPORT (FailedToCreateScanner, "failed to create token scanner") |
| |
| | DECLARATION_REPORT (FailedToScanSource, "failed to scan source code") |
| |
| | DECLARATION_REPORT (MissingScanner, "missing token scanner") |
| |
| | DECLARATION_REPORT (TooManySyntaxErrors, "too many syntax errors") |
| |
| | DECLARATION_REPORT (IdentNameManglingConflict, "identifier '{0}' conflicts with reserved name mangling prefix '{1}'") |
| |
| | DECLARATION_REPORT (NotAllowedInThisContext, "{0} not allowed in this context") |
| |
| | DECLARATION_REPORT (IntLiteralOutOfRange, "integer literal[ '{0}'] is out of range") |
| |
| | DECLARATION_REPORT (UnknownPPDirective, "unknown preprocessor directive: \"{0}\"") |
| |
| | DECLARATION_REPORT (UnknownMatrixPackAlignment, "unknown matrix pack alignment: \"{0}\" (must be \"row_major\" or \"column_major\")") |
| |
| | DECLARATION_REPORT (UnknownPragma, "unknown pragma: \"{0}\"") |
| |
| | DECLARATION_REPORT (InvalidMacroidentifierTokenArg, "invalid argument for macro identifier token") |
| |
| | DECLARATION_REPORT (FailedToUndefMacro, "failed to undefine macro \"{0}\"") |
| |
| | DECLARATION_REPORT (MacroRedef, "redefinition of macro \"{0}\"[ {1}]") |
| |
| | DECLARATION_REPORT (WithMismatchInParamListAndBody, "with mismatch in parameter list and body definition") |
| |
| | DECLARATION_REPORT (WithMismatchInParamList, "with mismatch in parameter list") |
| |
| | DECLARATION_REPORT (WithMismatchInBody, "with mismatch in body definition") |
| |
| | DECLARATION_REPORT (MissingIfDirective, "missing '#if'-directive to closing '#endif', '#else', or '#elif'") |
| |
| | DECLARATION_REPORT (MissingEndIfDirective, "missing '#endif'-directive for open '#if', '#ifdef', or '#ifndef'") |
| |
| | DECLARATION_REPORT (TooManyArgsForMacro, "too many arguments for macro \"{0}\"[ (expected {1}, but got {2})]") |
| |
| | DECLARATION_REPORT (TooFewArgsForMacro, "too few arguments for macro \"{0}\"[ (expected {1}, but got {2})]") |
| |
| | DECLARATION_REPORT (ExpectedEndIfDirective, "expected '#endif'-directive after previous '#else'[, but got '{0}']") |
| |
| | DECLARATION_REPORT (PragmaCantBeHandled, "pragma \"{0}\" can currently not be handled") |
| |
| | DECLARATION_REPORT (UnexpectedTokenInPragma, "unexpected token in '#pragam'-directive") |
| |
| | DECLARATION_REPORT (UnexpectedEndOfTokenString, "unexpected end of token string") |
| |
| | DECLARATION_REPORT (RemainingTokensInPragma, "remaining unhandled tokens in '#pragma'-directive") |
| |
| | DECLARATION_REPORT (EmptyPragma, "empty '#pragma'-directive") |
| |
| | DECLARATION_REPORT (TooManyRecursiveIncludesOfFile, "too many recursive includes of file[: \"{0}\"]") |
| |
| | DECLARATION_REPORT (FuncDeclarationStackUnderflow, "function declaration stack underflow") |
| |
| | DECLARATION_REPORT (CallExpressionStackUnderflow, "call expression stack underflow") |
| |
| | DECLARATION_REPORT (LValueExpressionStackUnderflow, "l-value expression stack underflow") |
| |
| | DECLARATION_REPORT (StructDeclarationStackUnderflow, "structure declaration stack underflow") |
| |
| | DECLARATION_REPORT (UniformBufferDeclarationStackUnderflow, "uniform buffer declaration stack underflow") |
| |
| | DECLARATION_REPORT (VarDeclarationStatementStackUnderflow, "variable declaration statement stack underflow") |
| |
| | DECLARATION_REPORT (WritePrefixStackUnderflow, "write prefix stack underflow") |
| |
| | DECLARATION_REPORT (UndeclaredIdent, "undeclared identifier \"{0}\"[ in '{1}'][; did you mean \"{2}\"?]") |
| |
| | DECLARATION_REPORT (DefaultArgOfFuncParam, "default argument of function parameter[ '{0}']") |
| |
| | DECLARATION_REPORT (StatementWithEmptyBody, "<{0}> statement with empty body") |
| |
| | DECLARATION_REPORT (MissingReferenceToStructInType, "missing reference to structure declaration in type denoter '{0}'") |
| |
| | DECLARATION_REPORT (MissingVariableType, "missing variable type") |
| |
| | DECLARATION_REPORT (ParameterCantBeUniformAndOut, "type attributes 'out' and 'inout' cannot be used together with 'uniform' for a parameter") |
| |
| | DECLARATION_REPORT (IllegalCast, "cannot cast '{0}' to '{1}'[ in {2}]") |
| |
| | DECLARATION_REPORT (NullPointerArgument, "null pointer passed to {0}") |
| |
| | DECLARATION_REPORT (ConditionalExpressionNotScalar, "conditional expression must evaluate to scalar, but got '{0}'") |
| |
| | DECLARATION_REPORT (ExpectedConstExpression, "expected constant expression[ for {0}]") |
| |
| | DECLARATION_REPORT (ExpectedConstIntExpression, "expected constant integer expression[ for {0}]") |
| |
| | DECLARATION_REPORT (ExpectedConstFloatExpression, "expected constant floating-point expression[ for {0}]") |
| |
| | DECLARATION_REPORT (VarDeclaredButNeverUsed, "variable '{0}' is declared but never used") |
| |
| | DECLARATION_REPORT (ImplicitVectorTruncation, "implicit truncation of vector type[ in {2}][ (from {0} to {1} dimensions)]") |
| |
| | DECLARATION_REPORT (CantImplicitlyConvertVectorType, "cannot implicitly convert vector type[ in {2}][ (from {0} to {1} dimensions)]") |
| |
| | DECLARATION_REPORT (OnlyNoInterpolationForInts, "only 'nointerpolation' interpolation modifier allowed for integral types ") |
| |
| | DECLARATION_REPORT (ExpressionEvaluator, "expression evaluator") |
| |
| | DECLARATION_REPORT (IllegalExpressionInConstExpression, "illegal {0} in constant expression") |
| |
| | DECLARATION_REPORT (DynamicArrayDim, "dynamic array dimension") |
| |
| | DECLARATION_REPORT (BoolLiteralValue, "boolean literal value '{0}'") |
| |
| | DECLARATION_REPORT (LiteralType, "literal type '{0}'") |
| |
| | DECLARATION_REPORT (TypeSpecifier, "type specifier") |
| |
| | DECLARATION_REPORT (DivisionByZero, "division by zero") |
| |
| | DECLARATION_REPORT (TypeCast, "type cast '{0}'") |
| |
| | DECLARATION_REPORT (InitializerList, "initializer list") |
| |
| | DECLARATION_REPORT (FunctionCall, "function call") |
| |
| | DECLARATION_REPORT (MissingArrayIndexInOp, "missing array index in operator of '{0}'") |
| |
| | DECLARATION_REPORT (CallStack, "call stack") |
| |
| | DECLARATION_REPORT (IllegalRecursiveCall, "illegal recursive call[ of function '{0}']") |
| |
| | DECLARATION_REPORT (MissingFuncImpl, "missing function implementation[ for '{0}']") |
| |
| | DECLARATION_REPORT (InvalidTypeOrArgCount, "invalid type or invalid number of arguments") |
| |
| | DECLARATION_REPORT (InvalidArgCount, "invalid number of arguments[ for {0}]") |
| |
| | DECLARATION_REPORT (FailedToInitializeSamplerValue, "{0} to initialize sampler value '{1}'") |
| |
| | DECLARATION_REPORT (SelfParamStackUnderflow, "'self'-parameter stack underflow") |
| |
| | DECLARATION_REPORT (NoActiveStatementScopeHandler, "no active statement scope handler") |
| |
| | DECLARATION_REPORT (MissingScopedStatementRef, "missing reference to scoped statement") |
| |
| | DECLARATION_REPORT (MissingSelfParamForMemberFunc, "missing 'self'-parameter for member function[ '{0}']") |
| |
| | DECLARATION_REPORT (FailedToGetTextureDim, "failed to determine dimension of texture object[ '{0}']") |
| |
| | DECLARATION_REPORT (FailedToMapClassIntrinsicOverload, "failed to map overload of class intrinsic '{0}' for type '{1}'") |
| |
| | DECLARATION_REPORT (GLSLExtensionOrVersionRequired, "GLSL extension '{0}' or shader output version '{1}' required[ (for {2})]") |
| |
| | DECLARATION_REPORT (GLSLExtensionAcquired, "GLSL extension '{0}' acquired due to shader output version below '{1}'[ (for {2})]") |
| |
| | DECLARATION_REPORT (NoGLSLExtensionVersionRegisterd, "no GLSL version is registered for the extension '{0}'") |
| |
| | DECLARATION_REPORT (FragmentCoordinate, "fragment coordinate") |
| |
| | DECLARATION_REPORT (EarlyDepthStencil, "early depth stencil test") |
| |
| | DECLARATION_REPORT (MultiDimArray, "multi-dimensional array") |
| |
| | DECLARATION_REPORT (TextureCubeArray, "texture cube array") |
| |
| | DECLARATION_REPORT (RWStructuredBufferObject, "RW structured buffer object") |
| |
| | DECLARATION_REPORT (RWTextureObject, "RW texture object") |
| |
| | DECLARATION_REPORT (PackOffsetLayout, "pack offset layout") |
| |
| | DECLARATION_REPORT (ConstantBuffer, "constant buffer") |
| |
| | DECLARATION_REPORT (ExplicitBindingSlot, "explicit binding slot") |
| |
| | DECLARATION_REPORT (MultiSampledTexture, "multi-sampled texture") |
| |
| | DECLARATION_REPORT (BitwiseOperator, "bitwise operator") |
| |
| | DECLARATION_REPORT (EntryPointNotFound, "entry point \"{0}\" not found") |
| |
| | DECLARATION_REPORT (FailedToMapToGLSLKeyword, "failed to map {0} to GLSL keyword[ ({1})]") |
| |
| | DECLARATION_REPORT (FailedToMapGLSLImageDataType, "failed to map data type to image format GLSL keyword") |
| |
| | DECLARATION_REPORT (FailedToWriteLiteralType, "failed to write type denoter for literal[ '{0}']") |
| |
| | DECLARATION_REPORT (FailedToDetermineGLSLDataType, "failed to determine GLSL data type") |
| |
| | DECLARATION_REPORT (TessAbstractPatchType, "tessellation abstract patch type") |
| |
| | DECLARATION_REPORT (TessSpacing, "tessellation spacing") |
| |
| | DECLARATION_REPORT (TessPrimitiveOrdering, "tessellation primitive ordering") |
| |
| | DECLARATION_REPORT (InputGeometryPrimitive, "input geometry primitive") |
| |
| | DECLARATION_REPORT (OutputGeometryPrimitive, "output geometry primitive") |
| |
| | DECLARATION_REPORT (OutputSemantic, "output semantic") |
| |
| | DECLARATION_REPORT (VertexSemanticNotFound, "vertex semantic '{0}' specified but not found") |
| |
| | DECLARATION_REPORT (MultiUseOfVertexSemanticLocation, "multiple usage of vertex semantic location ({0})[ (used {1} times)]") |
| |
| | DECLARATION_REPORT (InvalidControlPathInUnrefFunc, "not all control paths in unreferenced function '{0}' return a value") |
| |
| | DECLARATION_REPORT (InvalidControlPathInFunc, "not all control paths in function '{0}' return a value") |
| |
| | DECLARATION_REPORT (MissingInputPrimitiveType, "missing input primitive type[ for {0}]") |
| |
| | DECLARATION_REPORT (MissingOutputPrimitiveType, "missing output primitive type[ for {0}]") |
| |
| | DECLARATION_REPORT (MissingFuncName, "missing function name") |
| |
| | DECLARATION_REPORT (TooManyIndicesForShaderInputParam, "too many array indices for shader input parameter") |
| |
| | DECLARATION_REPORT (InterpModNotSupportedForGLSL120, "interpolation modifiers not supported for GLSL version 120 or below") |
| |
| | DECLARATION_REPORT (InvalidParamVarCount, "invalid number of variables in function parameter") |
| |
| | DECLARATION_REPORT (NotAllStorageClassesMappedToGLSL, "not all storage classes can be mapped to GLSL keywords") |
| |
| | DECLARATION_REPORT (NotAllInterpModMappedToGLSL, "not all interpolation modifiers can be mapped to GLSL keywords") |
| |
| | DECLARATION_REPORT (CantTranslateSamplerToGLSL, "cannot translate sampler state object to GLSL sampler") |
| |
| | DECLARATION_REPORT (MissingArrayPrefixForIOSemantic, "missing array prefix expression for input/output semantic[ '{0}']") |
| |
| | DECLARATION_REPORT (MacrosBeginWithGLReserved, "macros beginning with 'GL_' are reserved[: {0}]") |
| |
| | DECLARATION_REPORT (MacrosWithTwoUnderscoresReserved, "macros containing consecutive underscores '__' are reserved[: {0}]") |
| |
| | DECLARATION_REPORT (IllegalRedefOfStdMacro, "illegal redefinition of standard macro[: {0}]") |
| |
| | DECLARATION_REPORT (IllegalUndefOfStdMacro, "illegal undefinition of standard macro[: {0}]") |
| |
| | DECLARATION_REPORT (VersionMustBeFirstDirective, "'#version'-directive must be the first directive") |
| |
| | DECLARATION_REPORT (GLSLVersionAlreadyDefined, "GLSL version is already defined[ (with number {0})]") |
| |
| | DECLARATION_REPORT (UnknownGLSLVersion, "unknown GLSL version: '{0}'") |
| |
| | DECLARATION_REPORT (UnknownESSLVersion, "unknown ESSL version: '{0}'") |
| |
| | DECLARATION_REPORT (NoProfileForGLSLVersionBefore150, "versions before 150 do not allow a profile token") |
| |
| | DECLARATION_REPORT (InvalidGLSLVersionProfile, "invalid version profile '{0}' (must be 'core', 'compatibility', or 'es')") |
| |
| | DECLARATION_REPORT (ExtensionNotSupported, "extension not supported[: {0}]") |
| |
| | DECLARATION_REPORT (InvalidGLSLExtensionBehavior, "invalid extension behavior '{0}' (must be 'enable', 'require', 'warn', or 'disable')") |
| |
| | DECLARATION_REPORT (InvalidGLSLDirectiveAfterPP, "only '#line', '#version', and '#extension' directives are allowed after pre-processing") |
| |
| | DECLARATION_REPORT (IllegalInheritance, "illegal inheritance") |
| |
| | DECLARATION_REPORT (UnknownLayoutQualifier, "unknown layout qualifier: '{0}'") |
| |
| | DECLARATION_REPORT (OnlyFieldsAllowedInUniformBlock, "only field declarations are allowed in a uniform block") |
| |
| | DECLARATION_REPORT (FailedToMapFromGLSLKeyword, "failed to map GLSL keyword '{0}' to {1}") |
| |
| | DECLARATION_REPORT (FailedToDeriveIntrinsicType, "failed to derive type denoter for intrinsic[ '{0}']") |
| |
| | DECLARATION_REPORT (FailedToDeriveIntrinsicParamType, "failed to derive parameter type denoter for intrinsic[ '{0}']") |
| |
| | DECLARATION_REPORT (MissingTypeInTextureIntrinsic, "missing buffer type in texture intrinsic[ '{0}']") |
| |
| | DECLARATION_REPORT (FailedToMapFromHLSLKeyword, "failed to map HLSL keyword '{0}' to {1}") |
| |
| | DECLARATION_REPORT (FailedToMapFromCgKeyword, "failed to map Cg keyword '{0}' to {1}") |
| |
| | DECLARATION_REPORT (InvalidSystemValueSemantic, "invalid system value semantic \"{0}\"") |
| |
| | DECLARATION_REPORT (KeywordReservedForFutureUse, "keyword[ '{0}'] is reserved for future use") |
| |
| | DECLARATION_REPORT (KeywordNotSupportedYet, "keyword[ '{0}'] is currently not supported") |
| |
| | DECLARATION_REPORT (UnknownAttribute, "unknown attribute: '{0}'") |
| |
| | DECLARATION_REPORT (UnknownSlotRegister, "unknown slot register: '{0}'") |
| |
| | DECLARATION_REPORT (ExpectedExplicitArrayDim, "explicit array dimension expected") |
| |
| | DECLARATION_REPORT (ExpectedVarOrAssignOrFuncCall, "expected variable declaration, assignment, or function call statement") |
| |
| | DECLARATION_REPORT (ExpectedTypeNameOrFuncCall, "expected type name or function call expression") |
| |
| | DECLARATION_REPORT (ExpectedUnaryOp, "expected unary operator") |
| |
| | DECLARATION_REPORT (ExpectedIdentPrefix, "expected '::' or '.' identifier prefix") |
| |
| | DECLARATION_REPORT (UnexpectedTokenInPackMatrixPragma, "unexpected token in '#pragma pack_matrix'-directive") |
| |
| | DECLARATION_REPORT (UnexpectedPreParsedAST, "unexpected pre-parsed AST node") |
| |
| | DECLARATION_REPORT (InvalidHLSLDirectiveAfterPP, "only '#line' and '#pragma' directives are allowed after pre-processing") |
| |
| | DECLARATION_REPORT (InvalidHLSLPragmaAfterPP, "only 'pack_matrix' pragma directive is allowed after pre-processing") |
| |
| | DECLARATION_REPORT (InvalidModifierForGenericTypeDen, "invalid modifier for generic type denoter[: '{0}']") |
| |
| | DECLARATION_REPORT (IllegalRecursiveInheritance, "illegal recursive inheritance") |
| |
| | DECLARATION_REPORT (IllegalMultipleInheritance, "illegal multiple inheritance") |
| |
| | DECLARATION_REPORT (IllegalDeclarationStatementInsideDeclarationOf, "illegal declaration statement inside declaration of '{0}'") |
| |
| | DECLARATION_REPORT (IllegalBufferTypeGenericSize, "illegal usage of generic size in texture, buffer, or stream object") |
| |
| | DECLARATION_REPORT (IllegalPackOffset, "packoffset is only allowed in a constant buffer") |
| |
| | DECLARATION_REPORT (TextureSampleCountLimitIs128, "number of samples in texture must be in the range [1, 128), but got {0}") |
| |
| | DECLARATION_REPORT (PatchCtrlPointLimitIs64, "number of control points in patch must be in the range [1, 64], but got {0}") |
| |
| | DECLARATION_REPORT (VectorAndMatrixDimOutOfRange, "vector and matrix dimensions must be in the range [1, 4], but got {0}") |
| |
| | DECLARATION_REPORT (TechniquesAreIgnored, "techniques are ignored") |
| |
| | DECLARATION_REPORT (MissingClosingBrace, "missing closing brace '}' for open code block") |
| |
| | DECLARATION_REPORT (PackOffsetOverridden, "overwriting packoffset will cause previous packoffset to expire") |
| |
| | DECLARATION_REPORT (RegisterIgnoredForFuncDeclarations, "register is ignored for function declarations") |
| |
| | DECLARATION_REPORT (ExpectedSamplerOrSamplerState, "expected sampler type denoter or sampler state") |
| |
| | DECLARATION_REPORT (ExpectedOpenBracketOrAngleBracket, "expected '<' or '('") |
| |
| | DECLARATION_REPORT (DuplicatedPrimitiveType, "duplicate primitive type specified") |
| |
| | DECLARATION_REPORT (ConflictingPrimitiveTypes, "conflicting primitive types") |
| |
| | DECLARATION_REPORT (SecondEntryPointNotFound, "secondary entry point \"{0}\" not found") |
| |
| | DECLARATION_REPORT (NestedStructsMustBeAnonymous, "nested structures must be anonymous") |
| |
| | DECLARATION_REPORT (TypeHasNoMemberVariables, "'{0}' has no member variables") |
| |
| | DECLARATION_REPORT (BufferCanOnlyHaveOneSlot, "buffers can only be bound to one slot") |
| |
| | DECLARATION_REPORT (UserCBuffersCantBeTargetSpecific, "user-defined constant buffer slots cannot be target specific") |
| |
| | DECLARATION_REPORT (DeclarationShadowsPreviousLocal, "declaration of '{0}' shadows a previous local at ({1})") |
| |
| | DECLARATION_REPORT (DeclarationShadowsMemberOfBase, "declaration of '{0}' shadows member of base '{1}'") |
| |
| | DECLARATION_REPORT (ReturnOutsideFuncDeclaration, "return statement outside function declaration") |
| |
| | DECLARATION_REPORT (ReturnExpression, "return expression") |
| |
| | DECLARATION_REPORT (ArrayIndex, "array index") |
| |
| | DECLARATION_REPORT (ArrayIndexMustHaveBaseType, "array index must have scalar or vector type with correct number of dimensions[ (but got " "'{0}')]") |
| |
| | DECLARATION_REPORT (VarAssignment, "variable assignment") |
| |
| | DECLARATION_REPORT (VarInitialization, "variable initialization") |
| |
| | DECLARATION_REPORT (IntrinsicNotDeclaredInObject, "intrinsic '{0}' not declared in object '{1}'") |
| |
| | DECLARATION_REPORT (InvalidShaderModelForIntrinsic, "intrinsic '{0}' requires shader model {1}, but only {2} is specified") |
| |
| | DECLARATION_REPORT (InvalidIntrinsicForTexture, "invalid intrinsic '{0}' for texture object") |
| |
| | DECLARATION_REPORT (InvalidIntrinsicForRWTexture, "invalid intrinsic '{0}' for RW texture object") |
| |
| | DECLARATION_REPORT (InvalidIntrinsicForStreamOutput, "invalid intrinsic '{0}' for stream-output object") |
| |
| | DECLARATION_REPORT (InvalidGlobalIntrinsicForType, "invalid global intrinsic '{0}' for type '{1}'") |
| |
| | DECLARATION_REPORT (InvalidClassIntrinsicForType, "invalid class intrinsic '{0}' for type '{1}'") |
| |
| | DECLARATION_REPORT (InvalidMemberFuncForType, "invalid member function '{0}' for type '{1}'") |
| |
| | DECLARATION_REPORT (InvalidTypeModifierForMemberField, "invalid type modifier for structure member field") |
| |
| | DECLARATION_REPORT (InvalidSymbolRefToVarIdent, "invalid symbol reference to variable identifier '{0}'") |
| |
| | DECLARATION_REPORT (InvalidVarDeclarationCountInParam, "invalid number of variable declarations in function parameter") |
| |
| | DECLARATION_REPORT (InvalidInputSemanticInEntryPoint, "invalid input semantic '{0}' in entry point '{1}'") |
| |
| | DECLARATION_REPORT (InvalidOutputSemanticInEntryPoint, "invalid output semantic '{0}' in entry point '{1}'") |
| |
| | DECLARATION_REPORT (MissingInputSemanticInEntryPoint, "missing input semantic '{0}' in entry point '{1}'") |
| |
| | DECLARATION_REPORT (MissingOutputSemanticInEntryPoint, "missing output semantic '{0}' in entry point '{1}'") |
| |
| | DECLARATION_REPORT (MissingAttributeForEntryPoint, "missing '{0}' attribute for entry point") |
| |
| | DECLARATION_REPORT (MissingExpressionInReturnForFunc, "missing expression in return statement for function with '{0}' return type") |
| |
| | DECLARATION_REPORT (MissingInitializerForDefaultParam, "missing initializer expression for default argument of parameter '{0}'") |
| |
| | DECLARATION_REPORT (MissingInitializerForConstant, "missing initializer expression for local constant '{0}'") |
| |
| | DECLARATION_REPORT (MissingSemanticInEntryPointParam, "missing semantic in parameter '{0}' of entry point") |
| |
| | DECLARATION_REPORT (MissingGenericTypeDen, "missing generic type denoter[ in '{0}']") |
| |
| | DECLARATION_REPORT (IllegalUseOfNormModifiers, "'snorm' and 'unorm' type modifiers can only be used for floating-point types") |
| |
| | DECLARATION_REPORT (IllegalExpressionInReturnForVoidFunc, "illegal expression in return statement for function with 'void' return type") |
| |
| | DECLARATION_REPORT (IllegalBufferTypeForEntryPoint, "illegal buffer type for entry point[ {0}]") |
| |
| | DECLARATION_REPORT (IllegalLValueAssignmentToTypeCast, "illegal assignment to l-value '{0}' due to type mismatch[ with function parameter '{1}']") |
| |
| | DECLARATION_REPORT (IllegalLValueAssignmentToConst, "illegal assignment to l-value '{0}' that is[ {1}] declared as constant") |
| |
| | DECLARATION_REPORT (IllegalRValueAssignment, "illegal assignment to r-value expression[ via function parameter '{0}']") |
| |
| | DECLARATION_REPORT (IllegalNonStaticAccessToMember, "illegal non-static access to static structure member[ '{0}']") |
| |
| | DECLARATION_REPORT (IllegalStaticAccessToMember, "illegal static access to non-static structure member[ '{0}']") |
| |
| | DECLARATION_REPORT (IllegalNonStaticAccessToType, "illegal non-static access to type[ '{0}']") |
| |
| | DECLARATION_REPORT (IllegalStaticAccessToNonType, "illegal static access to non-typename expression") |
| |
| | DECLARATION_REPORT (IllegalStaticIntrinsicCall, "illegal static call to intrinsic[ '{0}']") |
| |
| | DECLARATION_REPORT (IllegalStaticFuncCall, "illegal static call to function[ '{0}']") |
| |
| | DECLARATION_REPORT (IllegalNonStaticFuncCall, "illegal call to static function[ '{0}']") |
| |
| | DECLARATION_REPORT (IllegalDefOfNonStaticMemberVar, "illegal definition of non-static member variable[ '{0}']") |
| |
| | DECLARATION_REPORT (DuplicateUseOfOutputSemantic, "duplicate use of output semantic '{0}'") |
| |
| | DECLARATION_REPORT (UniformCantBeOutput, "uniforms cannot be defined as output") |
| |
| | DECLARATION_REPORT (TooManyArgsForAttribute, "too many arguments for attribute[ '{0}'][ (expected {1}, but got {2})]") |
| |
| | DECLARATION_REPORT (TooFewArgsForAttribute, "too few arguments for attribute[ '{0}'][ (expected {1}, but got {2})]") |
| |
| | DECLARATION_REPORT (ExpectedIdentArgInAttribute, "expected identifier as argument for attribute[ '{0}']") |
| |
| | DECLARATION_REPORT (InvalidIdentArgInAttribute, "invalid identifier '{0}' used as argument for attribute[ '{1}']") |
| |
| | DECLARATION_REPORT (ExpectedDomainTypeParamToBe, "expected domain type parameter to be \"tri\", \"quad\", or \"isoline\"") |
| |
| | DECLARATION_REPORT (ExpectedOutputTopologyParamToBe, "expected output topology parameter to be \"point\", \"line\", \"triangle_cw\", or " "\"triangle_ccw\"") |
| |
| | DECLARATION_REPORT (ExpectedPartitioningModeParamToBe, "expected partitioning mode parameter to be \"integer\", \"pow2\", \"fractional_even\", or " "\"fractional_odd\"") |
| |
| | DECLARATION_REPORT (ExpectedOutputCtrlPointParamToBe, "expected output control point parameter to be an UInt32eger") |
| |
| | DECLARATION_REPORT (ExpectedPatchFuncParamToBe, "expected patch constant function parameter to be a string literal") |
| |
| | DECLARATION_REPORT (EntryPointForPatchFuncNotFound, "entry point \"{0}\" for patch constant function not found") |
| |
| | DECLARATION_REPORT (MaxVertexCountMustBeGreaterZero, "maximal vertex count must be greater than zero") |
| |
| | DECLARATION_REPORT (NumThreadsMustBeGreaterZero, "number of threads must be greater than zero") |
| |
| | DECLARATION_REPORT (SecondaryArrayDimMustBeExplicit, "secondary array dimensions must be explicit") |
| |
| | DECLARATION_REPORT (StructsCantBeDefinedInParam, "structures cannot be defined in a parameter type[: '{0}']") |
| |
| | DECLARATION_REPORT (StaticMembersCantBeDefinedInGlob, "static members can only be defined in global scope[: '{0}']") |
| |
| | DECLARATION_REPORT (StaticMemberVarRedef, "redefinition of static member variable[ '{0}']") |
| |
| | DECLARATION_REPORT (MemberVarsCantHaveDefaultValues, "member variables cannot have default values[: '{0}']") |
| |
| | DECLARATION_REPORT (DeclarationTypeDiffersFromDefType, "declaration type '{0}' differs from definition type '{1}'") |
| |
| | DECLARATION_REPORT (ArrayTypeCanOnlyAppearInDef, "array type can only appear in definition of static member variables[: '{0}']") |
| |
| | DECLARATION_REPORT (FuncCallShadowsClassIntrinsic, "function call shadows class intrinsic '{0}'") |
| |
| | DECLARATION_REPORT (NotEnoughOperandsInInst, "not enough operands in SPIR-V instruction") |
| |
| | DECLARATION_REPORT (InstructionFactory, "SPIR-V instruction factory") |
| |
| | DECLARATION_REPORT (NoActiveBasicBlock, "no active basic block to put instructions into") |
| |
| | DECLARATION_REPORT (SPIRVFileTooSmall, "SPIR-V module file is too small") |
| |
| | DECLARATION_REPORT (SPIRVInvalidMagicNumber, "invalid magic number in SPIR-V module header[ (expected {0}, but got {1})]") |
| |
| | DECLARATION_REPORT (SPIRVUnknownVersionNumber, "unknown version number in SPIR-V module header[: {0}]") |
| |
| | DECLARATION_REPORT (SPIRVByteStreamNotWordAligned, "byte stream of SPIR-V module is not 32-bit word aligned") |
| |
| | DECLARATION_REPORT (InputStreamCantBeNull, "input stream must not be null") |
| |
| | DECLARATION_REPORT (OutputStreamCantBeNull, "output stream must not be null") |
| |
| | DECLARATION_REPORT (NameManglingPrefixResCantBeEmpty, "name mangling prefix for reserved words must not be empty") |
| |
| | DECLARATION_REPORT (NameManglingPrefixTmpCantBeEmpty, "name mangling prefix for temporary variables must not be empty") |
| |
| | DECLARATION_REPORT (OverlappingNameManglingPrefixes, "overlapping name mangling prefixes") |
| |
| | DECLARATION_REPORT (LangExtensionsNotSupported, "compiler was not build with language extensions") |
| |
| | DECLARATION_REPORT (PreProcessingSourceFailed, "preprocessing input code failed") |
| |
| | DECLARATION_REPORT (ParsingSourceFailed, "parsing input code failed") |
| |
| | DECLARATION_REPORT (AnalyzingSourceFailed, "analyzing input code failed") |
| |
| | DECLARATION_REPORT (GeneratingOutputCodeFailed, "generating output code failed") |
| |
| | DECLARATION_REPORT (GLSLFrontendIsIncomplete, "GLSL frontend is incomplete") |
| |
| | DECLARATION_REPORT (InvalidILForDisassembling, "invalid intermediate language for disassembling") |
| |
| | DECLARATION_REPORT (NotBuildWithSPIRV, "compiler was not build with SPIR-V") |
| |
| | DECLARATION_REPORT (UnexpectedEndOfCmdLine, "unexpected end of command line arguments") |
| |
| | DECLARATION_REPORT (ExpectedCmdLineBoolean, "expected '{0}' or '{1}', but got '{2}'") |
| |
| | DECLARATION_REPORT (MissingValueInShellCmd, "missing value in command '{0}'") |
| |
| | DECLARATION_REPORT (PressAnyKeyToContinue, "press any key to continue ...") |
| |
| | DECLARATION_REPORT (FailedToReadFile, "failed to read file: \"{0}\"") |
| |
| | DECLARATION_REPORT (FailedToWriteFile, "failed to write file: \"{0}\"") |
| |
| | DECLARATION_REPORT (FailedToIncludeFile, "failed to include file: \"{0}\"") |
| |
| | DECLARATION_REPORT (ValidateShader, "validate \"{0}\"") |
| |
| | DECLARATION_REPORT (ValidationSuccessful, "validation successful") |
| |
| | DECLARATION_REPORT (ValidationFailed, "validation failed") |
| |
| | DECLARATION_REPORT (CompileShader, "compile \"{0}\" to \"{1}\"") |
| |
| | DECLARATION_REPORT (CompilationSuccessful, "compilation successful") |
| |
| | DECLARATION_REPORT (CompilationFailed, "compilation failed") |
| |
| | DECLARATION_REPORT (CmdHelpEntry, "Shader entry point; default=main") |
| |
| | DECLARATION_REPORT (CmdHelpSecndEntry, "Secondary shader entry point") |
| |
| | DECLARATION_REPORT (CmdHelpTarget, "Input shader target; valid targets:") |
| |
| | DECLARATION_REPORT (CmdHelpVersionIn, "Input shader version; default=HLSL5; valid versions:") |
| |
| | DECLARATION_REPORT (CmdHelpVersionOut, "Shader output version; default=GLSL; valid versions:") |
| |
| | DECLARATION_REPORT (CmdHelpOutput, "Shader output file (use '*' for default); default='<FILE>.<ENTRY>.<TARGET>'") |
| |
| | DECLARATION_REPORT (CmdHelpIncludePath, "Adds PATH to the search include paths") |
| |
| | DECLARATION_REPORT (CmdHelpWarn, "Enables/disables the specified warning type; default={0}; valid types:") |
| |
| | DECLARATION_REPORT (CmdHelpDetailsWarn, "all => all kinds of warnings\n" "basic => warn for basic issues\n" "declaration-shadow => warn for declaration shadowing\n" "empty-body => warn for empty statement body\n" "extension => warn for required extensions\n" "implicit-cast => warn for implicit type casts\n" "index-bound => warn for index boundary violation\n" "preprocessor => warn for pre-processor issues\n" "reflect => warn for issues in code reflection\n" "syntax => warn for syntactic issues\n" "unlocated-obj => warn for unlocated optional objects\n" "unused-vars => warn for unused variables") |
| |
| | DECLARATION_REPORT (CmdHelpShowAST, "Enables/disables debug output for the AST (Abstract Syntax Tree); default={0}") |
| |
| | DECLARATION_REPORT (CmdHelpShowTimes, "Enables/disables debug output for timings of each compilation step; default={0}") |
| |
| | DECLARATION_REPORT (CmdHelpReflect, "Enables/disables code reflection output; default={0}") |
| |
| | DECLARATION_REPORT (CmdHelpPPOnly, "Enables/disables to only preprocess source code; default={0}") |
| |
| | DECLARATION_REPORT (CmdHelpMacro, "Adds the identifier <IDENT> to the pre-defined macros with an optional VALUE") |
| |
| | DECLARATION_REPORT (CmdHelpSemantic, "Adds the vertex semantic <IDENT> binding to VALUE (Requires -EB)") |
| |
| | DECLARATION_REPORT (CmdHelpPackUniforms, "Packs global uniforms into a single constant buffer; default={0}") |
| |
| | DECLARATION_REPORT (CmdHelpPause, "Waits for user input after the translation process") |
| |
| | DECLARATION_REPORT (CmdHelpPresetting, "Parse further arguments from the presetting file") |
| |
| | DECLARATION_REPORT (CmdHelpVersion, "Prints the version information") |
| |
| | DECLARATION_REPORT (CmdHelpHelp, "Prints the help reference") |
| |
| | DECLARATION_REPORT (CmdHelpVerbose, "Enables/disables more output for compiler reports; default={0}") |
| |
| | DECLARATION_REPORT (CmdHelpColor, "Enables/disables color highlighting for shell output; default={0}") |
| |
| | DECLARATION_REPORT (CmdHelpOptimize, "Enables/disables optimization; default={0}") |
| |
| | DECLARATION_REPORT (CmdHelpExtension, "Enables/disables shader extension output; default={0}") |
| |
| | DECLARATION_REPORT (CmdHelpEnumExtension, "Enumerates all supported GLSL extensions") |
| |
| | DECLARATION_REPORT (CmdHelpValidate, "Enables/disables to only validate source code; default={0}") |
| |
| | DECLARATION_REPORT (CmdHelpBinding, "Enables/disables explicit binding slots; default={0}") |
| |
| | DECLARATION_REPORT (CmdHelpAutoBinding, "Enables/disables automatic binding slot generation (implies -EB); default={0}") |
| |
| | DECLARATION_REPORT (CmdHelpAutoBindingStartSlot, "Sets the start slot index for automatic binding slot generation; default=0") |
| |
| | DECLARATION_REPORT (CmdHelpComment, "Enables/disables commentary preservation; default={0}") |
| |
| | DECLARATION_REPORT (CmdHelpWrapper, "Enables/disables the preference for intrinsic wrappers; default={0}") |
| |
| | DECLARATION_REPORT (CmdHelpUnrollInitializer, "Enables/disables unrolling of array initializers; default={0}") |
| |
| | DECLARATION_REPORT (CmdHelpObfuscate, "Enables/disables code obfuscation; default={0}") |
| |
| | DECLARATION_REPORT (CmdHelpRowMajorAlignment, "Enables/disables row major packing alignment for matrices; default={0}") |
| |
| | DECLARATION_REPORT (CmdHelpFormatting, "Enables/disables the specified formatting option; valid types:") |
| |
| | DECLARATION_REPORT (CmdHelpDetailsFormatting, "blanks => blank lines between declarations; default={1}\n" "force-braces => force braces for scopes; default={0}\n" "compact => write compact wrapper functions; default={0}\n" "line-marks => line marks (e.g. '#line 30'); default={0}\n" "line-sep => separate lines in columns; default={1}\n" "newline-scope => write open braces at new lines; default={1}") |
| |
| | DECLARATION_REPORT (CmdHelpIndent, "Code indentation string (use '\\\\t' for tabs); default=' '") |
| |
| | DECLARATION_REPORT (CmdHelpPrefix, "Prefix for the specified name-mangling type; valid types:") |
| |
| | DECLARATION_REPORT (CmdHelpDetailsPrefix, "in => input variables; default='xsv_'\n" "namespace => namespace objects; default='xsn_'\n" "out => output variables; default='xsv_'\n" "reserved => reserved words; default='xsr_'\n" "temp => temporary variables; default='xst_'") |
| |
| | DECLARATION_REPORT (CmdHelpNameMangling, "Enables/disables the specified name-mangling option; valid types:") |
| |
| | DECLARATION_REPORT (CmdHelpDetailsNameMangling, "buffer-fields => rename 'buffer' fields, not its identifier; default={0}\n" "force-semantics => force semantics for input/output variables; default={0}") |
| |
| | DECLARATION_REPORT (CmdHelpSeparateShaders, "Ensures compatibility to 'ARB_separate_shader_objects' extension; default={0}") |
| |
| | DECLARATION_REPORT (CmdHelpSeparateSamplers, "Enables/disables generation of separate sampler state objects; default={0}") |
| |
| | DECLARATION_REPORT (CmdHelpDisassemble, "Disassembles the SPIR-V module") |
| |
| | DECLARATION_REPORT (CmdHelpDisassembleExt, "Disassembles the SPIR-V module with extended ID numbers") |
| |
| | DECLARATION_REPORT (InvalidShaderTarget, "invalid shader target[: '{0}']") |
| |
| | DECLARATION_REPORT (InvalidShaderVersionIn, "invalid input shader version[: '{0}']") |
| |
| | DECLARATION_REPORT (InvalidShaderVersionOut, "invalid output shader version[: '{0}']") |
| |
| | DECLARATION_REPORT (InvalidWarningType, "invalid warning type[: '{0}']") |
| |
| | DECLARATION_REPORT (InvalidFormattingType, "invalid formatting type[: '{0}']") |
| |
| | DECLARATION_REPORT (InvalidPrefixType, "invalid prefix type[: '{0}']") |
| |
| | DECLARATION_REPORT (InvalidNameManglingType, "invalid name-mangling type[: '{0}']") |
| |
| | DECLARATION_REPORT (VertexAttribValueExpectedFor, "vertex attribute value expected for \"{0}\"") |
| |
| | DECLARATION_REPORT (LoopInPresettingFiles, "loop in presetting files detected") |
| |
| | DECLARATION_REPORT (RunPresetting, "run presetting[: \"{0}\"]") |
| |
| | DECLARATION_REPORT (ChoosePresetting, "choose presetting") |
| |
| | DECLARATION_REPORT (ChooseAllPresettings, "ALL") |
| |
| | DECLARATION_REPORT (PresettingsSucceeded, "all presettings processed successfully") |
| |
| | DECLARATION_REPORT (PresettingsFailed, "{0} of {1} presetting(s) failed") |
| |
| | DECLARATION_REPORT (NoPresettingsDefined, "no presettings defined") |
| |
| | DECLARATION_REPORT (InvalidImageFormatForType, "invalid image format '{0}' used for buffer of type '{1}'") |
| |
| | DECLARATION_REPORT (AttributeRequiresExtension, "attribute '{0}' requires language extension '{1}'") |
| |
| | DECLARATION_REPORT (IllegalVectorSpaceAssignment, "illegal assignment of '{0}' vector-space to '{1}' vector-space") |
| |
| | DECLARATION_REPORT (InconsistVectorSpacesInTypes, "inconsistent vector-spaces between type denoters[ (found '{0}' and '{1}')]") |
| |
| | DECLARATION_REPORT (ExpectedIdentInSpaceAttr, "expected identifier as argument in 'space' attribute") |
| |
| | DECLARATION_REPORT (CmdHelpLanguageExtension, "Enables/disables the specified language extension; default={0}; valid types:") |
| |
| | DECLARATION_REPORT (CmdHelpDetailsLanguageExtension, "all => all kinds of extensions\n" "attr-layout => enable 'layout' attribute to specify image layout format\n" "attr-space => enable 'space' attribute for a stronger type system") |
| |
| | DECLARATION_REPORT (InvalidExtensionType, "invalid extension type[: '{0}']") |
| |