Searched refs:DIAG (Results 1 - 25 of 39) sorted by relevance

12

/external/clang/include/clang/AST/
H A DCommentDiagnostic.h18 #define DIAG(ENUM,FLAGS,DEFAULT_MAPPING,DESC,GROUP,\ macro
22 #undef DIAG macro
H A DASTDiagnostic.h18 #define DIAG(ENUM,FLAGS,DEFAULT_MAPPING,DESC,GROUP,\ macro
22 #undef DIAG macro
/external/clang/include/clang/Analysis/
H A DAnalysisDiagnostic.h18 #define DIAG(ENUM,FLAGS,DEFAULT_MAPPING,DESC,GROUP,\ macro
22 #undef DIAG macro
/external/clang/include/clang/Driver/
H A DDriverDiagnostic.h18 #define DIAG(ENUM,FLAGS,DEFAULT_MAPPING,DESC,GROUP,\ macro
22 #undef DIAG macro
/external/clang/include/clang/Frontend/
H A DFrontendDiagnostic.h18 #define DIAG(ENUM,FLAGS,DEFAULT_MAPPING,DESC,GROUP,\ macro
22 #undef DIAG macro
/external/clang/include/clang/Lex/
H A DLexDiagnostic.h18 #define DIAG(ENUM,FLAGS,DEFAULT_MAPPING,DESC,GROUP,\ macro
22 #undef DIAG macro
/external/clang/include/clang/Parse/
H A DParseDiagnostic.h18 #define DIAG(ENUM,FLAGS,DEFAULT_MAPPING,DESC,GROUP,\ macro
22 #undef DIAG macro
/external/clang/include/clang/Sema/
H A DSemaDiagnostic.h18 #define DIAG(ENUM,FLAGS,DEFAULT_MAPPING,DESC,GROUP,\ macro
22 #undef DIAG macro
/external/clang/include/clang/Serialization/
H A DSerializationDiagnostic.h18 #define DIAG(ENUM,FLAGS,DEFAULT_MAPPING,DESC,GROUP,\ macro
22 #undef DIAG macro
/external/clang/tools/diagtool/
H A DDiagnosticNames.cpp31 #define DIAG(ENUM,CLASS,DEFAULT_MAPPING,DESC,GROUP, \ macro
45 #undef DIAG macro
/external/srec/srec/include/
H A Dhmm_desc.h39 #define DIAG (1<<4) /* Diagonal covariance model */ macro
/external/eigen/blas/
H A Dctbmv.f1 SUBROUTINE CTBMV(UPLO,TRANS,DIAG,N,K,A,LDA,X,INCX)
4 CHARACTER DIAG,TRANS,UPLO local in subroutine:CTBMV
45 * DIAG - CHARACTER*1.
46 * On entry, DIAG specifies whether or not A is unit
49 * DIAG = 'U' or 'u' A is assumed to be unit triangular.
51 * DIAG = 'N' or 'n' A is not assumed to be unit
106 * Note that when DIAG = 'U' or 'u' the elements of the array A
169 ELSE IF (.NOT.LSAME(DIAG,'U') .AND. .NOT.LSAME(DIAG,'N')) THEN
190 NOUNIT = LSAME(DIAG,'
[all...]
H A Dctpmv.f1 SUBROUTINE CTPMV(UPLO,TRANS,DIAG,N,AP,X,INCX)
4 CHARACTER DIAG,TRANS,UPLO local in subroutine:CTPMV
45 * DIAG - CHARACTER*1.
46 * On entry, DIAG specifies whether or not A is unit
49 * DIAG = 'U' or 'u' A is assumed to be unit triangular.
51 * DIAG = 'N' or 'n' A is not assumed to be unit
73 * Note that when DIAG = 'U' or 'u', the diagonal elements of
129 ELSE IF (.NOT.LSAME(DIAG,'U') .AND. .NOT.LSAME(DIAG,'N')) THEN
146 NOUNIT = LSAME(DIAG,'
[all...]
H A Dctpsv.f1 SUBROUTINE CTPSV(UPLO,TRANS,DIAG,N,AP,X,INCX)
4 CHARACTER DIAG,TRANS,UPLO local in subroutine:CTPSV
48 * DIAG - CHARACTER*1.
49 * On entry, DIAG specifies whether or not A is unit
52 * DIAG = 'U' or 'u' A is assumed to be unit triangular.
54 * DIAG = 'N' or 'n' A is not assumed to be unit
76 * Note that when DIAG = 'U' or 'u', the diagonal elements of
132 ELSE IF (.NOT.LSAME(DIAG,'U') .AND. .NOT.LSAME(DIAG,'N')) THEN
149 NOUNIT = LSAME(DIAG,'
[all...]
H A Ddtbmv.f1 SUBROUTINE DTBMV(UPLO,TRANS,DIAG,N,K,A,LDA,X,INCX)
4 CHARACTER DIAG,TRANS,UPLO local in subroutine:DTBMV
45 * DIAG - CHARACTER*1.
46 * On entry, DIAG specifies whether or not A is unit
49 * DIAG = 'U' or 'u' A is assumed to be unit triangular.
51 * DIAG = 'N' or 'n' A is not assumed to be unit
106 * Note that when DIAG = 'U' or 'u' the elements of the array A
169 ELSE IF (.NOT.LSAME(DIAG,'U') .AND. .NOT.LSAME(DIAG,'N')) THEN
189 NOUNIT = LSAME(DIAG,'
[all...]
H A Ddtpmv.f1 SUBROUTINE DTPMV(UPLO,TRANS,DIAG,N,AP,X,INCX)
4 CHARACTER DIAG,TRANS,UPLO local in subroutine:DTPMV
45 * DIAG - CHARACTER*1.
46 * On entry, DIAG specifies whether or not A is unit
49 * DIAG = 'U' or 'u' A is assumed to be unit triangular.
51 * DIAG = 'N' or 'n' A is not assumed to be unit
73 * Note that when DIAG = 'U' or 'u', the diagonal elements of
126 ELSE IF (.NOT.LSAME(DIAG,'U') .AND. .NOT.LSAME(DIAG,'N')) THEN
142 NOUNIT = LSAME(DIAG,'
[all...]
H A Ddtpsv.f1 SUBROUTINE DTPSV(UPLO,TRANS,DIAG,N,AP,X,INCX)
4 CHARACTER DIAG,TRANS,UPLO local in subroutine:DTPSV
48 * DIAG - CHARACTER*1.
49 * On entry, DIAG specifies whether or not A is unit
52 * DIAG = 'U' or 'u' A is assumed to be unit triangular.
54 * DIAG = 'N' or 'n' A is not assumed to be unit
76 * Note that when DIAG = 'U' or 'u', the diagonal elements of
129 ELSE IF (.NOT.LSAME(DIAG,'U') .AND. .NOT.LSAME(DIAG,'N')) THEN
145 NOUNIT = LSAME(DIAG,'
[all...]
H A Dstbmv.f1 SUBROUTINE STBMV(UPLO,TRANS,DIAG,N,K,A,LDA,X,INCX)
4 CHARACTER DIAG,TRANS,UPLO local in subroutine:STBMV
45 * DIAG - CHARACTER*1.
46 * On entry, DIAG specifies whether or not A is unit
49 * DIAG = 'U' or 'u' A is assumed to be unit triangular.
51 * DIAG = 'N' or 'n' A is not assumed to be unit
106 * Note that when DIAG = 'U' or 'u' the elements of the array A
169 ELSE IF (.NOT.LSAME(DIAG,'U') .AND. .NOT.LSAME(DIAG,'N')) THEN
189 NOUNIT = LSAME(DIAG,'
[all...]
H A Dstpmv.f1 SUBROUTINE STPMV(UPLO,TRANS,DIAG,N,AP,X,INCX)
4 CHARACTER DIAG,TRANS,UPLO local in subroutine:STPMV
45 * DIAG - CHARACTER*1.
46 * On entry, DIAG specifies whether or not A is unit
49 * DIAG = 'U' or 'u' A is assumed to be unit triangular.
51 * DIAG = 'N' or 'n' A is not assumed to be unit
73 * Note that when DIAG = 'U' or 'u', the diagonal elements of
126 ELSE IF (.NOT.LSAME(DIAG,'U') .AND. .NOT.LSAME(DIAG,'N')) THEN
142 NOUNIT = LSAME(DIAG,'
[all...]
H A Dstpsv.f1 SUBROUTINE STPSV(UPLO,TRANS,DIAG,N,AP,X,INCX)
4 CHARACTER DIAG,TRANS,UPLO local in subroutine:STPSV
48 * DIAG - CHARACTER*1.
49 * On entry, DIAG specifies whether or not A is unit
52 * DIAG = 'U' or 'u' A is assumed to be unit triangular.
54 * DIAG = 'N' or 'n' A is not assumed to be unit
76 * Note that when DIAG = 'U' or 'u', the diagonal elements of
129 ELSE IF (.NOT.LSAME(DIAG,'U') .AND. .NOT.LSAME(DIAG,'N')) THEN
145 NOUNIT = LSAME(DIAG,'
[all...]
H A Dztbmv.f1 SUBROUTINE ZTBMV(UPLO,TRANS,DIAG,N,K,A,LDA,X,INCX)
4 CHARACTER DIAG,TRANS,UPLO local in subroutine:ZTBMV
45 * DIAG - CHARACTER*1.
46 * On entry, DIAG specifies whether or not A is unit
49 * DIAG = 'U' or 'u' A is assumed to be unit triangular.
51 * DIAG = 'N' or 'n' A is not assumed to be unit
106 * Note that when DIAG = 'U' or 'u' the elements of the array A
169 ELSE IF (.NOT.LSAME(DIAG,'U') .AND. .NOT.LSAME(DIAG,'N')) THEN
190 NOUNIT = LSAME(DIAG,'
[all...]
H A Dztpmv.f1 SUBROUTINE ZTPMV(UPLO,TRANS,DIAG,N,AP,X,INCX)
4 CHARACTER DIAG,TRANS,UPLO local in subroutine:ZTPMV
45 * DIAG - CHARACTER*1.
46 * On entry, DIAG specifies whether or not A is unit
49 * DIAG = 'U' or 'u' A is assumed to be unit triangular.
51 * DIAG = 'N' or 'n' A is not assumed to be unit
73 * Note that when DIAG = 'U' or 'u', the diagonal elements of
129 ELSE IF (.NOT.LSAME(DIAG,'U') .AND. .NOT.LSAME(DIAG,'N')) THEN
146 NOUNIT = LSAME(DIAG,'
[all...]
H A Dztpsv.f1 SUBROUTINE ZTPSV(UPLO,TRANS,DIAG,N,AP,X,INCX)
4 CHARACTER DIAG,TRANS,UPLO local in subroutine:ZTPSV
48 * DIAG - CHARACTER*1.
49 * On entry, DIAG specifies whether or not A is unit
52 * DIAG = 'U' or 'u' A is assumed to be unit triangular.
54 * DIAG = 'N' or 'n' A is not assumed to be unit
76 * Note that when DIAG = 'U' or 'u', the diagonal elements of
132 ELSE IF (.NOT.LSAME(DIAG,'U') .AND. .NOT.LSAME(DIAG,'N')) THEN
149 NOUNIT = LSAME(DIAG,'
[all...]
H A Dlevel2_impl.h109 else if(DIAG(*diag)==INVALID) info = 3;
118 int code = OP(*opa) | (UPLO(*uplo) << 2) | (DIAG(*diag) << 3);
164 else if(DIAG(*diag)==INVALID) info = 3;
178 int code = OP(*opa) | (UPLO(*uplo) << 2) | (DIAG(*diag) << 3);
276 else if(DIAG(*diag)==INVALID) info = 3;
366 else if(DIAG(*diag)==INVALID) info = 3;
374 if(*n==0 || (*k==0 && DIAG(*diag)==UNIT))
381 int code = OP(*op) | (UPLO(*uplo) << 2) | (DIAG(*diag) << 3);
/external/clang/include/clang/Basic/
H A DDiagnosticIDs.h51 #define DIAG(ENUM,FLAGS,DEFAULT_MAPPING,DESC,GROUP,\ macro
56 #undef DIAG macro

Completed in 281 milliseconds

12