difference-monoid-0.1.0.0

Copyright(c) Donnacha Oisín Kidney 2018
LicenseMIT
Maintainermail@doisinkidney.com
Stabilityexperimental
PortabilityGHC
Safe HaskellNone
LanguageHaskell2010

Data.Monoid.Odd

Description

 

Synopsis

Documentation

newtype Odd Source #

A monoid over XOR.

Constructors

Odd 

Fields

Instances

Bounded Odd Source # 

Methods

minBound :: Odd #

maxBound :: Odd #

Enum Odd Source # 

Methods

succ :: Odd -> Odd #

pred :: Odd -> Odd #

toEnum :: Int -> Odd #

fromEnum :: Odd -> Int #

enumFrom :: Odd -> [Odd] #

enumFromThen :: Odd -> Odd -> [Odd] #

enumFromTo :: Odd -> Odd -> [Odd] #

enumFromThenTo :: Odd -> Odd -> Odd -> [Odd] #

Eq Odd Source # 

Methods

(==) :: Odd -> Odd -> Bool #

(/=) :: Odd -> Odd -> Bool #

Data Odd Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Odd -> c Odd #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Odd #

toConstr :: Odd -> Constr #

dataTypeOf :: Odd -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c Odd) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Odd) #

gmapT :: (forall b. Data b => b -> b) -> Odd -> Odd #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Odd -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Odd -> r #

gmapQ :: (forall d. Data d => d -> u) -> Odd -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Odd -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Odd -> m Odd #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Odd -> m Odd #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Odd -> m Odd #

Ord Odd Source # 

Methods

compare :: Odd -> Odd -> Ordering #

(<) :: Odd -> Odd -> Bool #

(<=) :: Odd -> Odd -> Bool #

(>) :: Odd -> Odd -> Bool #

(>=) :: Odd -> Odd -> Bool #

max :: Odd -> Odd -> Odd #

min :: Odd -> Odd -> Odd #

Read Odd Source # 
Show Odd Source # 

Methods

showsPrec :: Int -> Odd -> ShowS #

show :: Odd -> String #

showList :: [Odd] -> ShowS #

Ix Odd Source # 

Methods

range :: (Odd, Odd) -> [Odd] #

index :: (Odd, Odd) -> Odd -> Int #

unsafeIndex :: (Odd, Odd) -> Odd -> Int

inRange :: (Odd, Odd) -> Odd -> Bool #

rangeSize :: (Odd, Odd) -> Int #

unsafeRangeSize :: (Odd, Odd) -> Int

Generic Odd Source # 

Associated Types

type Rep Odd :: * -> * #

Methods

from :: Odd -> Rep Odd x #

to :: Rep Odd x -> Odd #

Semigroup Odd Source # 

Methods

(<>) :: Odd -> Odd -> Odd #

sconcat :: NonEmpty Odd -> Odd #

stimes :: Integral b => b -> Odd -> Odd #

Monoid Odd Source # 

Methods

mempty :: Odd #

mappend :: Odd -> Odd -> Odd #

mconcat :: [Odd] -> Odd #

Storable Odd Source # 

Methods

sizeOf :: Odd -> Int #

alignment :: Odd -> Int #

peekElemOff :: Ptr Odd -> Int -> IO Odd #

pokeElemOff :: Ptr Odd -> Int -> Odd -> IO () #

peekByteOff :: Ptr b -> Int -> IO Odd #

pokeByteOff :: Ptr b -> Int -> Odd -> IO () #

peek :: Ptr Odd -> IO Odd #

poke :: Ptr Odd -> Odd -> IO () #

Bits Odd Source # 

Methods

(.&.) :: Odd -> Odd -> Odd #

(.|.) :: Odd -> Odd -> Odd #

xor :: Odd -> Odd -> Odd #

complement :: Odd -> Odd #

shift :: Odd -> Int -> Odd #

rotate :: Odd -> Int -> Odd #

zeroBits :: Odd #

bit :: Int -> Odd #

setBit :: Odd -> Int -> Odd #

clearBit :: Odd -> Int -> Odd #

complementBit :: Odd -> Int -> Odd #

testBit :: Odd -> Int -> Bool #

bitSizeMaybe :: Odd -> Maybe Int #

bitSize :: Odd -> Int #

isSigned :: Odd -> Bool #

shiftL :: Odd -> Int -> Odd #

unsafeShiftL :: Odd -> Int -> Odd #

shiftR :: Odd -> Int -> Odd #

unsafeShiftR :: Odd -> Int -> Odd #

rotateL :: Odd -> Int -> Odd #

rotateR :: Odd -> Int -> Odd #

popCount :: Odd -> Int #

FiniteBits Odd Source # 
NFData Odd Source # 

Methods

rnf :: Odd -> () #

Group Odd Source # 

Methods

invert :: Odd -> Odd #

pow :: Integral x => Odd -> x -> Odd #

ComonadEnv Odd Parity # 

Methods

ask :: Parity a -> Odd #

type Rep Odd Source # 
type Rep Odd = D1 * (MetaData "Odd" "Data.Monoid.Odd" "difference-monoid-0.1.0.0-6GZ7n3SsUmUHrUzugzcGeo" True) (C1 * (MetaCons "Odd" PrefixI True) (S1 * (MetaSel (Just Symbol "getOdd") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Bool)))