blockfrost-api-0.3.1.0: API definitions for blockfrost.io
Safe HaskellNone
LanguageHaskell2010

Blockfrost.Types.Shared.Slot

Description

Slot wrapper

Documentation

newtype Slot Source #

Constructors

Slot Integer 

Instances

Instances details
Enum Slot Source # 
Instance details

Defined in Blockfrost.Types.Shared.Slot

Methods

succ :: Slot -> Slot #

pred :: Slot -> Slot #

toEnum :: Int -> Slot #

fromEnum :: Slot -> Int #

enumFrom :: Slot -> [Slot] #

enumFromThen :: Slot -> Slot -> [Slot] #

enumFromTo :: Slot -> Slot -> [Slot] #

enumFromThenTo :: Slot -> Slot -> Slot -> [Slot] #

Eq Slot Source # 
Instance details

Defined in Blockfrost.Types.Shared.Slot

Methods

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

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

Integral Slot Source # 
Instance details

Defined in Blockfrost.Types.Shared.Slot

Methods

quot :: Slot -> Slot -> Slot #

rem :: Slot -> Slot -> Slot #

div :: Slot -> Slot -> Slot #

mod :: Slot -> Slot -> Slot #

quotRem :: Slot -> Slot -> (Slot, Slot) #

divMod :: Slot -> Slot -> (Slot, Slot) #

toInteger :: Slot -> Integer #

Num Slot Source # 
Instance details

Defined in Blockfrost.Types.Shared.Slot

Methods

(+) :: Slot -> Slot -> Slot #

(-) :: Slot -> Slot -> Slot #

(*) :: Slot -> Slot -> Slot #

negate :: Slot -> Slot #

abs :: Slot -> Slot #

signum :: Slot -> Slot #

fromInteger :: Integer -> Slot #

Ord Slot Source # 
Instance details

Defined in Blockfrost.Types.Shared.Slot

Methods

compare :: Slot -> Slot -> Ordering #

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

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

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

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

max :: Slot -> Slot -> Slot #

min :: Slot -> Slot -> Slot #

Real Slot Source # 
Instance details

Defined in Blockfrost.Types.Shared.Slot

Methods

toRational :: Slot -> Rational #

Show Slot Source # 
Instance details

Defined in Blockfrost.Types.Shared.Slot

Methods

showsPrec :: Int -> Slot -> ShowS #

show :: Slot -> String #

showList :: [Slot] -> ShowS #

Generic Slot Source # 
Instance details

Defined in Blockfrost.Types.Shared.Slot

Associated Types

type Rep Slot :: Type -> Type #

Methods

from :: Slot -> Rep Slot x #

to :: Rep Slot x -> Slot #

ToJSON Slot Source # 
Instance details

Defined in Blockfrost.Types.Shared.Slot

FromJSON Slot Source # 
Instance details

Defined in Blockfrost.Types.Shared.Slot

ToHttpApiData Slot Source # 
Instance details

Defined in Blockfrost.Types.Shared.Slot

FromHttpApiData Slot Source # 
Instance details

Defined in Blockfrost.Types.Shared.Slot

ToSample Slot Source # 
Instance details

Defined in Blockfrost.Types.Shared.Slot

Methods

toSamples :: Proxy Slot -> [(Text, Slot)] #

HasSlot Transaction Slot Source # 
Instance details

Defined in Blockfrost.Lens

HasSlot Block (Maybe Slot) Source # 
Instance details

Defined in Blockfrost.Lens

ToCapture (Capture "slot_number" Slot) Source # 
Instance details

Defined in Blockfrost.Types.Shared.Slot

Methods

toCapture :: Proxy (Capture "slot_number" Slot) -> DocCapture #

type Rep Slot Source # 
Instance details

Defined in Blockfrost.Types.Shared.Slot

type Rep Slot = D1 ('MetaData "Slot" "Blockfrost.Types.Shared.Slot" "blockfrost-api-0.3.1.0-9MF0mqKIq7X32LLMNYkjEF" 'True) (C1 ('MetaCons "Slot" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer)))