grisette-0.4.1.0: Symbolic evaluation as a library
Safe HaskellSafe-Inferred
LanguageHaskell2010

Grisette.Core.Data.Class.SymRotate

Documentation

class Bits a => SymRotate a where Source #

Methods

symRotate :: a -> a -> a Source #

Instances

Instances details
SymRotate Int16 Source # 
Instance details

Defined in Grisette.Core.Data.Class.SymRotate

Methods

symRotate :: Int16 -> Int16 -> Int16 Source #

SymRotate Int32 Source # 
Instance details

Defined in Grisette.Core.Data.Class.SymRotate

Methods

symRotate :: Int32 -> Int32 -> Int32 Source #

SymRotate Int64 Source # 
Instance details

Defined in Grisette.Core.Data.Class.SymRotate

Methods

symRotate :: Int64 -> Int64 -> Int64 Source #

SymRotate Int8 Source # 
Instance details

Defined in Grisette.Core.Data.Class.SymRotate

Methods

symRotate :: Int8 -> Int8 -> Int8 Source #

SymRotate Word16 Source # 
Instance details

Defined in Grisette.Core.Data.Class.SymRotate

SymRotate Word32 Source # 
Instance details

Defined in Grisette.Core.Data.Class.SymRotate

SymRotate Word64 Source # 
Instance details

Defined in Grisette.Core.Data.Class.SymRotate

SymRotate Word8 Source # 
Instance details

Defined in Grisette.Core.Data.Class.SymRotate

Methods

symRotate :: Word8 -> Word8 -> Word8 Source #

SymRotate Int Source # 
Instance details

Defined in Grisette.Core.Data.Class.SymRotate

Methods

symRotate :: Int -> Int -> Int Source #

SymRotate Word Source # 
Instance details

Defined in Grisette.Core.Data.Class.SymRotate

Methods

symRotate :: Word -> Word -> Word Source #

(KnownNat n, 1 <= n) => SymRotate (IntN n) Source # 
Instance details

Defined in Grisette.Core.Data.BV

Methods

symRotate :: IntN n -> IntN n -> IntN n Source #

(KnownNat n, 1 <= n) => SymRotate (WordN n) Source # 
Instance details

Defined in Grisette.Core.Data.BV

Methods

symRotate :: WordN n -> WordN n -> WordN n Source #

(Integral a, FiniteBits a) => SymRotate (DefaultFiniteBitsSymRotate a) Source # 
Instance details

Defined in Grisette.Core.Data.Class.SymRotate

(KnownNat n, 1 <= n) => SymRotate (SymIntN n) Source # 
Instance details

Defined in Grisette.IR.SymPrim.Data.SymPrim

Methods

symRotate :: SymIntN n -> SymIntN n -> SymIntN n Source #

(KnownNat n, 1 <= n) => SymRotate (SymWordN n) Source # 
Instance details

Defined in Grisette.IR.SymPrim.Data.SymPrim

Methods

symRotate :: SymWordN n -> SymWordN n -> SymWordN n Source #

newtype DefaultFiniteBitsSymRotate a Source #

Instances

Instances details
Bits a => Bits (DefaultFiniteBitsSymRotate a) Source # 
Instance details

Defined in Grisette.Core.Data.Class.SymRotate

Methods

(.&.) :: DefaultFiniteBitsSymRotate a -> DefaultFiniteBitsSymRotate a -> DefaultFiniteBitsSymRotate a #

(.|.) :: DefaultFiniteBitsSymRotate a -> DefaultFiniteBitsSymRotate a -> DefaultFiniteBitsSymRotate a #

xor :: DefaultFiniteBitsSymRotate a -> DefaultFiniteBitsSymRotate a -> DefaultFiniteBitsSymRotate a #

complement :: DefaultFiniteBitsSymRotate a -> DefaultFiniteBitsSymRotate a #

shift :: DefaultFiniteBitsSymRotate a -> Int -> DefaultFiniteBitsSymRotate a #

rotate :: DefaultFiniteBitsSymRotate a -> Int -> DefaultFiniteBitsSymRotate a #

zeroBits :: DefaultFiniteBitsSymRotate a #

bit :: Int -> DefaultFiniteBitsSymRotate a #

setBit :: DefaultFiniteBitsSymRotate a -> Int -> DefaultFiniteBitsSymRotate a #

clearBit :: DefaultFiniteBitsSymRotate a -> Int -> DefaultFiniteBitsSymRotate a #

complementBit :: DefaultFiniteBitsSymRotate a -> Int -> DefaultFiniteBitsSymRotate a #

testBit :: DefaultFiniteBitsSymRotate a -> Int -> Bool #

bitSizeMaybe :: DefaultFiniteBitsSymRotate a -> Maybe Int #

bitSize :: DefaultFiniteBitsSymRotate a -> Int #

isSigned :: DefaultFiniteBitsSymRotate a -> Bool #

shiftL :: DefaultFiniteBitsSymRotate a -> Int -> DefaultFiniteBitsSymRotate a #

unsafeShiftL :: DefaultFiniteBitsSymRotate a -> Int -> DefaultFiniteBitsSymRotate a #

shiftR :: DefaultFiniteBitsSymRotate a -> Int -> DefaultFiniteBitsSymRotate a #

unsafeShiftR :: DefaultFiniteBitsSymRotate a -> Int -> DefaultFiniteBitsSymRotate a #

rotateL :: DefaultFiniteBitsSymRotate a -> Int -> DefaultFiniteBitsSymRotate a #

rotateR :: DefaultFiniteBitsSymRotate a -> Int -> DefaultFiniteBitsSymRotate a #

popCount :: DefaultFiniteBitsSymRotate a -> Int #

Eq a => Eq (DefaultFiniteBitsSymRotate a) Source # 
Instance details

Defined in Grisette.Core.Data.Class.SymRotate

(Integral a, FiniteBits a) => SymRotate (DefaultFiniteBitsSymRotate a) Source # 
Instance details

Defined in Grisette.Core.Data.Class.SymRotate