Trait Neg

1.0.0 · Source
pub trait Neg {
    type Output;

    // Required method
    fn neg(self) -> Self::Output;
}
Expand description

The unary negation operator -.

§Examples

An implementation of Neg for Sign, which allows the use of - to negate its value.

use std::ops::Neg;

#[derive(Debug, PartialEq)]
enum Sign {
    Negative,
    Zero,
    Positive,
}

impl Neg for Sign {
    type Output = Self;

    fn neg(self) -> Self::Output {
        match self {
            Sign::Negative => Sign::Positive,
            Sign::Zero => Sign::Zero,
            Sign::Positive => Sign::Negative,
        }
    }
}

// A negative positive is a negative.
assert_eq!(-Sign::Positive, Sign::Negative);
// A double negative is a positive.
assert_eq!(-Sign::Negative, Sign::Positive);
// Zero is its own negation.
assert_eq!(-Sign::Zero, Sign::Zero);

Required Associated Types§

1.0.0 · Source

type Output

The resulting type after applying the - operator.

Required Methods§

1.0.0 · Source

fn neg(self) -> Self::Output

Performs the unary - operation.

§Example
let x: i32 = 12;
assert_eq!(-x, -12);

Implementors§

1.0.0 · Source§

impl Neg for &f16

1.0.0 · Source§

impl Neg for &f32

1.0.0 · Source§

impl Neg for &f64

1.0.0 · Source§

impl Neg for &f128

1.0.0 · Source§

impl Neg for &i8

1.0.0 · Source§

impl Neg for &i16

1.0.0 · Source§

impl Neg for &i32

1.0.0 · Source§

impl Neg for &i64

1.0.0 · Source§

impl Neg for &i128

1.0.0 · Source§

impl Neg for &isize

Source§

impl Neg for &f16

1.71.0 · Source§

impl Neg for &NonZero<i8>

1.71.0 · Source§

impl Neg for &NonZero<i16>

1.71.0 · Source§

impl Neg for &NonZero<i32>

1.71.0 · Source§

impl Neg for &NonZero<i64>

1.71.0 · Source§

impl Neg for &NonZero<i128>

1.71.0 · Source§

impl Neg for &NonZero<isize>

1.74.0 · Source§

impl Neg for &Saturating<i8>

1.74.0 · Source§

impl Neg for &Saturating<i16>

1.74.0 · Source§

impl Neg for &Saturating<i32>

1.74.0 · Source§

impl Neg for &Saturating<i64>

1.74.0 · Source§

impl Neg for &Saturating<i128>

1.74.0 · Source§

impl Neg for &Saturating<isize>

1.14.0 · Source§

impl Neg for &Wrapping<i8>

1.14.0 · Source§

impl Neg for &Wrapping<i16>

1.14.0 · Source§

impl Neg for &Wrapping<i32>

1.14.0 · Source§

impl Neg for &Wrapping<i64>

1.14.0 · Source§

impl Neg for &Wrapping<i128>

1.14.0 · Source§

impl Neg for &Wrapping<isize>

1.14.0 · Source§

impl Neg for &Wrapping<u8>

1.14.0 · Source§

impl Neg for &Wrapping<u16>

1.14.0 · Source§

impl Neg for &Wrapping<u32>

1.14.0 · Source§

impl Neg for &Wrapping<u64>

1.14.0 · Source§

impl Neg for &Wrapping<u128>

1.14.0 · Source§

impl Neg for &Wrapping<usize>

Source§

impl Neg for &bf16

Source§

impl Neg for &f32x4

Source§

impl Neg for &f32x8

Source§

impl Neg for &f64x2

Source§

impl Neg for &f64x4

Source§

impl Neg for &i8x16

Source§

impl Neg for &i8x32

Source§

impl Neg for &i16x8

Source§

impl Neg for &i16x16

Source§

impl Neg for &i32x4

Source§

impl Neg for &i32x8

Source§

impl Neg for &i64x2

Source§

impl Neg for &i64x4

Source§

impl Neg for &u8x16

Source§

impl Neg for &u16x8

Source§

impl Neg for &u32x4

Source§

impl Neg for &u32x8

Source§

impl Neg for &u64x2

Source§

impl Neg for &u64x4

1.0.0 · Source§

impl Neg for f16

1.0.0 · Source§

impl Neg for f32

1.0.0 · Source§

impl Neg for f64

1.0.0 · Source§

impl Neg for f128

1.0.0 · Source§

impl Neg for i8

1.0.0 · Source§

impl Neg for i16

1.0.0 · Source§

impl Neg for i32

1.0.0 · Source§

impl Neg for i64

1.0.0 · Source§

impl Neg for i128

1.0.0 · Source§

impl Neg for isize

Source§

impl Neg for f16

1.71.0 · Source§

impl Neg for NonZero<i8>

1.71.0 · Source§

impl Neg for NonZero<i16>

1.71.0 · Source§

impl Neg for NonZero<i32>

1.71.0 · Source§

impl Neg for NonZero<i64>

1.71.0 · Source§

impl Neg for NonZero<i128>

1.71.0 · Source§

impl Neg for NonZero<isize>

1.74.0 · Source§

impl Neg for Saturating<i8>

1.74.0 · Source§

impl Neg for Saturating<i16>

1.74.0 · Source§

impl Neg for Saturating<i32>

1.74.0 · Source§

impl Neg for Saturating<i64>

1.74.0 · Source§

impl Neg for Saturating<i128>

1.74.0 · Source§

impl Neg for Saturating<isize>

1.10.0 · Source§

impl Neg for Wrapping<i8>

1.10.0 · Source§

impl Neg for Wrapping<i16>

1.10.0 · Source§

impl Neg for Wrapping<i32>

1.10.0 · Source§

impl Neg for Wrapping<i64>

1.10.0 · Source§

impl Neg for Wrapping<i128>

1.10.0 · Source§

impl Neg for Wrapping<isize>

1.10.0 · Source§

impl Neg for Wrapping<u8>

1.10.0 · Source§

impl Neg for Wrapping<u16>

1.10.0 · Source§

impl Neg for Wrapping<u32>

1.10.0 · Source§

impl Neg for Wrapping<u64>

1.10.0 · Source§

impl Neg for Wrapping<u128>

1.10.0 · Source§

impl Neg for Wrapping<usize>

Source§

impl Neg for bf16

Source§

impl Neg for m128

Source§

impl Neg for m128d

Source§

impl Neg for AutoSimd<[f32; 2]>

Source§

impl Neg for AutoSimd<[f32; 4]>

Source§

impl Neg for AutoSimd<[f32; 8]>

Source§

impl Neg for AutoSimd<[f32; 16]>

Source§

impl Neg for AutoSimd<[f64; 2]>

Source§

impl Neg for AutoSimd<[f64; 4]>

Source§

impl Neg for AutoSimd<[f64; 8]>

Source§

impl Neg for AutoSimd<[i8; 2]>

Source§

impl Neg for AutoSimd<[i8; 4]>

Source§

impl Neg for AutoSimd<[i8; 8]>

Source§

impl Neg for AutoSimd<[i8; 16]>

Source§

impl Neg for AutoSimd<[i8; 32]>

Source§

impl Neg for AutoSimd<[i16; 2]>

Source§

impl Neg for AutoSimd<[i16; 4]>

Source§

impl Neg for AutoSimd<[i16; 8]>

Source§

impl Neg for AutoSimd<[i16; 16]>

Source§

impl Neg for AutoSimd<[i16; 32]>

Source§

impl Neg for AutoSimd<[i32; 2]>

Source§

impl Neg for AutoSimd<[i32; 4]>

Source§

impl Neg for AutoSimd<[i32; 8]>

Source§

impl Neg for AutoSimd<[i32; 16]>

Source§

impl Neg for AutoSimd<[i64; 2]>

Source§

impl Neg for AutoSimd<[i64; 4]>

Source§

impl Neg for AutoSimd<[i64; 8]>

Source§

impl Neg for AutoSimd<[i128; 1]>

Source§

impl Neg for AutoSimd<[i128; 2]>

Source§

impl Neg for AutoSimd<[i128; 4]>

Source§

impl Neg for AutoSimd<[isize; 2]>

Source§

impl Neg for AutoSimd<[isize; 4]>

Source§

impl Neg for AutoSimd<[isize; 8]>

Source§

impl Neg for WideF32x4

Source§

impl Neg for WideF32x8

Source§

impl Neg for WideF64x4

Source§

impl Neg for ATerm

Source§

impl Neg for Z0

-Z0 = Z0

Source§

impl Neg for f32x4

Source§

impl Neg for f32x8

Source§

impl Neg for f64x2

Source§

impl Neg for f64x4

Source§

impl Neg for i8x16

Source§

impl Neg for i8x32

Source§

impl Neg for i16x8

Source§

impl Neg for i16x16

Source§

impl Neg for i32x4

Source§

impl Neg for i32x8

Source§

impl Neg for i64x2

Source§

impl Neg for i64x4

Source§

impl Neg for u8x16

Source§

impl Neg for u16x8

Source§

impl Neg for u32x4

Source§

impl Neg for u32x8

Source§

impl Neg for u64x2

Source§

impl Neg for u64x4

Source§

impl<'a, T> Neg for &'a Unit<DualQuaternion<T>>

Source§

impl<'a, T> Neg for &'a DualQuaternion<T>

Source§

impl<'a, T> Neg for &'a Quaternion<T>

Source§

impl<'a, T> Neg for &'a Complex<T>
where T: Clone + Num + Neg<Output = T>,

Source§

impl<'a, T> Neg for &'a Ratio<T>
where T: Clone + Integer + Neg<Output = T>,

Source§

impl<'a, T, D> Neg for &'a OPoint<T, D>

Source§

type Output = OPoint<T, D>

Source§

impl<'a, T, R, C, S> Neg for &'a Matrix<T, R, C, S>
where R: Dim, C: Dim, T: Scalar + ClosedNeg, S: Storage<T, R, C>, DefaultAllocator: Allocator<R, C>,

Source§

type Output = Matrix<T, R, C, <DefaultAllocator as Allocator<R, C>>::Buffer<T>>

Source§

impl<T> Neg for Unit<DualQuaternion<T>>

Source§

impl<T> Neg for DualQuaternion<T>

Source§

impl<T> Neg for Quaternion<T>

Source§

impl<T> Neg for Complex<T>
where T: Clone + Num + Neg<Output = T>,

Source§

impl<T> Neg for Ratio<T>
where T: Clone + Integer + Neg<Output = T>,

Source§

impl<T, D> Neg for OPoint<T, D>

Source§

type Output = OPoint<T, D>

Source§

impl<T, R, C> Neg for Unit<Matrix<T, R, C, <DefaultAllocator as Allocator<R, C>>::Buffer<T>>>
where T: Scalar + ClosedNeg, R: Dim, C: Dim, DefaultAllocator: Allocator<R, C>,

Source§

type Output = Unit<Matrix<T, R, C, <DefaultAllocator as Allocator<R, C>>::Buffer<T>>>

Source§

impl<T, R, C, S> Neg for Matrix<T, R, C, S>
where R: Dim, C: Dim, T: Scalar + ClosedNeg, S: Storage<T, R, C>, DefaultAllocator: Allocator<R, C>,

Source§

type Output = Matrix<T, R, C, <DefaultAllocator as Allocator<R, C>>::Buffer<T>>

Source§

impl<U> Neg for NInt<U>
where U: Unsigned + NonZero,

-NInt = PInt

Source§

impl<U> Neg for PInt<U>
where U: Unsigned + NonZero,

-PInt = NInt

Source§

impl<V, A> Neg for TArr<V, A>
where V: Neg, A: Neg,

Source§

type Output = TArr<<V as Neg>::Output, <A as Neg>::Output>

Source§

impl<const N: usize> Neg for Simd<f32, N>

Source§

impl<const N: usize> Neg for Simd<f64, N>

Source§

impl<const N: usize> Neg for Simd<i8, N>

Source§

impl<const N: usize> Neg for Simd<i16, N>

Source§

impl<const N: usize> Neg for Simd<i32, N>

Source§

impl<const N: usize> Neg for Simd<i64, N>

Source§

impl<const N: usize> Neg for Simd<isize, N>