Skip to content
Snippets Groups Projects
Commit 033900fc authored by Pan Li's avatar Pan Li
Browse files

RISC-V: Add testcases for form 2 of vector signed SAT_TRUNC


Form 2:
  #define DEF_VEC_SAT_S_TRUNC_FMT_2(NT, WT, NT_MIN, NT_MAX)             \
  void __attribute__((noinline))                                        \
  vec_sat_s_trunc_##NT##_##WT##_fmt_2 (NT *out, WT *in, unsigned limit) \
  {                                                                     \
    unsigned i;                                                         \
    for (i = 0; i < limit; i++)                                         \
      {                                                                 \
        WT x = in[i];                                                   \
        NT trunc = (NT)x;                                               \
        out[i] = (WT)NT_MIN < x && x < (WT)NT_MAX                       \
	  ? trunc                                                       \
	  : x < 0 ? NT_MIN : NT_MAX;                                    \
      }                                                                 \
  }

The below test are passed for this patch.
* The rv64gcv fully regression test.

It is test only patch and obvious up to a point, will commit it
directly if no comments in next 48H.

gcc/testsuite/ChangeLog:

	* gcc.target/riscv/rvv/autovec/vec_sat_arith.h: Add test helper macros.
	* gcc.target/riscv/rvv/autovec/unop/vec_sat_s_trunc-2-i16-to-i8.c: New test.
	* gcc.target/riscv/rvv/autovec/unop/vec_sat_s_trunc-2-i32-to-i16.c: New test.
	* gcc.target/riscv/rvv/autovec/unop/vec_sat_s_trunc-2-i32-to-i8.c: New test.
	* gcc.target/riscv/rvv/autovec/unop/vec_sat_s_trunc-2-i64-to-i16.c: New test.
	* gcc.target/riscv/rvv/autovec/unop/vec_sat_s_trunc-2-i64-to-i32.c: New test.
	* gcc.target/riscv/rvv/autovec/unop/vec_sat_s_trunc-2-i64-to-i8.c: New test.
	* gcc.target/riscv/rvv/autovec/unop/vec_sat_s_trunc-run-2-i16-to-i8.c: New test.
	* gcc.target/riscv/rvv/autovec/unop/vec_sat_s_trunc-run-2-i32-to-i16.c: New test.
	* gcc.target/riscv/rvv/autovec/unop/vec_sat_s_trunc-run-2-i32-to-i8.c: New test.
	* gcc.target/riscv/rvv/autovec/unop/vec_sat_s_trunc-run-2-i64-to-i16.c: New test.
	* gcc.target/riscv/rvv/autovec/unop/vec_sat_s_trunc-run-2-i64-to-i32.c: New test.
	* gcc.target/riscv/rvv/autovec/unop/vec_sat_s_trunc-run-2-i64-to-i8.c: New test.

Signed-off-by: default avatarPan Li <pan2.li@intel.com>
parent 1f3a9c08
No related branches found
No related tags found
No related merge requests found
Showing
with 172 additions and 0 deletions
/* { dg-do compile } */
/* { dg-options "-march=rv64gcv -mabi=lp64d -O3 -fdump-rtl-expand-details" } */
#include "../vec_sat_arith.h"
DEF_VEC_SAT_S_TRUNC_FMT_2(int8_t, int16_t, INT8_MIN, INT8_MAX)
/* { dg-final { scan-rtl-dump-times ".SAT_TRUNC " 2 "expand" } } */
/* { dg-final { scan-assembler-times {vnclip\.wi} 1 } } */
/* { dg-do compile } */
/* { dg-options "-march=rv64gcv -mabi=lp64d -O3 -fdump-rtl-expand-details" } */
#include "../vec_sat_arith.h"
DEF_VEC_SAT_S_TRUNC_FMT_2(int16_t, int32_t, INT16_MIN, INT16_MAX)
/* { dg-final { scan-rtl-dump-times ".SAT_TRUNC " 2 "expand" } } */
/* { dg-final { scan-assembler-times {vnclip\.wi} 1 } } */
/* { dg-do compile } */
/* { dg-options "-march=rv64gcv -mabi=lp64d -O3 -fdump-rtl-expand-details" } */
#include "../vec_sat_arith.h"
DEF_VEC_SAT_S_TRUNC_FMT_2(int8_t, int32_t, INT8_MIN, INT8_MAX)
/* { dg-final { scan-rtl-dump-times ".SAT_TRUNC " 2 "expand" } } */
/* { dg-final { scan-assembler-times {vnclip\.wi} 2 } } */
/* { dg-do compile } */
/* { dg-options "-march=rv64gcv -mabi=lp64d -O3 -fdump-rtl-expand-details" } */
#include "../vec_sat_arith.h"
DEF_VEC_SAT_S_TRUNC_FMT_2(int16_t, int64_t, INT16_MIN, INT16_MAX)
/* { dg-final { scan-rtl-dump-times ".SAT_TRUNC " 2 "expand" } } */
/* { dg-final { scan-assembler-times {vnclip\.wi} 2 } } */
/* { dg-do compile } */
/* { dg-options "-march=rv64gcv -mabi=lp64d -O3 -fdump-rtl-expand-details" } */
#include "../vec_sat_arith.h"
DEF_VEC_SAT_S_TRUNC_FMT_2(int32_t, int64_t, INT32_MIN, INT32_MAX)
/* { dg-final { scan-rtl-dump-times ".SAT_TRUNC " 2 "expand" } } */
/* { dg-final { scan-assembler-times {vnclip\.wi} 1 } } */
/* { dg-do compile } */
/* { dg-options "-march=rv64gcv -mabi=lp64d -O3 -fdump-rtl-expand-details" } */
#include "../vec_sat_arith.h"
DEF_VEC_SAT_S_TRUNC_FMT_2(int8_t, int64_t, INT8_MIN, INT8_MAX)
/* { dg-final { scan-rtl-dump-times ".SAT_TRUNC " 2 "expand" } } */
/* { dg-final { scan-assembler-times {vnclip\.wi} 3 } } */
/* { dg-do run { target { riscv_v } } } */
/* { dg-additional-options "-std=c99" } */
#include "../vec_sat_arith.h"
#include "vec_sat_data.h"
#define T1 int8_t
#define T2 int16_t
DEF_VEC_SAT_S_TRUNC_FMT_2_WRAP(T1, T2, INT8_MIN, INT8_MAX)
#define T TEST_UNARY_STRUCT_DECL(T1, T2)
#define DATA TEST_UNARY_DATA_WRAP(T1, T2)
#define RUN_UNARY(out, in, N) RUN_VEC_SAT_S_TRUNC_FMT_2_WRAP(T1, T2, out, in, N)
#include "vec_sat_unary_vv_run.h"
/* { dg-do run { target { riscv_v } } } */
/* { dg-additional-options "-std=c99" } */
#include "../vec_sat_arith.h"
#include "vec_sat_data.h"
#define T1 int16_t
#define T2 int32_t
DEF_VEC_SAT_S_TRUNC_FMT_2_WRAP(T1, T2, INT16_MIN, INT16_MAX)
#define T TEST_UNARY_STRUCT_DECL(T1, T2)
#define DATA TEST_UNARY_DATA_WRAP(T1, T2)
#define RUN_UNARY(out, in, N) RUN_VEC_SAT_S_TRUNC_FMT_2_WRAP(T1, T2, out, in, N)
#include "vec_sat_unary_vv_run.h"
/* { dg-do run { target { riscv_v } } } */
/* { dg-additional-options "-std=c99" } */
#include "../vec_sat_arith.h"
#include "vec_sat_data.h"
#define T1 int8_t
#define T2 int16_t
DEF_VEC_SAT_S_TRUNC_FMT_2_WRAP(T1, T2, INT8_MIN, INT8_MAX)
#define T TEST_UNARY_STRUCT_DECL(T1, T2)
#define DATA TEST_UNARY_DATA_WRAP(T1, T2)
#define RUN_UNARY(out, in, N) RUN_VEC_SAT_S_TRUNC_FMT_2_WRAP(T1, T2, out, in, N)
#include "vec_sat_unary_vv_run.h"
/* { dg-do run { target { riscv_v } } } */
/* { dg-additional-options "-std=c99" } */
#include "../vec_sat_arith.h"
#include "vec_sat_data.h"
#define T1 int16_t
#define T2 int64_t
DEF_VEC_SAT_S_TRUNC_FMT_2_WRAP(T1, T2, INT16_MIN, INT16_MAX)
#define T TEST_UNARY_STRUCT_DECL(T1, T2)
#define DATA TEST_UNARY_DATA_WRAP(T1, T2)
#define RUN_UNARY(out, in, N) RUN_VEC_SAT_S_TRUNC_FMT_2_WRAP(T1, T2, out, in, N)
#include "vec_sat_unary_vv_run.h"
/* { dg-do run { target { riscv_v } } } */
/* { dg-additional-options "-std=c99" } */
#include "../vec_sat_arith.h"
#include "vec_sat_data.h"
#define T1 int32_t
#define T2 int64_t
DEF_VEC_SAT_S_TRUNC_FMT_2_WRAP(T1, T2, INT32_MIN, INT32_MAX)
#define T TEST_UNARY_STRUCT_DECL(T1, T2)
#define DATA TEST_UNARY_DATA_WRAP(T1, T2)
#define RUN_UNARY(out, in, N) RUN_VEC_SAT_S_TRUNC_FMT_2_WRAP(T1, T2, out, in, N)
#include "vec_sat_unary_vv_run.h"
/* { dg-do run { target { riscv_v } } } */
/* { dg-additional-options "-std=c99" } */
#include "../vec_sat_arith.h"
#include "vec_sat_data.h"
#define T1 int8_t
#define T2 int64_t
DEF_VEC_SAT_S_TRUNC_FMT_2_WRAP(T1, T2, INT8_MIN, INT8_MAX)
#define T TEST_UNARY_STRUCT_DECL(T1, T2)
#define DATA TEST_UNARY_DATA_WRAP(T1, T2)
#define RUN_UNARY(out, in, N) RUN_VEC_SAT_S_TRUNC_FMT_2_WRAP(T1, T2, out, in, N)
#include "vec_sat_unary_vv_run.h"
......@@ -664,6 +664,23 @@ vec_sat_s_trunc_##NT##_##WT##_fmt_1 (NT *out, WT *in, unsigned limit) \
#define DEF_VEC_SAT_S_TRUNC_FMT_1_WRAP(NT, WT, NT_MIN, NT_MAX) \
DEF_VEC_SAT_S_TRUNC_FMT_1(NT, WT, NT_MIN, NT_MAX)
#define DEF_VEC_SAT_S_TRUNC_FMT_2(NT, WT, NT_MIN, NT_MAX) \
void __attribute__((noinline)) \
vec_sat_s_trunc_##NT##_##WT##_fmt_2 (NT *out, WT *in, unsigned limit) \
{ \
unsigned i; \
for (i = 0; i < limit; i++) \
{ \
WT x = in[i]; \
NT trunc = (NT)x; \
out[i] = (WT)NT_MIN < x && x < (WT)NT_MAX \
? trunc \
: x < 0 ? NT_MIN : NT_MAX; \
} \
}
#define DEF_VEC_SAT_S_TRUNC_FMT_2_WRAP(NT, WT, NT_MIN, NT_MAX) \
DEF_VEC_SAT_S_TRUNC_FMT_2(NT, WT, NT_MIN, NT_MAX)
#define RUN_VEC_SAT_U_TRUNC_FMT_1(NT, WT, out, in, N) \
vec_sat_u_trunc_##NT##_##WT##_fmt_1 (out, in, N)
#define RUN_VEC_SAT_U_TRUNC_FMT_1_WRAP(NT, WT, out, in, N) \
......@@ -689,4 +706,9 @@ vec_sat_s_trunc_##NT##_##WT##_fmt_1 (NT *out, WT *in, unsigned limit) \
#define RUN_VEC_SAT_S_TRUNC_FMT_1_WRAP(NT, WT, out, in, N) \
RUN_VEC_SAT_S_TRUNC_FMT_1(NT, WT, out, in, N)
#define RUN_VEC_SAT_S_TRUNC_FMT_2(NT, WT, out, in, N) \
vec_sat_s_trunc_##NT##_##WT##_fmt_2 (out, in, N)
#define RUN_VEC_SAT_S_TRUNC_FMT_2_WRAP(NT, WT, out, in, N) \
RUN_VEC_SAT_S_TRUNC_FMT_2(NT, WT, out, in, N)
#endif
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment