Home
last modified time | relevance | path

Searched refs:sign (Results 1 – 200 of 266) sorted by relevance

12

/linux-4.4.14/lib/mpi/
Dmpi-cmp.c30 if (u->sign) in mpi_cmp_ui()
53 if (!u->sign && v->sign) in mpi_cmp()
55 if (u->sign && !v->sign) in mpi_cmp()
57 if (usize != vsize && !u->sign && !v->sign) in mpi_cmp()
59 if (usize != vsize && u->sign && v->sign) in mpi_cmp()
64 if (u->sign) in mpi_cmp()
Dmpicoder.c60 val->sign = 0; in mpi_read_raw_data()
108 val->sign = 0; in mpi_read_from_buffer()
161 int *sign) in mpi_read_buffer() argument
171 if (sign) in mpi_read_buffer()
172 *sign = a->sign; in mpi_read_buffer()
228 void *mpi_get_buffer(MPI a, unsigned *nbytes, int *sign) in mpi_get_buffer() argument
247 ret = mpi_read_buffer(a, buf, n, nbytes, sign); in mpi_get_buffer()
260 int mpi_set_buffer(MPI a, const void *xbuffer, unsigned nbytes, int sign) in mpi_set_buffer() argument
270 a->sign = sign; in mpi_set_buffer()
351 int *sign) in mpi_write_to_sgl() argument
[all …]
Dmpi-pow.c55 esign = exp->sign; in mpi_powm()
56 msign = mod->sign; in mpi_powm()
69 res->sign = 0; in mpi_powm()
87 bsign = base->sign; in mpi_powm()
107 res->sign = 0; in mpi_powm()
168 negative_result = (ep[0] & 1) && base->sign; in mpi_powm()
304 res->sign = rsign; in mpi_powm()
Dmpiutil.c50 a->sign = 0; in mpi_alloc()
/linux-4.4.14/arch/parisc/math-emu/
Ddenormal.c60 int sign, exponent; in sgl_denormalize() local
66 sign = Sgl_sign(opnd); in sgl_denormalize()
71 if (sign == 0) { in sgl_denormalize()
76 if (sign != 0) { in sgl_denormalize()
88 Sgl_set_sign(opnd,sign); in sgl_denormalize()
101 int sign, exponent; in dbl_denormalize() local
108 sign = Dbl_sign(opndp1); in dbl_denormalize()
113 if (sign == 0) { in dbl_denormalize()
118 if (sign != 0) { in dbl_denormalize()
130 Dbl_set_sign(opndp1,sign); in dbl_denormalize()
Dsgl_float.h175 #define Sgl_setinfinity(sgl_value,sign) \ argument
177 ((unsigned int)sign << 31)
180 #define Sgl_set_sign(sgl_value,sign) Deposit_ssign(sgl_value,sign) argument
209 #define Sgl_setlargest(sgl_value,sign) \ argument
210 Sall(sgl_value) = (unsigned int)sign << 31 | \
427 #define Sglext_set_sign(dbl_value,sign) Sgl_set_sign(dbl_value,sign) argument
Ddbl_float.h284 #define Dbl_setinfinity(dbl_valueA,dbl_valueB,sign) \ argument
285 Dallp1(dbl_valueA) = ((unsigned int)sign << 31) | \
290 #define Dbl_set_sign(dbl_value,sign) Deposit_dsign(dbl_value,sign) argument
340 #define Dbl_setlargest(dbl_valueA,dbl_valueB,sign) \ argument
341 Dallp1(dbl_valueA) = ((unsigned int)sign << 31) | \
735 #define Dblext_set_sign(dbl_value,sign) Dbl_set_sign(dbl_value,sign) argument
/linux-4.4.14/arch/m68k/math-emu/
Dfp_arith.c40 dest->sign = 0; in fp_fabs()
52 dest->sign = !dest->sign; in fp_fneg()
73 if (IS_INF(src) && (src->sign != dest->sign)) in fp_fadd()
84 if (src->sign != dest->sign) { in fp_fadd()
86 dest->sign = 1; in fp_fadd()
88 dest->sign = 0; in fp_fadd()
102 if (dest->sign == src->sign) { in fp_fadd()
109 dest->sign = !dest->sign; in fp_fadd()
127 src->sign = !src->sign; in fp_fsub()
138 src->sign = !src->sign; in fp_fcmp()
[all …]
Dfp_util.S99 clr.l %d1 | sign defaults to zero
107 move.l %d1,(%a0)+ | set sign / exp
132 lsr.l #8,%d1 | exponent / sign
140 9: move.l %d1,(%a0)+ | fp_ext.sign, fp_ext.exp
170 lsr.l #8,%d1 | exponent / sign
178 9: move.l %d1,(%a0)+ | fp_ext.sign, fp_ext.exp
Dfp_log.c41 if (dest->sign) { in fp_fsqrt()
/linux-4.4.14/arch/x86/math-emu/
Dfpu_trig.c155 u_char sign; in convert_l2reg() local
164 sign = SIGN_POS; in convert_l2reg()
167 sign = SIGN_NEG; in convert_l2reg()
175 setsign(dest, sign); in convert_l2reg()
357 u_char sign; in fxtract() local
371 sign = getsign(st1_ptr); in fxtract()
380 setsign(st_new_ptr, sign); in fxtract()
384 sign = getsign(st0_ptr); in fxtract()
391 setsign(st_new_ptr, sign); in fxtract()
403 sign = getsign(st1_ptr); in fxtract()
[all …]
Dreg_divide.c32 u_char taga, tagb, signa, signb, sign, saved_sign; in FPU_div() local
69 sign = signa ^ signb; in FPU_div()
80 tag = FPU_u_div(&x, &y, dest, control_w, sign); in FPU_div()
102 tag = FPU_u_div(&x, &y, dest, control_w, sign); in FPU_div()
118 setsign(dest, sign); in FPU_div()
127 return FPU_divide_by_zero(deststnr, sign); in FPU_div()
162 setsign(dest, sign); in FPU_div()
171 setsign(dest, sign); in FPU_div()
Dreg_mul.c35 u_char sign = (getsign(a) ^ getsign(b)); in FPU_mul() local
42 FPU_u_mul(a, b, dest, control_w, sign, in FPU_mul()
66 tag = FPU_u_mul(&x, &y, dest, control_w, sign, in FPU_mul()
86 setsign(dest, sign); in FPU_mul()
100 setsign(dest, sign); in FPU_mul()
104 setsign(dest, sign); in FPU_mul()
Dfpu_emu.h193 FPU_REG * answ, unsigned int control_w, u_char sign,
196 FPU_REG * answ, unsigned int control_w, u_char sign,
199 FPU_REG * answ, unsigned int control_w, u_char sign);
201 FPU_REG * answ, unsigned int control_w, u_char sign,
204 unsigned int control_w, u_char sign);
209 unsigned int control_w, u_char sign);
Dpoly_2xm1.c52 int poly_2xm1(u_char sign, FPU_REG *arg, FPU_REG *result) in poly_2xm1() argument
112 if (sign != SIGN_POS) { in poly_2xm1()
138 tag = FPU_round(result, 1, 0, FULL_PRECISION, sign); in poly_2xm1()
140 setsign(result, sign); in poly_2xm1()
Dpoly_l2.c30 u_char sign, argsign; in poly_l2() local
60 sign = SIGN_NEG; in poly_l2()
63 sign = SIGN_POS; in poly_l2()
70 if (sign ^ argsign) in poly_l2()
75 sign = argsign; in poly_l2()
92 tag = FPU_round(st1_ptr, 1, 0, FULL_PRECISION, sign ^ st1_sign); in poly_l2()
Dreg_convert.c18 int sign = getsign(a); in FPU_to_exp16() local
45 return sign; in FPU_to_exp16()
Dreg_ld_str.c38 static u_char normalize_no_excep(FPU_REG *r, int exp, int sign) in normalize_no_excep() argument
46 if (sign) in normalize_no_excep()
212 int sign; in FPU_load_int64() local
227 sign = SIGN_Positive; in FPU_load_int64()
230 sign = SIGN_Negative; in FPU_load_int64()
235 return normalize_no_excep(st0_ptr, 63, sign); in FPU_load_int64()
303 int sign; in FPU_load_bcd() local
319 FPU_get_user(sign, s + 9); in FPU_load_bcd()
320 sign = sign & 0x80 ? SIGN_Negative : SIGN_Positive; in FPU_load_bcd()
325 addexponent(st0_ptr, sign); /* Set the sign. */ in FPU_load_bcd()
[all …]
Dreg_add_sub.c132 u_char taga, tagb, signa, signb, saved_sign, sign; in FPU_sub() local
195 sign = signa ^ SIGN_NEG; in FPU_sub()
197 FPU_u_sub(b, a, dest, control_w, sign, expb, in FPU_sub()
Dfpu_proto.h12 asmlinkage int FPU_divide_by_zero(int deststnr, u_char sign);
95 extern int poly_2xm1(u_char sign, FPU_REG * arg, FPU_REG *result);
Derrors.c510 asmlinkage __visible int FPU_divide_by_zero(int deststnr, u_char sign) in FPU_divide_by_zero() argument
518 setsign(dest, sign); in FPU_divide_by_zero()
/linux-4.4.14/drivers/gpu/drm/radeon/
Dvce_v1_0.c159 struct vce_v1_0_fw_signature *sign = (void*)rdev->vce_fw->data; in vce_v1_0_load_fw() local
181 for (i = 0; i < le32_to_cpu(sign->num); ++i) { in vce_v1_0_load_fw()
182 if (le32_to_cpu(sign->val[i].chip_id) == chip_id) in vce_v1_0_load_fw()
186 if (i == le32_to_cpu(sign->num)) in vce_v1_0_load_fw()
190 data[0] = sign->val[i].nonce[0]; in vce_v1_0_load_fw()
191 data[1] = sign->val[i].nonce[1]; in vce_v1_0_load_fw()
192 data[2] = sign->val[i].nonce[2]; in vce_v1_0_load_fw()
193 data[3] = sign->val[i].nonce[3]; in vce_v1_0_load_fw()
194 data[4] = cpu_to_le32(le32_to_cpu(sign->len) + 64); in vce_v1_0_load_fw()
197 memcpy(&data[16], &sign[1], rdev->vce_fw->size - sizeof(*sign)); in vce_v1_0_load_fw()
[all …]
Dradeon_object.c51 unsigned mem_type, int sign) in radeon_update_memory_usage() argument
58 if (sign > 0) in radeon_update_memory_usage()
64 if (sign > 0) in radeon_update_memory_usage()
/linux-4.4.14/arch/arm/vfp/
Dvfpdouble.c44 .sign = 0,
51 str, d->sign != 0, d->exponent, d->significand); in vfp_double_dump()
137 } else if ((rmode == FPSCR_ROUND_PLUSINF) ^ (vd->sign != 0)) in vfp_double_normaliseround()
280 else if (vdm.sign == 0) { in vfp_double_fsqrt()
308 if (vdm.sign) in vfp_double_fsqrt()
316 vdd.sign = 0; in vfp_double_fsqrt()
459 vsd.sign = vdm.sign; in vfp_double_fcvts()
487 vdm.sign = 0; in vfp_double_fuito()
499 vdm.sign = (m & 0x80000000) >> 16; in vfp_double_fsito()
501 vdm.significand = vdm.sign ? -m : m; in vfp_double_fsito()
[all …]
Dvfpsingle.c44 .sign = 0,
51 str, s->sign != 0, s->exponent, s->significand); in vfp_single_dump()
142 } else if ((rmode == FPSCR_ROUND_PLUSINF) ^ (vs->sign != 0)) in __vfp_single_normaliseround()
328 else if (vsm.sign == 0) { in vfp_single_fsqrt()
356 if (vsm.sign) in vfp_single_fsqrt()
364 vsd.sign = 0; in vfp_single_fsqrt()
502 vdd.sign = vsm.sign; in vfp_single_fcvtd()
529 vs.sign = 0; in vfp_single_fuito()
540 vs.sign = (m & 0x80000000) >> 16; in vfp_single_fsito()
542 vs.significand = vs.sign ? -m : m; in vfp_single_fsito()
[all …]
Dvfp.h147 #define vfp_sign_negate(sign) (sign ^ 0x8000) argument
154 u16 sign; member
195 s->sign = vfp_single_packed_sign(val) >> 16, in vfp_single_unpack()
212 val = (s->sign << 16) + in vfp_single_pack()
259 u16 sign; member
304 s->sign = vfp_double_packed_sign(val) >> 48; in vfp_double_unpack()
321 val = ((u64)s->sign << 48) + in vfp_double_pack()
/linux-4.4.14/crypto/
Drsa.c84 int sign; in rsa_enc() local
109 ret = mpi_write_to_sgl(c, req->dst, &req->dst_len, &sign); in rsa_enc()
113 if (sign < 0) in rsa_enc()
129 int sign; in rsa_dec() local
154 ret = mpi_write_to_sgl(m, req->dst, &req->dst_len, &sign); in rsa_dec()
158 if (sign < 0) in rsa_dec()
173 int sign; in rsa_sign() local
198 ret = mpi_write_to_sgl(s, req->dst, &req->dst_len, &sign); in rsa_sign()
202 if (sign < 0) in rsa_sign()
218 int sign; in rsa_verify() local
[all …]
/linux-4.4.14/arch/h8300/lib/
Dmodsi3.S25 ; examine what the sign should be
39 stc ccr,S2L ; keep the sign in bit 3 of S2L
49 xor.b #0x08,S2L ; toggle the result sign
54 ;; Basically the same, except that the sign of the divisor determines
55 ;; the sign.
58 stc ccr,S2L ; keep the sign in bit 3 of S2L
Dmoddivsi3.S25 ; examine what the sign should be
39 stc ccr,S2L ; keep the sign in bit 3 of S2L
49 xor.b #0x08,S2L ; toggle the result sign
54 ;; Basically the same, except that the sign of the divisor determines
55 ;; the sign.
58 stc ccr,S2L ; keep the sign in bit 3 of S2L
/linux-4.4.14/arch/x86/boot/
Dprintf.c50 char c, sign, locase; in number() local
61 sign = 0; in number()
64 sign = '-'; in number()
68 sign = '+'; in number()
71 sign = ' '; in number()
93 if (sign) in number()
94 *str++ = sign; in number()
/linux-4.4.14/arch/m68k/fpsp040/
Ddo_func.S105 btstb #sign_bit,LOCAL_EX(%a0) |get sign of source operand
117 btstb #sign_bit,LOCAL_EX(%a0) |get sign of source operand
125 btstb #sign_bit,LOCAL_EX(%a0) |get sign of source operand
133 btstb #sign_bit,LOCAL_EX(%a0) |check sign of source
141 btstb #sign_bit,LOCAL_EX(%a0) |check sign of source
149 btstb #sign_bit,LOCAL_EX(%a0) |check sign of source
158 btstb #sign_bit,LOCAL_EX(%a0) |check sign of source
177 btstb #sign_bit,LOCAL_EX(%a0) |check sign of source
184 | the sign and return operr if negative.
302 moveb ETEMP(%a6),%d1 |get sign of src op
[all …]
Dkernel_ex.S50 | store properly signed inf (use sign of etemp) into fp0
79 btstb #sign_bit,ETEMP_EX(%a6) |check sign for neg or pos
80 beqs p_inf |branch if pos sign
95 btstb #sign_bit,ETEMP_EX(%a6) |check sign for neg or pos
134 | operand is built in FP_SCR1 and only the sign from the original operand
141 tstb (%a0) |extract sign from caller's exop
286 btstb #sign_bit,FPTEMP_EX(%a6) |test sign of nan
320 fmovex FPTEMP(%a6),%fp0 |load non-sign. nan
Dssinh.S26 | y = |X|, sgn = sign(X), and z = expm1(Y),
33 | sinh(X) = sign(X) * exp(|X|)/2.
37 | sgn := sign(X)
44 | sign(X)*Huge*Huge to generate overflow and an infinity with
45 | the appropriate sign. Huge is the largest finite number in
Dscale.S53 smi L_SCR1(%a6) |use L_SCR1 to hold sign
54 andil #0x7fff,%d1 |strip sign
56 andiw #0x7fff,%d0 |clr sign bit
90 tstw ETEMP(%a6) |check src sign
193 tstb L_SCR1(%a6) |test for sign
195 orw #0x8000,FPTEMP_EX(%a6) |set sign bit
215 tstb L_SCR1(%a6) |check sign
220 tstb L_SCR1(%a6) |check sign
Dbindec.S12 | value in memory; d0 contains the k-factor sign-extended
22 | A1. Set RM and size ext; Set SIGMA = sign of input.
56 | sign of ISCALE, used in A9. Fp1 contains
106 | A16. Write sign bits to final string.
168 | A1. Set RM and size ext. Set SIGMA = sign input;
176 movel (%a0),L_SCR2(%a6) |save exponent for sign check
187 andiw #0x7fff,%d0 |strip sign of normalized exp
203 andiw #0x7fff,%d0 |strip sign of normalized exp
306 tstl %d7 |branch on sign of k
315 tstl %d4 |LEN check: branch on sign of LEN
[all …]
Dsatanh.S27 | sgn := sign(X)
35 | 4. (|X| = 1) Generate infinity with an appropriate sign and
37 | sgn := sign(X)
Ddecbin.S25 | Set the sign according to SE. Subtract 16 to compensate
31 | adds and muls in FP0. Set the sign according to SM.
59 | exponent sign is positive, and dividing FP0 by FP1 if
126 | 3. Correct for exponent sign.
471 | Check the sign of the adjusted exp and make the value in fp0 the
472 | same sign. If the exp was pos then multiply fp1*fp0;
482 btst #30,(%a0) |test the sign of the exponent
Dsint.S40 | for the given sign and rounding mode.
149 | Input is less than zero. Restore sign, and check for directed
155 tstb LOCAL_SGN(%a0) |check for sign
182 tstb LOCAL_SGN(%a0) |check for sign
Dx_store.S141 bsetl #31,%d0 |if negative, put in sign information
149 bsetl #31,%d0 |if negative put in sign information
244 tstb LOCAL_SGN(%a1) |put back sign into exponent word
248 clrb LOCAL_SGN(%a1) |clear out the sign byte
Dfpsp.h131 .set WBTEMP_EX,WBTEMP | wbtemp sign and exponent (2 bytes)
135 .set WBTEMP_SGN,WBTEMP+2 | used to store sign
200 .set FPTEMP_EX,FPTEMP | fptemp sign and exponent (2 bytes)
204 .set FPTEMP_SGN,FPTEMP+2 | used to store sign
207 .set ETEMP_EX,ETEMP | etemp sign and exponent (2 bytes)
211 .set ETEMP_SGN,ETEMP+2 | used to store sign
227 .set q_sn_bit,7 | sign bit of quotient byte
Dsrem_mod.S23 | Step 1. Save and strip signs of X and Y: signX := sign(X),
24 | signY := sign(Y), X := |X|, Y := |Y|,
109 |..Save sign of X and Y
161 movew %d1,SignQ(%a6) | ...sign(Q) obtained
356 |..Get sign of X
365 movew SignQ(%a6),%d6 | ...D6 is sign(Q)
369 orl %d6,%d3 | ...sign and bits of Q
Dx_ovfl.S20 | RN Infinity with the sign of the intermediate result.
21 | RZ Largest magnitude number, with the sign of the
Dget_op.S522 tstl ETEMP(%a6) |test sign of the zero
561 tstl ETEMP(%a6) |check sign
575 tstl ETEMP(%a6) |check for sign
589 tstl ETEMP(%a6) |test sign of the zero
637 andiw #0x7fff,%d1 |strip sign
Dutil.S194 bra set_sign |now go set the sign
197 bra set_sign |now go set the sign
228 bra set_sign |now go set the sign
289 movew LOCAL_EX(%a1),LOCAL_EX(%a0) |do not overwrite sign
467 | are unnecessary as unf_sub always returns the sign separately from
524 bra uset_sign |now go set the sign
528 bra uset_sign |now go set the sign
560 bra uset_sign |now go set the sign
622 movew LOCAL_EX(%a1),LOCAL_EX(%a0) |be careful not to overwrite sign
Dres_func.S72 bclrb #sign_bit,LOCAL_EX(%a0) |get rid of false sign
448 movel ETEMP_EX(%a6),FPTEMP_EX(%a6) |set up fptemp sign for
501 tstw LOCAL_EX(%a0) |check sign
516 tstw LOCAL_EX(%a0) |check sign
631 | replace exponent of src with $3fff (keep sign)
641 | replace exponent of src with $3fff (keep sign)
711 movew ETEMP_EX(%a6),%d0 |find the sign of the result
750 movew ETEMP_EX(%a6),%d0 |find the sign of the result
825 | can be used to add the norm and 1.0 with the sign of the
1000 | can be used to subtract from the norm 1.0 with the sign of the
[all …]
Dsgetem.S50 bclrl #15,%d0 |clear the sign bit
81 movew LOCAL_EX(%a0),%d0 |get the exp (really just want sign bit)
84 movew %d0,LOCAL_EX(%a0) |move the sign & exp back to fsave stack
Dstanh.S26 | sgn := sign(X), y := 2|X|, z := expm1(Y), and
36 | sgn := sign(X), y := 2|X|, z := exp(Y),
42 | sgn := sign(X), Tiny := 2**(-126),
Dscosh.S33 | cosh(X) = sign(X) * exp(|X|)/2.
44 | the appropriate sign. Huge is the largest finite number in
Dx_operr.S174 andw #0x7FFF,%d0 |ignore sign bit
201 andw #0x7FFF,%d0 |ignore sign bit
232 tstw FPTEMP_EX(%a6) |check sign
Dsasin.S32 | 4. (|X| = 1) sgn := sign(X), return asin(X) := sgn * Pi/2. Exit.
Dround.S78 | If sign of fp number = 0 (positive), then add 1 to l.
82 tstb LOCAL_SGN(%a0) |check for sign
422 bsetb #7,LOCAL_EX(%a0) |sign extend if it is so
595 | correct sign.
/linux-4.4.14/arch/sh/kernel/cpu/sh2a/
Dfpu.c258 int sign; in denormal_addf() local
261 sign = hx & 0x80000000; in denormal_addf()
268 sign ^= 0x80000000; in denormal_addf()
272 sign ^= 0x80000000; in denormal_addf()
275 sign = hx & 0x80000000; in denormal_addf()
284 return sign | ix; in denormal_addf()
343 long long sign; in denormal_addd() local
346 sign = hx & 0x8000000000000000LL; in denormal_addd()
353 sign ^= 0x8000000000000000LL; in denormal_addd()
357 sign ^= 0x8000000000000000LL; in denormal_addd()
[all …]
/linux-4.4.14/include/linux/
Dmpi.h46 int sign; /* indicates a negative number */ member
56 #define mpi_is_neg(a) ((a)->sign)
79 void *mpi_get_buffer(MPI a, unsigned *nbytes, int *sign);
81 int *sign);
82 void *mpi_get_secure_buffer(MPI a, unsigned *nbytes, int *sign);
83 int mpi_set_buffer(MPI a, const void *buffer, unsigned nbytes, int sign);
85 int *sign);
/linux-4.4.14/arch/alpha/boot/
Dstdio.c49 char c,sign,tmp[66]; in number() local
60 sign = 0; in number()
63 sign = '-'; in number()
67 sign = '+'; in number()
70 sign = ' '; in number()
92 if (sign) in number()
93 *str++ = sign; in number()
/linux-4.4.14/arch/powerpc/boot/
Dstdio.c75 char c,sign,tmp[66]; in number() local
86 sign = 0; in number()
89 sign = '-'; in number()
93 sign = '+'; in number()
96 sign = ' '; in number()
118 if (sign) in number()
119 *str++ = sign; in number()
/linux-4.4.14/arch/arm/kernel/
Dmodule.c71 u32 upper, lower, sign, j1, j2; in apply_relocate() local
214 sign = (upper >> 10) & 1; in apply_relocate()
217 offset = (sign << 24) | ((~(j1 ^ sign) & 1) << 23) | in apply_relocate()
218 ((~(j2 ^ sign) & 1) << 22) | in apply_relocate()
245 sign = (offset >> 24) & 1; in apply_relocate()
246 j1 = sign ^ (~(offset >> 23) & 1); in apply_relocate()
247 j2 = sign ^ (~(offset >> 22) & 1); in apply_relocate()
248 upper = (u16)((upper & 0xf800) | (sign << 10) | in apply_relocate()
/linux-4.4.14/drivers/iio/common/hid-sensors/
Dhid-sensor-attributes.c112 int sign = 1; in convert_from_vtf_format() local
116 sign = -1; in convert_from_vtf_format()
120 *val1 = sign * value * pow_10(exp); in convert_from_vtf_format()
125 *val1 = sign * (*val1); in convert_from_vtf_format()
127 *val2 = sign * (*val2); in convert_from_vtf_format()
134 int sign = 1; in convert_to_vtf_format() local
137 sign = -1; in convert_to_vtf_format()
144 if (sign < 0) in convert_to_vtf_format()
/linux-4.4.14/drivers/isdn/i4l/
Disdn_audio.c263 int sign, in isdn_audio_linear2ulaw() local
269 sign = (sample >> 8) & 0x80; /* set aside the sign */ in isdn_audio_linear2ulaw()
270 if (sign != 0) in isdn_audio_linear2ulaw()
279 ulawbyte = ~(sign | (exponent << 4) | mantissa); in isdn_audio_linear2ulaw()
371 int sign; in isdn_audio_adpcm2xlaw() local
375 sign = (e >> (nbits - 1)) ? -1 : 1; in isdn_audio_adpcm2xlaw()
377 a += sign * ((e << 1) + 1) * d >> 1; in isdn_audio_adpcm2xlaw()
407 int sign, in isdn_audio_xlaw2adpcm() local
425 sign = (e >> (nbits - 1)) ? -1 : 1; in isdn_audio_xlaw2adpcm()
428 a += sign * ((e << 1) + 1) * d >> 1; in isdn_audio_xlaw2adpcm()
/linux-4.4.14/drivers/staging/iio/meter/
Dade7758_core.c641 .sign = 's',
652 .sign = 's',
664 .sign = 's',
676 .sign = 's',
688 .sign = 's',
699 .sign = 's',
710 .sign = 's',
722 .sign = 's',
734 .sign = 's',
746 .sign = 's',
[all …]
/linux-4.4.14/drivers/acpi/acpica/
Dutprint.c246 char sign; in acpi_ut_format_number() local
270 sign = '\0'; in acpi_ut_format_number()
273 sign = '-'; in acpi_ut_format_number()
277 sign = '+'; in acpi_ut_format_number()
280 sign = ' '; in acpi_ut_format_number()
311 if (sign) { in acpi_ut_format_number()
312 string = acpi_ut_bound_string_output(string, end, sign); in acpi_ut_format_number()
/linux-4.4.14/drivers/firmware/
Discsi_ibft_find.c46 char *sign; member
73 if (memcmp(virt, ibft_signs[i].sign, IBFT_SIGN_LEN) == in find_ibft_in_mem()
Discsi_ibft.c757 char *sign; member
777 acpi_get_table(ibft_signs[i].sign, 0, &table); in acpi_find_ibft_region()
/linux-4.4.14/arch/ia64/kernel/
Dftrace.c36 u64 sign:1; member
153 call_insn->sign = tmp_call->sign; in ftrace_make_nop_check()
/linux-4.4.14/drivers/iio/common/ssp_sensors/
Dssp_iio_sensor.h12 .sign = 's',\
26 .sign = 's', \
/linux-4.4.14/arch/mips/math-emu/
Dieee754dp.h39 #define DPSIGN(dp) (dp.sign)
73 r.sign = s; in builddp()
Dieee754sp.h39 #define SPSIGN(sp) (sp.sign)
78 r.sign = s; in buildsp()
Dieee754.c44 .sign = (s), \
Dieee754.h36 __BITFIELD_FIELD(unsigned int sign:1,
46 __BITFIELD_FIELD(unsigned sign:1,
/linux-4.4.14/sound/soc/codecs/
Dda732x.c1274 u8 sign[DA732X_HP_DACS]; in da732x_dac_offset_adjust() local
1293 sign[DA732X_HPL_DAC] = (snd_soc_read(codec, DA732X_REG_HPL_DAC_OFF_CNTL) & in da732x_dac_offset_adjust()
1295 sign[DA732X_HPR_DAC] = (snd_soc_read(codec, DA732X_REG_HPR_DAC_OFF_CNTL) & in da732x_dac_offset_adjust()
1299 offset[DA732X_HPL_DAC] = sign[DA732X_HPL_DAC] << DA732X_HP_DAC_COMPO_SHIFT; in da732x_dac_offset_adjust()
1300 offset[DA732X_HPR_DAC] = sign[DA732X_HPR_DAC] << DA732X_HP_DAC_COMPO_SHIFT; in da732x_dac_offset_adjust()
1313 DA732X_HP_DAC_OFF_CNTL_COMPO) ^ sign[DA732X_HPL_DAC]) in da732x_dac_offset_adjust()
1316 DA732X_HP_DAC_OFF_CNTL_COMPO) ^ sign[DA732X_HPR_DAC]) in da732x_dac_offset_adjust()
1338 u8 sign[DA732X_HP_AMPS]; in da732x_output_offset_adjust() local
1356 sign[DA732X_HPL_AMP] = snd_soc_read(codec, DA732X_REG_HPL) & in da732x_output_offset_adjust()
1358 sign[DA732X_HPR_AMP] = snd_soc_read(codec, DA732X_REG_HPR) & in da732x_output_offset_adjust()
[all …]
/linux-4.4.14/include/math-emu/
Ddouble.h60 unsigned sign : 1; member
68 unsigned sign : 1;
134 unsigned sign : 1; member
140 unsigned sign : 1;
Dquad.h61 unsigned sign : 1; member
73 unsigned sign : 1;
139 unsigned sign : 1; member
147 unsigned sign : 1;
Dop-1.h81 X##_s = _flo.bits.sign; \
91 X##_s = _flo->bits.sign; \
104 _flo.bits.sign = X##_s; \
116 _flo->bits.sign = X##_s; \
Dsingle.h51 unsigned sign : 1; member
57 unsigned sign : 1;
Dop-2.h192 X##_s = _flo.bits.sign; \
203 X##_s = _flo->bits.sign; \
218 _flo.bits.sign = X##_s; \
231 _flo->bits.sign = X##_s; \
Dop-4.h192 X##_s = _flo.bits.sign; \
205 X##_s = _flo->bits.sign; \
216 _flo.bits.sign = X##_s; \
230 _flo->bits.sign = X##_s; \
/linux-4.4.14/drivers/isdn/mISDN/
Ddsp_audio.c124 int sign, exponent, mantissa; in linear2ulaw() local
128 sign = (sample >> 8) & 0x80; /* set aside the sign */ in linear2ulaw()
129 if (sign != 0) in linear2ulaw()
136 ulawbyte = ~(sign | (exponent << 4) | mantissa); in linear2ulaw()
/linux-4.4.14/arch/arm/nwfpe/
Dsoftfloat-specialize65 flag sign;
114 z.sign = a>>31;
130 return ( ( (bits32) a.sign )<<31 ) | 0x7FC00000 | ( a.high>>41 );
208 z.sign = a>>63;
225 ( ( (bits64) a.sign )<<63 )
316 z.sign = a.high>>15;
334 z.high = ( ( (bits16) a.sign )<<15 ) | 0x7FFF;
/linux-4.4.14/Documentation/
Dmodule-signing.txt67 (2) "Automatically sign all modules" (CONFIG_MODULE_SIG_ALL)
73 scripts/sign-file
79 sign the modules with:
209 To manually sign a module, use the scripts/sign-file tool available in
217 The following is an example to sign a kernel module:
219 scripts/sign-file sha512 kernel-signkey.priv \
270 Since the private key is used to sign modules, viruses and malware could use
271 the private key to sign modules and compromise the operating system. The
Dstable_kernel_rules.txt44 in the sign-off area. Once the patch is merged it will be applied to
79 format in the sign-off area:
94 specified in the following format in the sign-off area:
Demail-clients.txt136 You can safely GPG sign attachments, but inlined text is preferred for
137 patches so do not GPG sign them. Signing patches that have been inserted
210 # Sender, email address, and sign-off line must match
DSubmittingPatches143 long, that's a sign that you probably need to split up your patch.
302 into the sign-off area of your patch (note, NOT an email recipient). You
414 layers of maintainers, we've introduced a "sign-off" procedure on
417 The sign-off is a simple line at the end of the explanation for the
444 personal information I submit with it, including my sign-off) is
456 point out some special detail about the sign-off.
771 be a good way to find developers who can sign your key.
/linux-4.4.14/kernel/trace/
Dtrace_probe.h205 #define __ASSIGN_FETCH_TYPE(_name, ptype, ftype, _size, sign, _fmttype) \ argument
208 .is_signed = sign, \
224 #define ASSIGN_FETCH_TYPE(ptype, ftype, sign) \ argument
225 __ASSIGN_FETCH_TYPE(#ptype, ptype, ftype, sizeof(ftype), sign, #ptype)
/linux-4.4.14/Documentation/zh_CN/
DSubmittingPatches249 建议在发送出去的补丁上加一个 “sign-off” 的过程。
251 "sign-off" 是在补丁的注释的最后的简单的一行文字,认证你编写了它或者其他
265 一起提交的个人记录,包括 sign-off )被永久维护并且可以和这个项目
273 内部的过程,或者只是指出关于 sign-off 的一些特殊细节。
/linux-4.4.14/drivers/iio/pressure/
Dst_pressure_core.c115 .sign = 'u',
130 .sign = 'u',
151 .sign = 'u',
165 .sign = 'u',
Dmpl3115.c188 .sign = 'u',
201 .sign = 's',
Dhid-sensor-press.c63 channels[channel].scan_type.sign = 's'; in press_adjust_channel_bit_mask()
/linux-4.4.14/arch/arm64/include/asm/
Dcpufeature.h54 bool sign; /* Value is signed ? */ member
150 return ftrp->sign ? in arm64_ftr_value()
/linux-4.4.14/include/linux/iio/imu/
Dadis.h171 .sign = 'u', \
195 .sign = 'u', \
213 .sign = 's', \
/linux-4.4.14/fs/ncpfs/
Dsock.c71 u_int32_t sign[6]; member
275 cpu_to_le32(req->tx_totallen), req->sign); in ncpdgram_start_request()
277 req->tx_ciov[1].iov_base = req->sign; in ncpdgram_start_request()
303 cpu_to_be32(req->tx_totallen + 24), req->sign + 4) + 16; in ncptcp_start_request()
305 req->sign[0] = htonl(NCP_TCP_XMIT_MAGIC); in ncptcp_start_request()
306 req->sign[1] = htonl(req->tx_totallen + signlen); in ncptcp_start_request()
307 req->sign[2] = htonl(NCP_TCP_XMIT_VERSION); in ncptcp_start_request()
308 req->sign[3] = htonl(req->datalen + 8); in ncptcp_start_request()
309 req->tx_iov[0].iov_base = req->sign; in ncptcp_start_request()
Dioctl.c459 struct ncp_sign_init sign; in __ncp_ioctl() local
462 if (copy_from_user(&sign, argp, sizeof(sign))) in __ncp_ioctl()
468 memcpy(server->sign_root,sign.sign_root,8); in __ncp_ioctl()
469 memcpy(server->sign_last,sign.sign_last,16); in __ncp_ioctl()
/linux-4.4.14/Documentation/ja_JP/
DSubmittingPatches302 メールでやり取りされるパッチに対して「 sign-off 」という手続きを導入し
305sign-off 」とは、パッチがあなたの書いたものであるか、あるいは、
329 る。同時に、関与した記録(投稿の際の全ての個人情報と sign-off を
340 人によっては sign-off の近くに追加のタグを付加しています。それらは今のところ
341 無視されますが、あなたはそのタグを社内の手続きに利用したり、sign-off に特別
/linux-4.4.14/drivers/staging/iio/
Diio_simple_dummy.c142 .sign = 'u', /* unsigned */
181 .sign = 's', /* signed */
199 .sign = 's',
226 .sign = 's', /* signed */
/linux-4.4.14/drivers/net/wireless/ath/ath9k/
Dhw.h839 #define totalIqCorrMeas meas2.sign
844 #define totalAdcDcOffsetIOddPhase meas0.sign
845 #define totalAdcDcOffsetIEvenPhase meas1.sign
846 #define totalAdcDcOffsetQOddPhase meas2.sign
847 #define totalAdcDcOffsetQEvenPhase meas3.sign
850 int32_t sign[AR5416_MAX_CHAINS]; member
854 int32_t sign[AR5416_MAX_CHAINS]; member
858 int32_t sign[AR5416_MAX_CHAINS]; member
862 int32_t sign[AR5416_MAX_CHAINS]; member
Dcalib.c176 ah->meas0.sign[i] = 0; in ath9k_hw_reset_calibration()
177 ah->meas1.sign[i] = 0; in ath9k_hw_reset_calibration()
178 ah->meas2.sign[i] = 0; in ath9k_hw_reset_calibration()
179 ah->meas3.sign[i] = 0; in ath9k_hw_reset_calibration()
/linux-4.4.14/scripts/
D.gitignore15 sign-file
DMakefile20 hostprogs-$(CONFIG_MODULE_SIG) += sign-file
DMakefile.extrawarn65 KBUILD_CFLAGS += $(call cc-disable-warning, sign-compare)
/linux-4.4.14/drivers/iio/imu/
Dadis16400_core.c475 .sign = 'u', \
501 .sign = 's', \
521 .sign = 's', \
540 .sign = 's', \
566 .sign = 's', \
585 .sign = 's', \
603 .sign = 's', \
656 .sign = 's',
Dadis16480.c582 .sign = 's', \
621 .sign = 's', \
639 .sign = 's', \
Dadis.c394 if (chan->scan_type.sign == 's') in adis_single_conversion()
/linux-4.4.14/drivers/net/usb/
Dcdc_mbim.c225 __le32 sign = cpu_to_le32(USB_CDC_MBIM_NDP16_IPS_SIGN); in cdc_mbim_tx_fixup() local
275 c = (u8 *)&sign; in cdc_mbim_tx_fixup()
281 sign = cpu_to_le32(USB_CDC_MBIM_NDP16_DSS_SIGN); in cdc_mbim_tx_fixup()
282 c = (u8 *)&sign; in cdc_mbim_tx_fixup()
293 skb_out = cdc_ncm_fill_tx_frame(dev, skb, sign); in cdc_mbim_tx_fixup()
Dcdc_ncm.c983 …c_ncm_ndp16 *cdc_ncm_ndp(struct cdc_ncm_ctx *ctx, struct sk_buff *skb, __le32 sign, size_t reserve) in cdc_ncm_ndp() argument
994 if (ctx->delayed_ndp16->dwSignature == sign) in cdc_ncm_ndp()
1008 if (ndp16->dwSignature == sign) in cdc_ncm_ndp()
1033 ndp16->dwSignature = sign; in cdc_ncm_ndp()
1039 cdc_ncm_fill_tx_frame(struct usbnet *dev, struct sk_buff *skb, __le32 sign) in cdc_ncm_fill_tx_frame() argument
1060 swap(sign, ctx->tx_rem_sign); in cdc_ncm_fill_tx_frame()
1095 sign = ctx->tx_rem_sign; in cdc_ncm_fill_tx_frame()
1104 ndp16 = cdc_ncm_ndp(ctx, skb_out, sign, skb->len + ctx->tx_modulus + ctx->tx_remainder); in cdc_ncm_fill_tx_frame()
1123 ctx->tx_rem_sign = sign; in cdc_ncm_fill_tx_frame()
/linux-4.4.14/samples/bpf/
DMakefile75 -D__KERNEL__ -D__ASM_SYSREG_H -Wno-unused-value -Wno-pointer-sign \
78 -D__KERNEL__ -D__ASM_SYSREG_H -Wno-unused-value -Wno-pointer-sign \
/linux-4.4.14/include/crypto/
Dakcipher.h93 int (*sign)(struct akcipher_request *req); member
324 return alg->sign(req); in crypto_akcipher_sign()
/linux-4.4.14/include/drm/
Ddrm_fixed.h99 unsigned shift, sign = (a >> 63) & 1; in drm_fixp_msbset() local
102 if (((a >> shift) & 1) != sign) in drm_fixp_msbset()
/linux-4.4.14/tools/perf/util/
Ddata-convert-bt.c88 bool sign = bt_ctf_field_type_integer_get_signed(type); in value_set() local
97 if (sign) { in value_set()
939 static struct bt_ctf_field_type *create_int_type(int size, bool sign, bool hex) in create_int_type() argument
947 if (sign && in create_int_type()
956 size, sign ? "un" : "", hex ? "hex" : ""); in create_int_type()
974 #define CREATE_INT_TYPE(type, size, sign, hex) \ in ctf_writer__init_data() argument
976 (type) = create_int_type(size, sign, hex); \ in ctf_writer__init_data()
/linux-4.4.14/arch/m68k/ifpsp060/src/
Disp.S1225 mov.w %d0,%a0 # sign extend displacement
1237 mov.w %d0,%a0 # sign extend displacement
1249 mov.w %d0,%a0 # sign extend displacement
1261 mov.w %d0,%a0 # sign extend displacement
1273 mov.w %d0,%a0 # sign extend displacement
1285 mov.w %d0,%a0 # sign extend displacement
1297 mov.w %d0,%a0 # sign extend displacement
1309 mov.w %d0,%a0 # sign extend displacement
1354 ext.l %d1 # sign extend word index
1362 extb.l %d0 # sign extend displacement
[all …]
Dilsp.S85 # sign info for later. Separate out special cases like divide-by-zero #
88 # Restore sign info if signed instruction. Set the condition #
145 # save the sign of the divisor
155 tst.l %d5 # chk sign of hi(dividend)
156 slt NDIVIDEND(%a6) # save sign of dividend
199 tst.b NDIVIDEND(%a6) # remainder has same sign
636 clr.b %d5 # clear sign tag
643 # the result sign is the exclusive or of the operand sign bits.
649 eori.b &0x1,%d5 # calculate correct sign
Dfpsp.S1441 andi.w &0x7fff,%d0 # strip sign
2312 andi.w &0x7fff,%d0 # strip sign
2329 andi.w &0x7fff,%d0 # strip sign
2336 mov.w %d0,FP_SRC_EX(%a6) # insert exponent with cleared sign
2342 tst.b 0x2+FP_SRC(%a6) # is sign set?
2344 bset &15,%d0 # set sign
3354 # for byte, word, and long, we simply need to test the sign of the src
5593 ftest.x %fp0 # test sign of argument
6970 # X's sign. "Huge" and "Tiny" are respectively large/tiny #
9476 clr.w LOCAL_SGN(%a0) # sign always positive
[all …]
Dpfpsp.S1440 andi.w &0x7fff,%d0 # strip sign
2311 andi.w &0x7fff,%d0 # strip sign
2328 andi.w &0x7fff,%d0 # strip sign
2335 mov.w %d0,FP_SRC_EX(%a6) # insert exponent with cleared sign
2341 tst.b 0x2+FP_SRC(%a6) # is sign set?
2343 bset &15,%d0 # set sign
3353 # for byte, word, and long, we simply need to test the sign of the src
4837 mov.w %d0,%a0 # sign extend displacement
4850 mov.w %d0,%a0 # sign extend displacement
4863 mov.w %d0,%a0 # sign extend displacement
[all …]
Dfplsp.S422 set q_sn_bit, 0x7 # sign bit of quotient byte
493 set sign_bit, 0x7 # sign bit
5034 and.l &0x7FFFFFFF,%d1 # strip sign
5918 ftest.x %fp0 # test sign of argument
6073 # Arctan(X) = sign(X)*Pi/2 + arctan(X'). Exit. #
6515 # 4. (|X| = 1) sgn := sign(X), return asin(X) := sgn * Pi/2. Exit.#
6706 # Step 2. Return ans := ans + sign(X)*2^(-126). Exit. #
6722 # are the sign and biased exponent field of |X|; the #
7255 ori.l &0x00800000,(%sp) # sign(X)*2^(-126)
7518 bclr &0xf,%d0 # clear the sign bit
[all …]
/linux-4.4.14/arch/alpha/oprofile/
DMakefile1 ccflags-y := -Werror -Wno-sign-compare
/linux-4.4.14/arch/alpha/lib/
Dev6-csum_ipv6_magic.S80 addl $19,$7,$19 # E : U L U L : <sign bits>bbaabb00
99 zap $19,0x3,$19 # U : <sign bits>bbaa0000
/linux-4.4.14/drivers/usb/misc/
Dcytherm.c148 int temp, sign; in show_temp() local
166 sign = buffer[1]; in show_temp()
170 return sprintf(buf, "%c%i.%i", sign ? '-' : '+', temp >> 1, in show_temp()
/linux-4.4.14/tools/virtio/
DMakefile6 CFLAGS += -g -O2 -Werror -Wall -I. -I../include/ -I ../../usr/include/ -Wno-pointer-sign -fno-stric…
/linux-4.4.14/arch/mn10300/lib/
D__ashrdi3.S47 ext d0 # sign-extend result through MDR
/linux-4.4.14/fs/btrfs/
Dqgroup.c1046 u64 num_bytes, int sign) in __qgroup_excl_accounting() argument
1058 qgroup->rfer += sign * num_bytes; in __qgroup_excl_accounting()
1059 qgroup->rfer_cmpr += sign * num_bytes; in __qgroup_excl_accounting()
1061 WARN_ON(sign < 0 && qgroup->excl < num_bytes); in __qgroup_excl_accounting()
1062 qgroup->excl += sign * num_bytes; in __qgroup_excl_accounting()
1063 qgroup->excl_cmpr += sign * num_bytes; in __qgroup_excl_accounting()
1064 if (sign > 0) in __qgroup_excl_accounting()
1081 qgroup->rfer += sign * num_bytes; in __qgroup_excl_accounting()
1082 qgroup->rfer_cmpr += sign * num_bytes; in __qgroup_excl_accounting()
1083 WARN_ON(sign < 0 && qgroup->excl < num_bytes); in __qgroup_excl_accounting()
[all …]
/linux-4.4.14/fs/nfsd/
Dnfsctl.c545 char *vers, *minorp, sign; in __write_versions() local
567 sign = *vers; in __write_versions()
568 if (sign == '+' || sign == '-') in __write_versions()
578 if (nfsd_minorversion(minor, sign == '-' ? in __write_versions()
587 nfsd_vers(num, sign == '-' ? NFSD_CLEAR : NFSD_SET); in __write_versions()
/linux-4.4.14/drivers/iio/adc/
Dad7266.c165 if (chan->scan_type.sign == 's') in ad7266_read_raw()
200 .sign = (_sign), \
248 .sign = _sign, \
Dqcom-spmi-iadc.c441 int ret, sign, int_sense; in iadc_rsense_read() local
462 sign = (deviation & IADC_NOMINAL_RSENSE_SIGN_MASK) ? -1 : 1; in iadc_rsense_read()
468 int_sense += sign * deviation * IADC_INT_RSENSE_DEVIATION; in iadc_rsense_read()
Dad7887.c203 .sign = 'u',
219 .sign = 'u',
Dad7298.c68 .sign = 'u', \
86 .sign = 's',
Dcc10001_adc.c292 chan->scan_type.sign = 'u'; in cc10001_adc_channel_init()
304 timestamp->scan_type.sign = 's'; in cc10001_adc_channel_init()
Dxilinx-xadc-core.c830 if (chan->scan_type.sign == 'u') in xadc_read_raw()
965 .sign = 'u', \
985 .sign = ((_addr) == XADC_REG_VREFN) ? 's' : 'u', \
1108 chan->scan_type.sign = 's'; in xadc_parse_dt()
1228 if (indio_dev->channels[i].scan_type.sign == 's') in xadc_probe()
Dmax1027.c98 .sign = 'u', \
114 .sign = 'u', \
Dad7476.c143 .sign = 'u', \
Dvf610_adc.c522 .sign = 'u', \
534 .sign = 'u', \
Dad7923.c94 .sign = 'u', \
/linux-4.4.14/arch/sparc/
DMakefile41 KBUILD_CFLAGS += -ffixed-g4 -ffixed-g5 -fcall-used-g7 -Wno-sign-compare
/linux-4.4.14/arch/arm/lib/
Dlib1funcs.S261 eor ip, r0, r1 @ save the sign of the result.
279 10: teq ip, r0 @ same sign ?
305 movs ip, r0 @ preserve sign of dividend
/linux-4.4.14/include/linux/usb/
Dcdc_ncm.h144 struct sk_buff *cdc_ncm_fill_tx_frame(struct usbnet *dev, struct sk_buff *skb, __le32 sign);
/linux-4.4.14/include/linux/iio/
Diio.h233 char sign; member
278 .sign = 's', \
/linux-4.4.14/drivers/media/pci/saa7134/
Dsaa7134-alsa.c513 int bswap, sign; in snd_card_saa7134_capture_prepare() local
529 sign = 1; in snd_card_saa7134_capture_prepare()
531 sign = 0; in snd_card_saa7134_capture_prepare()
544 if (sign) in snd_card_saa7134_capture_prepare()
560 if (!sign) in snd_card_saa7134_capture_prepare()
/linux-4.4.14/Documentation/x86/x86_64/
Dmm.txt7 hole caused by [48:63] sign extension
/linux-4.4.14/drivers/iio/magnetometer/
Dmag3110.c281 .sign = 's', \
298 .sign = 's',
Dhid-sensor-magn-3d.c143 channels[channel].scan_type.sign = 's'; in magn_3d_adjust_channel_bit_mask()
/linux-4.4.14/drivers/usb/host/
Dehci-sched.c206 static void bandwidth_dbg(struct ehci_hcd *ehci, int sign, char *type, in bandwidth_dbg() argument
212 (sign >= 0 ? "reserve" : "release"), type, in bandwidth_dbg()
219 struct ehci_qh *qh, int sign) in reserve_release_intr_bandwidth() argument
232 bandwidth_dbg(ehci, sign, "intr", &qh->ps); in reserve_release_intr_bandwidth()
234 if (sign < 0) { /* Release bandwidth */ in reserve_release_intr_bandwidth()
260 if (sign > 0) in reserve_release_intr_bandwidth()
1332 struct ehci_iso_stream *stream, int sign) in reserve_release_iso_bandwidth() argument
1346 bandwidth_dbg(ehci, sign, "iso", &stream->ps); in reserve_release_iso_bandwidth()
1348 if (sign < 0) { /* Release bandwidth */ in reserve_release_iso_bandwidth()
1376 if (sign > 0) in reserve_release_iso_bandwidth()
/linux-4.4.14/tools/power/cpupower/
DMakefile120 WARNINGS += $(call cc-supports,-Wno-pointer-sign)
/linux-4.4.14/Documentation/arm64/
Dtagged-pointers.txt34 be set to a sign-extension of bit 55 on exception return.
/linux-4.4.14/drivers/staging/iio/impedance-analyzer/
Dad5933.c120 .sign = 's',
132 .sign = 's',
144 .sign = 's',
/linux-4.4.14/drivers/net/wireless/iwlegacy/
D4965.c570 s32 sign = 1; in il4965_math_div_round() local
573 sign = -sign; in il4965_math_div_round()
577 sign = -sign; in il4965_math_div_round()
581 *res = ((num * 2 + denom) / (denom * 2)) * sign; in il4965_math_div_round()
/linux-4.4.14/drivers/iio/light/
Dacpi-als.c53 .sign = 's',
Dadjd_s311.c156 .sign = 'u', \
Disl29125.c66 .sign = 'u', \
Dhid-sensor-prox.c59 channels[channel].scan_type.sign = 's'; in prox_adjust_channel_bit_mask()
Dhid-sensor-als.c66 channels[channel].scan_type.sign = 's'; in als_adjust_channel_bit_mask()
Dtcs3472.c72 .sign = 'u', \
Dtcs3414.c73 .sign = 'u', \
Dgp2ap020a00f.c1344 .sign = 'u',
1361 .sign = 'u',
1375 .sign = 'u',
/linux-4.4.14/fs/cifs/
Dsmb2pdu.c137 if (tcon->ses && tcon->ses->server && tcon->ses->server->sign) in smb2_hdr_assemble()
408 if (ses->sign) in SMB2_negotiate()
489 rc = cifs_enable_signing(server, ses->sign); in SMB2_negotiate()
521 if (tcon->ses->server->sign == false) in smb3_validate_negotiate()
529 if (tcon->ses->sign) in smb3_validate_negotiate()
638 if (server->sign) in SMB2_sess_setup()
812 if (server->sign && server->ops->generate_signingkey) { in SMB2_sess_setup()
837 if (!server->sign) { in SMB2_sess_setup()
874 if (server->sign) in SMB2_logoff()
1961 if (server->sign) { in smb2_readv_callback()
[all …]
Dconnect.c1049 vol->sign = false; in cifs_parse_security_flavors()
1056 vol->sign = true; in cifs_parse_security_flavors()
1062 vol->sign = true; in cifs_parse_security_flavors()
1068 vol->sign = true; in cifs_parse_security_flavors()
1074 vol->sign = true; in cifs_parse_security_flavors()
1474 vol->sign = true; in cifs_parse_mount_options()
2063 if (vol->sign && !server->sign) in match_security()
2560 ses->sign = volume_info->sign; in cifs_get_smb_ses()
3804 if (ses->server->sign) in CIFSTCon()
4012 vol_info->sign = master_tcon->ses->sign; in cifs_construct_tcon()
Dcifsglob.h461 bool sign; /* was signing requested via mnt opts? */ member
574 bool sign; /* is signing enabled on this connection? */ member
808 bool sign; /* is signing required? */ member
Dsess.c59 if (ses->server->sign) in cifs_ssetup_hdr()
348 if (ses->server->sign) { in build_ntlmssp_negotiate_blob()
387 if (ses->server->sign) { in build_ntlmssp_auth_blob()
604 if (ses->server->sign) { in sess_establish_session()
Dtransport.c516 if (server->sign) in cifs_setup_async_request()
671 if (server->sign) { in cifs_check_receive()
Dmisc.c280 if (treeCon->ses->server->sign) in header_assemble()
/linux-4.4.14/include/linux/iio/adc/
Dad_sigma_delta.h141 .sign = 'u', \
/linux-4.4.14/drivers/media/dvb-frontends/
Dtda18271c2dd.c616 int sign = 1; in PowerScan() local
657 freq_MainPLL = RF_in + sign * Count + 1000000; in PowerScan()
674 if (sign < 0) in PowerScan()
677 sign = -sign; in PowerScan()
/linux-4.4.14/arch/s390/kernel/
Dmodule.c171 int sign, int bits, int shift) in apply_rela_bits() argument
178 if (sign) { in apply_rela_bits()
/linux-4.4.14/drivers/iio/gyro/
Dadis16136.c368 .sign = 's',
382 .sign = 's',
Ditg3200_core.c246 { .sign = 's', .realbits = 16, .storagebits = 16, .endianness = IIO_BE }
Dhid-sensor-gyro-3d.c97 channels[channel].scan_type.sign = 's'; in gyro_3d_adjust_channel_bit_mask()
/linux-4.4.14/drivers/staging/iio/accel/
Dadis16220_core.c243 bool sign; member
313 if (addr->sign) { in adis16220_read_raw()
/linux-4.4.14/lib/
Dvsprintf.c397 char sign; in number() local
408 sign = 0; in number()
411 sign = '-'; in number()
415 sign = '+'; in number()
418 sign = ' '; in number()
460 if (sign) { in number()
462 *buf = sign; in number()
/linux-4.4.14/arch/s390/
DMakefile91 KBUILD_CFLAGS += -pipe -fno-strength-reduce -Wno-sign-compare
/linux-4.4.14/drivers/iio/dac/
Dmcp4922.c53 .sign = 'u', \
Dad5624r_spi.c177 .sign = 'u', \
Dad7303.c186 .sign = 'u', \
Dad5504.c260 .sign = 'u', \
Dad5449.c208 .sign = 'u', \
Dad5764.c87 .sign = 'u', \
Dad5686.c279 .sign = 'u', \
Dad5421.c118 .sign = 'u',
Dad5791.c305 .sign = 'u', \
Dad5446.c150 .sign = 'u', \
Dad5380.c265 .sign = 'u', \
Dad5360.c111 .sign = 'u', \
/linux-4.4.14/include/linux/iio/common/
Dst_sensors.h55 .sign = s, \
/linux-4.4.14/arch/parisc/kernel/
Dmodule.c165 int sign, temp; in low_sign_unext() local
167 sign = (x >> (len-1)) & 1; in low_sign_unext()
169 return (temp << 1) | sign; in low_sign_unext()
/linux-4.4.14/drivers/iio/proximity/
Dpulsedlight-lidar-lite-v2.c57 .sign = 'u',
Das3935.c78 .sign = 'u',
/linux-4.4.14/drivers/staging/iio/adc/
Dad7280a.c515 st->channels[cnt].scan_type.sign = 'u'; in ad7280_channel_init()
530 st->channels[cnt].scan_type.sign = 'u'; in ad7280_channel_init()
538 st->channels[cnt].scan_type.sign = 's'; in ad7280_channel_init()
Dmxs-lradc.c1395 .sign = 'u', \
1420 .scan_type = {.sign = 'u', .realbits = 18, .storagebits = 32,},
1456 .scan_type = {.sign = 'u', .realbits = 18, .storagebits = 32,},
/linux-4.4.14/arch/alpha/kernel/
Dtraps.c701 unsigned long sign = (s_mem >> 31) & 0x1; in s_mem_to_reg() local
718 return (sign << 63) | (exp << 52) | (frac << 29); in s_mem_to_reg()
DMakefile7 ccflags-y := -Wno-sign-compare
/linux-4.4.14/arch/frv/include/asm/
Dmath-emu.h87 unsigned char sign; member
/linux-4.4.14/arch/m68k/include/asm/
Dmath-emu.h87 unsigned char sign; member
/linux-4.4.14/drivers/iio/orientation/
Dhid-sensor-rotation.c52 chan->scan_type.sign = 's'; in dev_rot_adjust_channel_bit_mask()
Dhid-sensor-incl-3d.c97 chan->scan_type.sign = 's'; in incl_3d_adjust_channel_bit_mask()
/linux-4.4.14/drivers/iio/accel/
Dbma180.c585 .sign = 's', \
599 .sign = 's', \
Dhid-sensor-accel-3d.c97 channels[channel].scan_type.sign = 's'; in accel_3d_adjust_channel_bit_mask()
Dmxc4005.c288 .sign = 's', \
Dstk8ba50.c116 .sign = 's', \
Dmma8452.c788 .sign = 's', \
808 .sign = 's', \
/linux-4.4.14/Documentation/input/
Dwalkera0701.txt89 first 10 nibbles. Analog value is represented by one sign bit and 9 bit
Dsentelic.txt23 Bit5 => Y sign bit
24 Bit4 => X sign bit
52 Bit5 => Y sign bit
53 Bit4 => X sign bit
434 Bit5 => 0, Y sign bit
435 Bit4 => 0, X sign bit
/linux-4.4.14/Documentation/fb/
Dintelfb.txt85 with an equals sign (=) as in the following:
/linux-4.4.14/drivers/scsi/
Deata.c621 u_int32_t sign; /* ASCII "EATA" signature */ member
1115 info.sign = DEV2H(info.sign); in port_detect()
1123 if (info.sign != EATA_SIG_BE) { in port_detect()
1125 printk("%s: signature 0x%04x discarded.\n", name, info.sign); in port_detect()
/linux-4.4.14/drivers/staging/lustre/lustre/ptlrpc/
Dsec_null.c377 .sign = null_ctx_sign,
/linux-4.4.14/drivers/staging/lustre/lustre/obdclass/
Dlprocfs_status.c1325 int sign = 1; in lprocfs_write_frac_u64_helper() local
1336 sign = -1; in lprocfs_write_frac_u64_helper()
1378 *val = sign * (whole * mult + frac); in lprocfs_write_frac_u64_helper()
/linux-4.4.14/arch/x86/
DMakefile185 KBUILD_CFLAGS += -Wno-sign-compare

12