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

Grisette.Core.Data.Class.SafeSymRotate

Documentation

class SymRotate a => SafeSymRotate e a | a -> e where Source #

Minimal complete definition

safeSymRotateL', safeSymRotateR'

Methods

safeSymRotateL :: (MonadError e m, UnionLike m) => a -> a -> m a Source #

safeSymRotateR :: (MonadError e m, UnionLike m) => a -> a -> m a Source #

safeSymRotateL' :: (MonadError e' m, UnionLike m) => (e -> e') -> a -> a -> m a Source #

safeSymRotateR' :: (MonadError e' m, UnionLike m) => (e -> e') -> a -> a -> m a Source #

Instances

Instances details
SafeSymRotate ArithException Int16 Source # 
Instance details

Defined in Grisette.Core.Data.Class.SafeSymRotate

SafeSymRotate ArithException Int32 Source # 
Instance details

Defined in Grisette.Core.Data.Class.SafeSymRotate

SafeSymRotate ArithException Int64 Source # 
Instance details

Defined in Grisette.Core.Data.Class.SafeSymRotate

SafeSymRotate ArithException Int8 Source # 
Instance details

Defined in Grisette.Core.Data.Class.SafeSymRotate

SafeSymRotate ArithException Word16 Source # 
Instance details

Defined in Grisette.Core.Data.Class.SafeSymRotate

SafeSymRotate ArithException Word32 Source # 
Instance details

Defined in Grisette.Core.Data.Class.SafeSymRotate

SafeSymRotate ArithException Word64 Source # 
Instance details

Defined in Grisette.Core.Data.Class.SafeSymRotate

SafeSymRotate ArithException Word8 Source # 
Instance details

Defined in Grisette.Core.Data.Class.SafeSymRotate

SafeSymRotate ArithException Int Source # 
Instance details

Defined in Grisette.Core.Data.Class.SafeSymRotate

SafeSymRotate ArithException Word Source # 
Instance details

Defined in Grisette.Core.Data.Class.SafeSymRotate

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

Defined in Grisette.Core.Data.Class.SafeSymRotate

Methods

safeSymRotateL :: (MonadError ArithException m, UnionLike m) => IntN n -> IntN n -> m (IntN n) Source #

safeSymRotateR :: (MonadError ArithException m, UnionLike m) => IntN n -> IntN n -> m (IntN n) Source #

safeSymRotateL' :: (MonadError e' m, UnionLike m) => (ArithException -> e') -> IntN n -> IntN n -> m (IntN n) Source #

safeSymRotateR' :: (MonadError e' m, UnionLike m) => (ArithException -> e') -> IntN n -> IntN n -> m (IntN n) Source #

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

Defined in Grisette.Core.Data.Class.SafeSymRotate

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

Defined in Grisette.Core.Data.Class.SafeSymRotate

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

Defined in Grisette.Core.Data.Class.SafeSymRotate