Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Documentation
Instances
FromJSON Bool | |
Defined in Data.Aeson.Types.FromJSON | |
FromJSONKey Bool | |
Defined in Data.Aeson.Types.FromJSON fromJSONKey :: FromJSONKeyFunction Bool fromJSONKeyList :: FromJSONKeyFunction [Bool] | |
ToJSON Bool | |
Defined in Data.Aeson.Types.ToJSON | |
ToJSONKey Bool | |
Defined in Data.Aeson.Types.ToJSON toJSONKey :: ToJSONKeyFunction Bool toJSONKeyList :: ToJSONKeyFunction [Bool] | |
Data Bool | Since: base-4.0.0.0 |
Defined in Data.Data 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 :: forall r r'. (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 # | |
Bounded Bool | Since: base-2.1 |
Enum Bool | Since: base-2.1 |
Generic Bool | |
SingKind Bool | Since: base-4.9.0.0 |
Defined in GHC.Generics type DemoteRep Bool | |
Ix Bool | Since: base-2.1 |
Read Bool | Since: base-2.1 |
Show Bool | Since: base-2.1 |
BitOps Bool | |
FiniteBitsOps Bool | |
NFData Bool | |
Defined in Control.DeepSeq | |
Eq Bool | |
Ord Bool | |
Hashable Bool | |
Defined in Data.Hashable.Class | |
HasBlueprintDefinition Bool Source # | |
Defined in PlutusTx.Blueprint.Definition.Unroll | |
HasToBuiltin Bool Source # | |
Enum Bool Source # | |
Eq Bool Source # | |
FromData Bool Source # | |
Defined in PlutusTx.IsData.Instances fromBuiltinData :: BuiltinData -> Maybe Bool Source # | |
ToData Bool Source # | |
Defined in PlutusTx.IsData.Instances toBuiltinData :: Bool -> BuiltinData Source # | |
UnsafeFromData Bool Source # | |
Defined in PlutusTx.IsData.Instances | |
BoundedJoinSemiLattice Bool Source # | |
Defined in PlutusTx.Lattice | |
BoundedMeetSemiLattice Bool Source # | |
Defined in PlutusTx.Lattice | |
JoinSemiLattice Bool Source # | |
MeetSemiLattice Bool Source # | |
AdditiveMonoid Bool Source # | |
Defined in PlutusTx.Numeric | |
AdditiveSemigroup Bool Source # | |
MultiplicativeMonoid Bool Source # | |
Defined in PlutusTx.Numeric | |
MultiplicativeSemigroup Bool Source # | |
Ord Bool Source # | |
Show Bool Source # | |
Pretty Bool | |
Defined in Prettyprinter.Internal prettyList :: [Bool] -> Doc ann | |
Uniform Bool | |
Defined in System.Random.Internal | |
UniformRange Bool | |
Defined in System.Random.Internal | |
Serialise Bool | |
Defined in Codec.Serialise.Class encodeList :: [Bool] -> Encoding decodeList :: Decoder s [Bool] | |
Unbox Bool | |
Defined in Data.Vector.Unboxed.Base | |
Pretty Bool | |
Defined in Text.PrettyPrint.Annotated.WL prettyList :: [Bool] -> Doc b | |
SingI 'False | Since: base-4.9.0.0 |
Defined in GHC.Generics | |
SingI 'True | Since: base-4.9.0.0 |
Defined in GHC.Generics | |
HasBlueprintSchema Bool referencedTypes Source # | |
Defined in PlutusTx.IsData.Instances | |
HasFromOpaque BuiltinBool Bool Source # | |
Defined in PlutusTx.Builtins.HasOpaque fromOpaque :: BuiltinBool -> Bool Source # | |
HasToOpaque Bool BuiltinBool Source # | |
Defined in PlutusTx.Builtins.HasOpaque toOpaque :: Bool -> BuiltinBool Source # | |
Lift DefaultUni Bool Source # | |
DefaultPrettyBy config Bool | |
Defined in Text.PrettyBy.Internal defaultPrettyBy :: config -> Bool -> Doc ann defaultPrettyListBy :: config -> [Bool] -> Doc ann | |
NonDefaultPrettyBy ConstConfig Bool | |
Defined in PlutusCore.Pretty.PrettyConst nonDefaultPrettyBy :: ConstConfig -> Bool -> Doc ann nonDefaultPrettyListBy :: ConstConfig -> [Bool] -> Doc ann | |
PrettyDefaultBy config Bool => PrettyBy config Bool | |
Defined in Text.PrettyBy.Internal prettyBy :: config -> Bool -> Doc ann prettyListBy :: config -> [Bool] -> Doc ann | |
Lift Bool | |
Vector Vector Bool | |
Defined in Data.Vector.Unboxed.Base basicUnsafeFreeze :: Mutable Vector s Bool -> ST s (Vector Bool) basicUnsafeThaw :: Vector Bool -> ST s (Mutable Vector s Bool) basicLength :: Vector Bool -> Int basicUnsafeSlice :: Int -> Int -> Vector Bool -> Vector Bool basicUnsafeIndexM :: Vector Bool -> Int -> Box Bool basicUnsafeCopy :: Mutable Vector s Bool -> Vector Bool -> ST s () | |
MVector MVector Bool | |
Defined in Data.Vector.Unboxed.Base basicLength :: MVector s Bool -> Int basicUnsafeSlice :: Int -> Int -> MVector s Bool -> MVector s Bool basicOverlaps :: MVector s Bool -> MVector s Bool -> Bool basicUnsafeNew :: Int -> ST s (MVector s Bool) basicInitialize :: MVector s Bool -> ST s () basicUnsafeReplicate :: Int -> Bool -> ST s (MVector s Bool) basicUnsafeRead :: MVector s Bool -> Int -> ST s Bool basicUnsafeWrite :: MVector s Bool -> Int -> Bool -> ST s () basicClear :: MVector s Bool -> ST s () basicSet :: MVector s Bool -> Bool -> ST s () basicUnsafeCopy :: MVector s Bool -> MVector s Bool -> ST s () basicUnsafeMove :: MVector s Bool -> MVector s Bool -> ST s () basicUnsafeGrow :: MVector s Bool -> Int -> ST s (MVector s Bool) | |
KnownBuiltinTypeIn DefaultUni term Bool => MakeKnownIn DefaultUni term Bool | |
Defined in PlutusCore.Default.Universe | |
KnownBuiltinTypeIn DefaultUni term Bool => ReadKnownIn DefaultUni term Bool | |
Defined in PlutusCore.Default.Universe | |
Contains DefaultUni Bool | |
Defined in PlutusCore.Default.Universe | |
Typeable DefaultUni Bool Source # | |
KnownBuiltinTypeAst tyname DefaultUni Bool => KnownTypeAst tyname DefaultUni Bool | |
type DemoteRep Bool | |
Defined in GHC.Generics | |
type Rep Bool | Since: base-4.6.0.0 |
data Sing (a :: Bool) | |
type Unroll Bool Source # | |
Defined in PlutusTx.Blueprint.Definition.Unroll | |
type ToBuiltin Bool Source # | |
Defined in PlutusTx.Builtins.HasBuiltin | |
newtype Vector Bool | |
Defined in Data.Vector.Unboxed.Base | |
newtype MVector s Bool | |
Defined in Data.Vector.Unboxed.Base | |
type IsBuiltin DefaultUni Bool | |
Defined in PlutusCore.Default.Universe | |
type ToHoles DefaultUni Bool | |
Defined in PlutusCore.Default.Universe | |
type ToBinds DefaultUni acc Bool | |
Defined in PlutusCore.Default.Universe |
(&&) :: Bool -> Bool -> Bool infixr 3 Source #
Logical AND. Short-circuits if the first argument evaluates to False
.
>>>
True && False
False