Data.Bool (original) (raw)

Bounded Bool Source #

Since: 2.1

Instance details

Defined in GHC.Enum

Methods

minBound :: Bool Source #

maxBound :: Bool Source #

Enum Bool Source #

Since: 2.1

Instance details

Defined in GHC.Enum

Methods

succ :: Bool -> Bool Source #

pred :: Bool -> Bool Source #

toEnum :: Int -> Bool Source #

fromEnum :: Bool -> Int Source #

enumFrom :: Bool -> [Bool] Source #

enumFromThen :: Bool -> Bool -> [Bool] Source #

enumFromTo :: Bool -> Bool -> [Bool] Source #

enumFromThenTo :: Bool -> Bool -> Bool -> [Bool] Source #

Eq Bool

Instance details

Defined in GHC.Classes

Methods

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

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

Data Bool Source #

Since: 4.0.0.0

Instance details

Defined in Data.Data

Methods

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

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

toConstr :: Bool -> Constr Source #

dataTypeOf :: Bool -> DataType Source #

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

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

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

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

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

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

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

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

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

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

Ord Bool

Instance details

Defined in GHC.Classes

Methods

compare :: Bool -> Bool -> Ordering #

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

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

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

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

max :: Bool -> Bool -> Bool #

min :: Bool -> Bool -> Bool #

Read Bool Source #

Since: 2.1

Instance details

Defined in GHC.Read

Methods

readsPrec :: Int -> ReadS Bool Source #

readList :: ReadS [Bool] Source #

readPrec :: ReadPrec Bool Source #

readListPrec :: ReadPrec [Bool] Source #

Show Bool Source #

Since: 2.1

Instance details

Defined in GHC.Show

Methods

showsPrec :: Int -> Bool -> ShowS Source #

show :: Bool -> String Source #

showList :: [Bool] -> ShowS Source #

Ix Bool Source #

Since: 2.1

Instance details

Defined in GHC.Arr

Methods

range :: (Bool, Bool) -> [Bool] Source #

index :: (Bool, Bool) -> Bool -> Int Source #

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

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

rangeSize :: (Bool, Bool) -> Int Source #

unsafeRangeSize :: (Bool, Bool) -> Int

Generic Bool Source #

Instance details

Defined in GHC.Generics

Associated Types

type Rep Bool :: Type -> Type Source #

Methods

from :: Bool -> Rep Bool x Source #

to :: Rep Bool x -> Bool Source #

FiniteBits Bool Source #

Since: 4.7.0.0

Instance details

Defined in Data.Bits

Methods

finiteBitSize :: Bool -> Int Source #

countLeadingZeros :: Bool -> Int Source #

countTrailingZeros :: Bool -> Int Source #

Bits Bool Source #

Interpret [Bool](Data-Bool.html#t:Bool "Data.Bool") as 1-bit bit-field

Since: 4.7.0.0

Instance details

Defined in Data.Bits

Methods

(.&.) :: Bool -> Bool -> Bool Source #

(.|.) :: Bool -> Bool -> Bool Source #

xor :: Bool -> Bool -> Bool Source #

complement :: Bool -> Bool Source #

shift :: Bool -> Int -> Bool Source #

rotate :: Bool -> Int -> Bool Source #

zeroBits :: Bool Source #

bit :: Int -> Bool Source #

setBit :: Bool -> Int -> Bool Source #

clearBit :: Bool -> Int -> Bool Source #

complementBit :: Bool -> Int -> Bool Source #

testBit :: Bool -> Int -> Bool Source #

bitSizeMaybe :: Bool -> Maybe Int Source #

bitSize :: Bool -> Int Source #

isSigned :: Bool -> Bool Source #

shiftL :: Bool -> Int -> Bool Source #

unsafeShiftL :: Bool -> Int -> Bool Source #

shiftR :: Bool -> Int -> Bool Source #

unsafeShiftR :: Bool -> Int -> Bool Source #

rotateL :: Bool -> Int -> Bool Source #

rotateR :: Bool -> Int -> Bool Source #

popCount :: Bool -> Int Source #

Storable Bool Source #

Since: 2.1

Instance details

Defined in Foreign.Storable

Methods

sizeOf :: Bool -> Int Source #

alignment :: Bool -> Int Source #

peekElemOff :: Ptr Bool -> Int -> IO Bool Source #

pokeElemOff :: Ptr Bool -> Int -> Bool -> IO () Source #

peekByteOff :: Ptr b -> Int -> IO Bool Source #

pokeByteOff :: Ptr b -> Int -> Bool -> IO () Source #

peek :: Ptr Bool -> IO Bool Source #

poke :: Ptr Bool -> Bool -> IO () Source #

type Rep Bool Source #

Since: 4.6.0.0

Instance details

Defined in GHC.Generics

type Rep Bool = D1 (MetaData "Bool" "GHC.Types" "ghc-prim" False) (C1 (MetaCons "False" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "True" PrefixI False) (U1 :: Type -> Type))