shelley-spec-ledger-0.1.0.0
Safe HaskellNone
LanguageHaskell98

Shelley.Spec.Ledger.BaseTypes

Contents

Synopsis

Documentation

type FixedPoint = Digits34 Source #

(==>) :: Bool -> Bool -> Bool infix 1 Source #

(⭒) :: Nonce -> Nonce -> Nonce Source #

Evolve the nonce

data Network Source #

Constructors

Testnet 
Mainnet 

Instances

Instances details
Bounded Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Enum Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Eq Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

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

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

Ord Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Show Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Generic Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Associated Types

type Rep Network :: Type -> Type #

Methods

from :: Network -> Rep Network x #

to :: Rep Network x -> Network #

NFData Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

rnf :: Network -> () #

ToJSON Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

FromJSON Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

ToCBOR Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

toCBOR :: Network -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy Network -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [Network] -> Size Source #

FromCBOR Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

NoThunks Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep Network Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep Network = D1 ('MetaData "Network" "Shelley.Spec.Ledger.BaseTypes" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "Testnet" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Mainnet" 'PrefixI 'False) (U1 :: Type -> Type))

data Nonce Source #

Evolving nonce type.

Constructors

Nonce !(Hash Blake2b_256 Nonce) 
NeutralNonce

Identity element

Instances

Instances details
Eq Nonce Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

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

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

Ord Nonce Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

compare :: Nonce -> Nonce -> Ordering #

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

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

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

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

max :: Nonce -> Nonce -> Nonce #

min :: Nonce -> Nonce -> Nonce #

Show Nonce Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

showsPrec :: Int -> Nonce -> ShowS #

show :: Nonce -> String #

showList :: [Nonce] -> ShowS #

Generic Nonce Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Associated Types

type Rep Nonce :: Type -> Type #

Methods

from :: Nonce -> Rep Nonce x #

to :: Rep Nonce x -> Nonce #

NFData Nonce Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

rnf :: Nonce -> () #

ToJSON Nonce Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

FromJSON Nonce Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

ToCBOR Nonce Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

toCBOR :: Nonce -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy Nonce -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [Nonce] -> Size Source #

FromCBOR Nonce Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

NoThunks Nonce Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep Nonce Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep Nonce = D1 ('MetaData "Nonce" "Shelley.Spec.Ledger.BaseTypes" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "Nonce" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Hash Blake2b_256 Nonce))) :+: C1 ('MetaCons "NeutralNonce" 'PrefixI 'False) (U1 :: Type -> Type))

newtype Seed Source #

Seed to the verifiable random function.

We do not expose the constructor to Seed. Instead, a Seed should be created using mkSeed for a VRF calculation.

Constructors

Seed (Hash Blake2b_256 Seed) 

Instances

Instances details
Eq Seed Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

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

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

Ord Seed Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

compare :: Seed -> Seed -> Ordering #

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

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

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

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

max :: Seed -> Seed -> Seed #

min :: Seed -> Seed -> Seed #

Show Seed Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

showsPrec :: Int -> Seed -> ShowS #

show :: Seed -> String #

showList :: [Seed] -> ShowS #

Generic Seed Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Associated Types

type Rep Seed :: Type -> Type #

Methods

from :: Seed -> Rep Seed x #

to :: Rep Seed x -> Seed #

ToCBOR Seed Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

toCBOR :: Seed -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy Seed -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [Seed] -> Size Source #

SignableRepresentation Seed Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

NoThunks Seed Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep Seed Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep Seed = D1 ('MetaData "Seed" "Shelley.Spec.Ledger.BaseTypes" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'True) (C1 ('MetaCons "Seed" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Hash Blake2b_256 Seed))))

data UnitInterval Source #

Type to represent a value in the unit interval [0; 1]

Instances

Instances details
Eq UnitInterval Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Ord UnitInterval Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Show UnitInterval Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Generic UnitInterval Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Associated Types

type Rep UnitInterval :: Type -> Type #

NFData UnitInterval Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

rnf :: UnitInterval -> () #

ToJSON UnitInterval Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

FromJSON UnitInterval Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

ToCBOR UnitInterval Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

FromCBOR UnitInterval Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

NoThunks UnitInterval Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep UnitInterval Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep UnitInterval = D1 ('MetaData "UnitInterval" "Shelley.Spec.Ledger.BaseTypes" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'True) (C1 ('MetaCons "UnsafeUnitInterval" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Ratio Word64))))

intervalValue :: UnitInterval -> Ratio Word64 Source #

Get rational value of UnitInterval type

mkNonceFromOutputVRF :: OutputVRF v -> Nonce Source #

Make a nonce from the VRF output bytes

mkNonceFromNumber :: Word64 -> Nonce Source #

Make a nonce from a number.

mkUnitInterval :: Ratio Word64 -> Maybe UnitInterval Source #

Return a UnitInterval type if r is in [0; 1].

truncateUnitInterval :: Ratio Word64 -> UnitInterval Source #

Convert a rational to a UnitInterval by ignoring its integer part.

data StrictMaybe a Source #

Strict Maybe.

TODO move to cardano-prelude

Constructors

SNothing 
SJust !a 

Instances

Instances details
Monad StrictMaybe Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

(>>=) :: StrictMaybe a -> (a -> StrictMaybe b) -> StrictMaybe b #

(>>) :: StrictMaybe a -> StrictMaybe b -> StrictMaybe b #

return :: a -> StrictMaybe a #

Functor StrictMaybe Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

fmap :: (a -> b) -> StrictMaybe a -> StrictMaybe b #

(<$) :: a -> StrictMaybe b -> StrictMaybe a #

MonadFail StrictMaybe Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

fail :: String -> StrictMaybe a #

Applicative StrictMaybe Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

pure :: a -> StrictMaybe a #

(<*>) :: StrictMaybe (a -> b) -> StrictMaybe a -> StrictMaybe b #

liftA2 :: (a -> b -> c) -> StrictMaybe a -> StrictMaybe b -> StrictMaybe c #

(*>) :: StrictMaybe a -> StrictMaybe b -> StrictMaybe b #

(<*) :: StrictMaybe a -> StrictMaybe b -> StrictMaybe a #

Foldable StrictMaybe Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

fold :: Monoid m => StrictMaybe m -> m #

foldMap :: Monoid m => (a -> m) -> StrictMaybe a -> m #

foldMap' :: Monoid m => (a -> m) -> StrictMaybe a -> m #

foldr :: (a -> b -> b) -> b -> StrictMaybe a -> b #

foldr' :: (a -> b -> b) -> b -> StrictMaybe a -> b #

foldl :: (b -> a -> b) -> b -> StrictMaybe a -> b #

foldl' :: (b -> a -> b) -> b -> StrictMaybe a -> b #

foldr1 :: (a -> a -> a) -> StrictMaybe a -> a #

foldl1 :: (a -> a -> a) -> StrictMaybe a -> a #

toList :: StrictMaybe a -> [a] #

null :: StrictMaybe a -> Bool #

length :: StrictMaybe a -> Int #

elem :: Eq a => a -> StrictMaybe a -> Bool #

maximum :: Ord a => StrictMaybe a -> a #

minimum :: Ord a => StrictMaybe a -> a #

sum :: Num a => StrictMaybe a -> a #

product :: Num a => StrictMaybe a -> a #

Traversable StrictMaybe Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

traverse :: Applicative f => (a -> f b) -> StrictMaybe a -> f (StrictMaybe b) #

sequenceA :: Applicative f => StrictMaybe (f a) -> f (StrictMaybe a) #

mapM :: Monad m => (a -> m b) -> StrictMaybe a -> m (StrictMaybe b) #

sequence :: Monad m => StrictMaybe (m a) -> m (StrictMaybe a) #

Crypto era ~ crypto => HasField "adHash" (TxBody era) (StrictMaybe (AuxiliaryDataHash crypto)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

getField :: TxBody era -> StrictMaybe (AuxiliaryDataHash crypto) #

HasField "update" (TxBody era) (StrictMaybe (Update era)) Source # 
Instance details

Defined in Shelley.Spec.Ledger.TxBody

Methods

getField :: TxBody era -> StrictMaybe (Update era) #

Eq a => Eq (StrictMaybe a) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Ord a => Ord (StrictMaybe a) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Show a => Show (StrictMaybe a) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Generic (StrictMaybe a) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Associated Types

type Rep (StrictMaybe a) :: Type -> Type #

Methods

from :: StrictMaybe a -> Rep (StrictMaybe a) x #

to :: Rep (StrictMaybe a) x -> StrictMaybe a #

NFData a => NFData (StrictMaybe a) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

rnf :: StrictMaybe a -> () #

ToJSON a => ToJSON (StrictMaybe a) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

FromJSON a => FromJSON (StrictMaybe a) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

ToCBOR a => ToCBOR (StrictMaybe a) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

toCBOR :: StrictMaybe a -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (StrictMaybe a) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [StrictMaybe a] -> Size Source #

Era era => ToCBOR (PParamsUpdate era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Methods

toCBOR :: PParamsUpdate era -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy (PParamsUpdate era) -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [PParamsUpdate era] -> Size Source #

FromCBOR a => FromCBOR (StrictMaybe a) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Era era => FromCBOR (PParamsUpdate era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

NoThunks a => NoThunks (StrictMaybe a) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

NoThunks (PParamsUpdate era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Eq (PParams' StrictMaybe era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Ord (PParams' StrictMaybe era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Show (PParams' StrictMaybe era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

NFData (PParams' StrictMaybe era) Source # 
Instance details

Defined in Shelley.Spec.Ledger.PParams

Methods

rnf :: PParams' StrictMaybe era -> () #

type Rep (StrictMaybe a) Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep (StrictMaybe a) = D1 ('MetaData "StrictMaybe" "Shelley.Spec.Ledger.BaseTypes" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "SNothing" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "SJust" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 a)))

data Url Source #

Instances

Instances details
Eq Url Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

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

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

Ord Url Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

compare :: Url -> Url -> Ordering #

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

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

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

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

max :: Url -> Url -> Url #

min :: Url -> Url -> Url #

Show Url Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

showsPrec :: Int -> Url -> ShowS #

show :: Url -> String #

showList :: [Url] -> ShowS #

Generic Url Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Associated Types

type Rep Url :: Type -> Type #

Methods

from :: Url -> Rep Url x #

to :: Rep Url x -> Url #

NFData Url Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

rnf :: Url -> () #

ToJSON Url Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

FromJSON Url Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

ToCBOR Url Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

toCBOR :: Url -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy Url -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [Url] -> Size Source #

FromCBOR Url Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

NoThunks Url Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep Url Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep Url = D1 ('MetaData "Url" "Shelley.Spec.Ledger.BaseTypes" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'True) (C1 ('MetaCons "Url" 'PrefixI 'True) (S1 ('MetaSel ('Just "urlToText") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data DnsName Source #

Instances

Instances details
Eq DnsName Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

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

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

Ord DnsName Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Show DnsName Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Generic DnsName Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Associated Types

type Rep DnsName :: Type -> Type #

Methods

from :: DnsName -> Rep DnsName x #

to :: Rep DnsName x -> DnsName #

NFData DnsName Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

rnf :: DnsName -> () #

ToJSON DnsName Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

FromJSON DnsName Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

ToCBOR DnsName Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

toCBOR :: DnsName -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy DnsName -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [DnsName] -> Size Source #

FromCBOR DnsName Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

NoThunks DnsName Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep DnsName Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep DnsName = D1 ('MetaData "DnsName" "Shelley.Spec.Ledger.BaseTypes" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'True) (C1 ('MetaCons "DnsName" 'PrefixI 'True) (S1 ('MetaSel ('Just "dnsToText") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

newtype Port Source #

Constructors

Port 

Fields

Instances

Instances details
Eq Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

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

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

Num Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

(+) :: Port -> Port -> Port #

(-) :: Port -> Port -> Port #

(*) :: Port -> Port -> Port #

negate :: Port -> Port #

abs :: Port -> Port #

signum :: Port -> Port #

fromInteger :: Integer -> Port #

Ord Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

compare :: Port -> Port -> Ordering #

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

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

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

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

max :: Port -> Port -> Port #

min :: Port -> Port -> Port #

Show Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

showsPrec :: Int -> Port -> ShowS #

show :: Port -> String #

showList :: [Port] -> ShowS #

Generic Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Associated Types

type Rep Port :: Type -> Type #

Methods

from :: Port -> Rep Port x #

to :: Rep Port x -> Port #

NFData Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

rnf :: Port -> () #

ToJSON Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

FromJSON Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

ToCBOR Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Methods

toCBOR :: Port -> Encoding Source #

encodedSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy Port -> Size Source #

encodedListSizeExpr :: (forall t. ToCBOR t => Proxy t -> Size) -> Proxy [Port] -> Size Source #

FromCBOR Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

NoThunks Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep Port Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep Port = D1 ('MetaData "Port" "Shelley.Spec.Ledger.BaseTypes" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'True) (C1 ('MetaCons "Port" 'PrefixI 'True) (S1 ('MetaSel ('Just "portToWord16") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Word16)))

data ActiveSlotCoeff Source #

Instances

Instances details
Eq ActiveSlotCoeff Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Ord ActiveSlotCoeff Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Show ActiveSlotCoeff Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Generic ActiveSlotCoeff Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Associated Types

type Rep ActiveSlotCoeff :: Type -> Type #

ToCBOR ActiveSlotCoeff Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

FromCBOR ActiveSlotCoeff Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

NoThunks ActiveSlotCoeff Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep ActiveSlotCoeff Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep ActiveSlotCoeff = D1 ('MetaData "ActiveSlotCoeff" "Shelley.Spec.Ledger.BaseTypes" "shelley-spec-ledger-0.1.0.0-Is3EknyvW92LxCl96jGQVW" 'False) (C1 ('MetaCons "ActiveSlotCoeff" 'PrefixI 'True) (S1 ('MetaSel ('Just "unActiveSlotVal") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UnitInterval) :*: S1 ('MetaSel ('Just "unActiveSlotLog") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Integer)))

STS Base

data Globals Source #

Constructors

Globals 

Fields

Instances

Instances details
Generic Globals Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

Associated Types

type Rep Globals :: Type -> Type #

Methods

from :: Globals -> Rep Globals x #

to :: Rep Globals x -> Globals #

NoThunks Globals Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes

type Rep Globals Source # 
Instance details

Defined in Shelley.Spec.Ledger.BaseTypes