byron-spec-ledger-0.1.0.0: Executable specification of Cardano ledger
Safe HaskellNone
LanguageHaskell2010

Byron.Spec.Ledger.Update

Synopsis

Documentation

data PParams Source #

Protocol parameters.

Constructors

PParams 

Fields

Instances

Instances details
Eq PParams Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

Data PParams Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: PParams -> Constr #

dataTypeOf :: PParams -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord PParams Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Show PParams Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic PParams Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep PParams :: Type -> Type #

Methods

from :: PParams -> Rep PParams x #

to :: Rep PParams x -> PParams #

Hashable PParams Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

AddShrinks PParams Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

SeedGoblin PParams Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

seeder :: PParams -> TinkerM g () Source #

NoThunks PParams Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

HasTypeReps PParams Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

GeneOps genome => Goblin genome PParams Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

HasTypeReps (ProtVer, PParams, SwVer, Set STag, Metadata) Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep PParams Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

newtype BkSgnCntT Source #

Constructors

BkSgnCntT Double 

Instances

Instances details
Eq BkSgnCntT Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Fractional BkSgnCntT Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Data BkSgnCntT Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: BkSgnCntT -> Constr #

dataTypeOf :: BkSgnCntT -> DataType #

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

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

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

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

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

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

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

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

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

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

Num BkSgnCntT Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Ord BkSgnCntT Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Show BkSgnCntT Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic BkSgnCntT Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep BkSgnCntT :: Type -> Type #

Hashable BkSgnCntT Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

AddShrinks BkSgnCntT Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

SeedGoblin BkSgnCntT Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

seeder :: BkSgnCntT -> TinkerM g () Source #

NoThunks BkSgnCntT Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

HasTypeReps BkSgnCntT Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

GeneOps g => Goblin g BkSgnCntT Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep BkSgnCntT Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep BkSgnCntT = D1 ('MetaData "BkSgnCntT" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'True) (C1 ('MetaCons "BkSgnCntT" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Double)))

newtype UpAdptThd Source #

Constructors

UpAdptThd Double 

Instances

Instances details
Eq UpAdptThd Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Fractional UpAdptThd Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Data UpAdptThd Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UpAdptThd -> Constr #

dataTypeOf :: UpAdptThd -> DataType #

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

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

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

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

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

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

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

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

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

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

Num UpAdptThd Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Ord UpAdptThd Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Real UpAdptThd Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

RealFrac UpAdptThd Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Show UpAdptThd Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic UpAdptThd Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UpAdptThd :: Type -> Type #

Hashable UpAdptThd Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

AddShrinks UpAdptThd Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

SeedGoblin UpAdptThd Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

seeder :: UpAdptThd -> TinkerM g () Source #

NoThunks UpAdptThd Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

HasTypeReps UpAdptThd Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

GeneOps g => Goblin g UpAdptThd Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UpAdptThd Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UpAdptThd = D1 ('MetaData "UpAdptThd" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'True) (C1 ('MetaCons "UpAdptThd" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Double)))

newtype FactorB Source #

Constructors

FactorB Int 

Instances

Instances details
Eq FactorB Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

Data FactorB Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: FactorB -> Constr #

dataTypeOf :: FactorB -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord FactorB Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Show FactorB Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic FactorB Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep FactorB :: Type -> Type #

Methods

from :: FactorB -> Rep FactorB x #

to :: Rep FactorB x -> FactorB #

Hashable FactorB Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

AddShrinks FactorB Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

SeedGoblin FactorB Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

seeder :: FactorB -> TinkerM g () Source #

NoThunks FactorB Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

HasTypeReps FactorB Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

GeneOps g => Goblin g FactorB Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep FactorB Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep FactorB = D1 ('MetaData "FactorB" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'True) (C1 ('MetaCons "FactorB" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))

newtype FactorA Source #

Constructors

FactorA Int 

Instances

Instances details
Eq FactorA Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

Data FactorA Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: FactorA -> Constr #

dataTypeOf :: FactorA -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord FactorA Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Show FactorA Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic FactorA Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep FactorA :: Type -> Type #

Methods

from :: FactorA -> Rep FactorA x #

to :: Rep FactorA x -> FactorA #

Hashable FactorA Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

AddShrinks FactorA Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

SeedGoblin FactorA Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

seeder :: FactorA -> TinkerM g () Source #

NoThunks FactorA Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

HasTypeReps FactorA Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

GeneOps g => Goblin g FactorA Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep FactorA Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep FactorA = D1 ('MetaData "FactorA" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'True) (C1 ('MetaCons "FactorA" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))

data ProtVer Source #

Protocol version

Constructors

ProtVer 

Instances

Instances details
Eq ProtVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

Data ProtVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: ProtVer -> Constr #

dataTypeOf :: ProtVer -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ProtVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Show ProtVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic ProtVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep ProtVer :: Type -> Type #

Methods

from :: ProtVer -> Rep ProtVer x #

to :: Rep ProtVer x -> ProtVer #

Hashable ProtVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

AddShrinks ProtVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

SeedGoblin ProtVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

seeder :: ProtVer -> TinkerM g () Source #

NoThunks ProtVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

HasTypeReps ProtVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

GeneOps genome => Goblin genome ProtVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

HasTypeReps (ProtVer, PParams, SwVer, Set STag, Metadata) Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep ProtVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep ProtVer = D1 ('MetaData "ProtVer" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (C1 ('MetaCons "ProtVer" 'PrefixI 'True) (S1 ('MetaSel ('Just "_pvMaj") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Natural) :*: (S1 ('MetaSel ('Just "_pvMin") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Natural) :*: S1 ('MetaSel ('Just "_pvAlt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Natural))))

newtype UpId Source #

Constructors

UpId Int 

Instances

Instances details
Eq UpId Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

Data UpId Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UpId -> Constr #

dataTypeOf :: UpId -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord UpId Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

compare :: UpId -> UpId -> Ordering #

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

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

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

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

max :: UpId -> UpId -> UpId #

min :: UpId -> UpId -> UpId #

Show UpId Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

showsPrec :: Int -> UpId -> ShowS #

show :: UpId -> String #

showList :: [UpId] -> ShowS #

Generic UpId Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UpId :: Type -> Type #

Methods

from :: UpId -> Rep UpId x #

to :: Rep UpId x -> UpId #

Hashable UpId Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

AddShrinks UpId Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

SeedGoblin UpId Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

seeder :: UpId -> TinkerM g () Source #

NoThunks UpId Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

HasTypeReps UpId Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

GeneOps genome => Goblin genome UpId Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

tinker :: Gen UpId -> TinkerM genome (Gen UpId) Source #

conjure :: TinkerM genome UpId Source #

type Rep UpId Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UpId = D1 ('MetaData "UpId" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'True) (C1 ('MetaCons "UpId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int)))

data SwVer Source #

Constructors

SwVer 

Fields

Instances

Instances details
Eq SwVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

Data SwVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: SwVer -> Constr #

dataTypeOf :: SwVer -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SwVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

showsPrec :: Int -> SwVer -> ShowS #

show :: SwVer -> String #

showList :: [SwVer] -> ShowS #

Generic SwVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep SwVer :: Type -> Type #

Methods

from :: SwVer -> Rep SwVer x #

to :: Rep SwVer x -> SwVer #

Hashable SwVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

AddShrinks SwVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

SeedGoblin SwVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

seeder :: SwVer -> TinkerM g () Source #

NoThunks SwVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

HasTypeReps SwVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

GeneOps genome => Goblin genome SwVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

tinker :: Gen SwVer -> TinkerM genome (Gen SwVer) Source #

conjure :: TinkerM genome SwVer Source #

HasTypeReps (ProtVer, PParams, SwVer, Set STag, Metadata) Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep SwVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep SwVer = D1 ('MetaData "SwVer" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (C1 ('MetaCons "SwVer" 'PrefixI 'True) (S1 ('MetaSel ('Just "_svName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 ApName) :*: S1 ('MetaSel ('Just "_svVer") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 ApVer)))

newtype ApVer Source #

Application version

Constructors

ApVer Natural 

Instances

Instances details
Eq ApVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

Data ApVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: ApVer -> Constr #

dataTypeOf :: ApVer -> DataType #

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

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

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

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

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

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

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

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

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

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

Num ApVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Ord ApVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

compare :: ApVer -> ApVer -> Ordering #

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

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

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

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

max :: ApVer -> ApVer -> ApVer #

min :: ApVer -> ApVer -> ApVer #

Show ApVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

showsPrec :: Int -> ApVer -> ShowS #

show :: ApVer -> String #

showList :: [ApVer] -> ShowS #

Generic ApVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep ApVer :: Type -> Type #

Methods

from :: ApVer -> Rep ApVer x #

to :: Rep ApVer x -> ApVer #

Hashable ApVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

AddShrinks ApVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

SeedGoblin ApVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

seeder :: ApVer -> TinkerM g () Source #

NoThunks ApVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

HasTypeReps ApVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

GeneOps genome => Goblin genome ApVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

tinker :: Gen ApVer -> TinkerM genome (Gen ApVer) Source #

conjure :: TinkerM genome ApVer Source #

type Rep ApVer Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep ApVer = D1 ('MetaData "ApVer" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'True) (C1 ('MetaCons "ApVer" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Natural)))

newtype ApName Source #

Constructors

ApName String 

Instances

Instances details
Eq ApName Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

Data ApName Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: ApName -> Constr #

dataTypeOf :: ApName -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ApName Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Show ApName Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic ApName Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep ApName :: Type -> Type #

Methods

from :: ApName -> Rep ApName x #

to :: Rep ApName x -> ApName #

Hashable ApName Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

AddShrinks ApName Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

SeedGoblin ApName Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

seeder :: ApName -> TinkerM g () Source #

NoThunks ApName Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

HasTypeReps ApName Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

GeneOps genome => Goblin genome ApName Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep ApName Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep ApName = D1 ('MetaData "ApName" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'True) (C1 ('MetaCons "ApName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))

data UProp Source #

Update proposal

Constructors

UProp 

Fields

Instances

Instances details
Eq UProp Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

Data UProp Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UProp -> Constr #

dataTypeOf :: UProp -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UProp Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

showsPrec :: Int -> UProp -> ShowS #

show :: UProp -> String #

showList :: [UProp] -> ShowS #

Generic UProp Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UProp :: Type -> Type #

Methods

from :: UProp -> Rep UProp x #

to :: Rep UProp x -> UProp #

Hashable UProp Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

AddShrinks UProp Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

NoThunks UProp Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

HasTypeReps UProp Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

GeneOps genome => Goblin genome UProp Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

tinker :: Gen UProp -> TinkerM genome (Gen UProp) Source #

conjure :: TinkerM genome UProp Source #

HasHash (Maybe UProp, [Vote]) Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

hash :: (Maybe UProp, [Vote]) -> Hash Source #

type Rep UProp Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

data Metadata Source #

For now we do not have any requirements on metadata.

Constructors

Metadata 

Instances

Instances details
Eq Metadata Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Data Metadata Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: Metadata -> Constr #

dataTypeOf :: Metadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord Metadata Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Show Metadata Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic Metadata Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep Metadata :: Type -> Type #

Methods

from :: Metadata -> Rep Metadata x #

to :: Rep Metadata x -> Metadata #

Hashable Metadata Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

AddShrinks Metadata Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

SeedGoblin Metadata Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

seeder :: Metadata -> TinkerM g () Source #

NoThunks Metadata Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

HasTypeReps Metadata Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

GeneOps genome => Goblin genome Metadata Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

HasTypeReps (ProtVer, PParams, SwVer, Set STag, Metadata) Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep Metadata Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep Metadata = D1 ('MetaData "Metadata" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (C1 ('MetaCons "Metadata" 'PrefixI 'False) (U1 :: Type -> Type))

type STag = String Source #

System tag, this represents a target operating system for the update (e.g. linux, win64, or mac32).

type UpSD = (ProtVer, PParams, SwVer, Set STag, Metadata) Source #

Part of the update proposal which must be signed

data Vote Source #

Constructors

Vote 

Fields

Instances

Instances details
Eq Vote Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

Data Vote Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: Vote -> Constr #

dataTypeOf :: Vote -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Vote Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

showsPrec :: Int -> Vote -> ShowS #

show :: Vote -> String #

showList :: [Vote] -> ShowS #

Generic Vote Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep Vote :: Type -> Type #

Methods

from :: Vote -> Rep Vote x #

to :: Rep Vote x -> Vote #

Hashable Vote Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

AddShrinks Vote Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

NoThunks Vote Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

HasTypeReps Vote Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

GeneOps genome => Goblin genome Vote Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

tinker :: Gen Vote -> TinkerM genome (Gen Vote) Source #

conjure :: TinkerM genome Vote Source #

HasHash (Maybe UProp, [Vote]) Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

hash :: (Maybe UProp, [Vote]) -> Hash Source #

type Rep Vote Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep Vote = D1 ('MetaData "Vote" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (C1 ('MetaCons "Vote" 'PrefixI 'True) (S1 ('MetaSel ('Just "_vCaster") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 VKey) :*: (S1 ('MetaSel ('Just "_vPropId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 UpId) :*: S1 ('MetaSel ('Just "_vSig") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Sig UpId)))))

data UpregPredicateFailure Source #

These PredicateFailures are all throwable.

Instances

Instances details
Eq UpregPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Data UpregPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UpregPredicateFailure -> Constr #

dataTypeOf :: UpregPredicateFailure -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UpregPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic UpregPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UpregPredicateFailure :: Type -> Type #

NoThunks UpregPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UpregPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UpregPredicateFailure = D1 ('MetaData "UpregPredicateFailure" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (C1 ('MetaCons "UPVFailure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (PredicateFailure UPV))) :+: (C1 ('MetaCons "NotGenesisDelegate" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DoesNotVerify" 'PrefixI 'False) (U1 :: Type -> Type)))

data UPREG Source #

Instances

Instances details
Data UPREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UPREG -> Constr #

dataTypeOf :: UPREG -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic UPREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UPREG :: Type -> Type #

Methods

from :: UPREG -> Rep UPREG x #

to :: Rep UPREG x -> UPREG #

STS UPREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Embed UPREG UPIREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Embed UPV UPREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UPREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UPREG = D1 ('MetaData "UPREG" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (V1 :: Type -> Type)
type PredicateFailure UPREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type BaseM UPREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Environment UPREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Signal UPREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type State UPREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

data UpvPredicateFailure Source #

These PredicateFailures are all throwable.

Instances

Instances details
Eq UpvPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Data UpvPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UpvPredicateFailure -> Constr #

dataTypeOf :: UpvPredicateFailure -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UpvPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic UpvPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UpvPredicateFailure :: Type -> Type #

NoThunks UpvPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UpvPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

data UPV Source #

Update proposal validity

Instances

Instances details
Data UPV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UPV -> Constr #

dataTypeOf :: UPV -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic UPV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UPV :: Type -> Type #

Methods

from :: UPV -> Rep UPV x #

to :: Rep UPV x -> UPV #

STS UPV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type State UPV Source #

type Signal UPV Source #

type Environment UPV Source #

type BaseM UPV :: Type -> Type Source #

type PredicateFailure UPV = (b :: Type) Source #

Embed UPV UPREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Embed UPPVV UPV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Embed UPSVV UPV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UPV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UPV = D1 ('MetaData "UPV" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (V1 :: Type -> Type)
type PredicateFailure UPV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type BaseM UPV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Environment UPV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Signal UPV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type State UPV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

data UppvvPredicateFailure Source #

These PredicateFailures are all "throwable". The disjunction of the rules' preconditions is not True - the PredicateFailures represent False cases.

Instances

Instances details
Eq UppvvPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Data UppvvPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UppvvPredicateFailure -> Constr #

dataTypeOf :: UppvvPredicateFailure -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UppvvPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic UppvvPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UppvvPredicateFailure :: Type -> Type #

NoThunks UppvvPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UppvvPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UppvvPredicateFailure = D1 ('MetaData "UppvvPredicateFailure" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (C1 ('MetaCons "CannotFollowPv" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "CannotUpdatePv" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [UpdateConstraintViolation])) :+: C1 ('MetaCons "AlreadyProposedPv" 'PrefixI 'False) (U1 :: Type -> Type)))

data UPPVV Source #

Instances

Instances details
Data UPPVV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UPPVV -> Constr #

dataTypeOf :: UPPVV -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic UPPVV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UPPVV :: Type -> Type #

Methods

from :: UPPVV -> Rep UPPVV x #

to :: Rep UPPVV x -> UPPVV #

STS UPPVV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Embed UPPVV UPV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UPPVV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UPPVV = D1 ('MetaData "UPPVV" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (V1 :: Type -> Type)
type PredicateFailure UPPVV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type BaseM UPPVV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Environment UPPVV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Signal UPPVV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type State UPPVV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

data UpsvvPredicateFailure Source #

These PredicateFailures are all "throwable". The disjunction of the rules' preconditions is not True - the PredicateFailures represent False cases.

Instances

Instances details
Eq UpsvvPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Data UpsvvPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UpsvvPredicateFailure -> Constr #

dataTypeOf :: UpsvvPredicateFailure -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UpsvvPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic UpsvvPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UpsvvPredicateFailure :: Type -> Type #

NoThunks UpsvvPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UpsvvPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UpsvvPredicateFailure = D1 ('MetaData "UpsvvPredicateFailure" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) ((C1 ('MetaCons "AlreadyProposedSv" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CannotFollowSv" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "InvalidApplicationName" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "InvalidSystemTags" 'PrefixI 'False) (U1 :: Type -> Type)))

data UPSVV Source #

Update Proposal Software Version Validation

Instances

Instances details
Data UPSVV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UPSVV -> Constr #

dataTypeOf :: UPSVV -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic UPSVV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UPSVV :: Type -> Type #

Methods

from :: UPSVV -> Rep UPSVV x #

to :: Rep UPSVV x -> UPSVV #

STS UPSVV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Embed UPSVV UPV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UPSVV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UPSVV = D1 ('MetaData "UPSVV" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (V1 :: Type -> Type)
type PredicateFailure UPSVV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type BaseM UPSVV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Environment UPSVV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Signal UPSVV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type State UPSVV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

data UpdateConstraintViolation Source #

Violations on the constraints of the allowed values for new protocol parameters.

Instances

Instances details
Eq UpdateConstraintViolation Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Data UpdateConstraintViolation Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UpdateConstraintViolation -> Constr #

dataTypeOf :: UpdateConstraintViolation -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord UpdateConstraintViolation Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Show UpdateConstraintViolation Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic UpdateConstraintViolation Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UpdateConstraintViolation :: Type -> Type #

NoThunks UpdateConstraintViolation Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UpdateConstraintViolation Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

inMap :: (Ord key, Eq v) => key -> v -> Map key v -> Bool Source #

Test if a pair is present in a map.

invertMap :: (Ord k, Ord v) => Map k v -> Map v (Set k) Source #

Invert a map

Examples:

>>> invertMap (Map.fromList [('a', 1 :: Int), ('b', 2), ('c', 3), ('d', 1)])
fromList [(1,fromList "ad"),(2,fromList "b"),(3,fromList "c")]

invertBijection :: Ord v => Map k v -> Map v k Source #

Invert a map which we assert to be a bijection. If this map is not a bijection, the behaviour is not guaranteed.

Examples:

>>> invertBijection (Map.fromList [('a', 1 :: Int), ('b', 2), ('c', 3)])
fromList [(1,'a'),(2,'b'),(3,'c')]

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

pvCanFollow Source #

Arguments

:: ProtVer

Next protocol version

-> ProtVer

Previous protocol version

-> Bool 

Check whether a protocol version can follow the current protocol version.

checkUpdateConstraints :: PParams -> UProp -> [UpdateConstraintViolation] Source #

Check whether an update proposal marks a valid update

(<=?) :: Ord a => a -> a -> Maybe (a, Threshold a) infix 4 Source #

orError :: Maybe (a, b) -> (a -> b -> e) -> Maybe e Source #

data UpiecPredicateFailure Source #

Instances

Instances details
Eq UpiecPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Data UpiecPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UpiecPredicateFailure -> Constr #

dataTypeOf :: UpiecPredicateFailure -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UpiecPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic UpiecPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UpiecPredicateFailure :: Type -> Type #

NoThunks UpiecPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UpiecPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UpiecPredicateFailure = D1 ('MetaData "UpiecPredicateFailure" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (C1 ('MetaCons "PVBUMPFailure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (PredicateFailure PVBUMP))))

data UPIEC Source #

Instances

Instances details
Data UPIEC Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UPIEC -> Constr #

dataTypeOf :: UPIEC -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic UPIEC Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UPIEC :: Type -> Type #

Methods

from :: UPIEC -> Rep UPIEC x #

to :: Rep UPIEC x -> UPIEC #

STS UPIEC Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Embed PVBUMP UPIEC Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UPIEC Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UPIEC = D1 ('MetaData "UPIEC" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (V1 :: Type -> Type)
type PredicateFailure UPIEC Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type BaseM UPIEC Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Environment UPIEC Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Signal UPIEC Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Signal UPIEC = ()
type State UPIEC Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

data PvbumpPredicateFailure Source #

Constructors

NoPVBUMPFailure 

Instances

Instances details
Eq PvbumpPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Data PvbumpPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: PvbumpPredicateFailure -> Constr #

dataTypeOf :: PvbumpPredicateFailure -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PvbumpPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic PvbumpPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep PvbumpPredicateFailure :: Type -> Type #

NoThunks PvbumpPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep PvbumpPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep PvbumpPredicateFailure = D1 ('MetaData "PvbumpPredicateFailure" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (C1 ('MetaCons "NoPVBUMPFailure" 'PrefixI 'False) (U1 :: Type -> Type))

data PVBUMP Source #

Instances

Instances details
Data PVBUMP Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: PVBUMP -> Constr #

dataTypeOf :: PVBUMP -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic PVBUMP Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep PVBUMP :: Type -> Type #

Methods

from :: PVBUMP -> Rep PVBUMP x #

to :: Rep PVBUMP x -> PVBUMP #

STS PVBUMP Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Embed PVBUMP UPIEC Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep PVBUMP Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep PVBUMP = D1 ('MetaData "PVBUMP" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (V1 :: Type -> Type)
type PredicateFailure PVBUMP Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type BaseM PVBUMP Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Environment PVBUMP Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Signal PVBUMP Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Signal PVBUMP = ()
type State PVBUMP Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

data UpiendPredicateFailure Source #

Instances

Instances details
Eq UpiendPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Data UpiendPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UpiendPredicateFailure -> Constr #

dataTypeOf :: UpiendPredicateFailure -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UpiendPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic UpiendPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UpiendPredicateFailure :: Type -> Type #

NoThunks UpiendPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UpiendPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UpiendPredicateFailure = D1 ('MetaData "UpiendPredicateFailure" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (C1 ('MetaCons "UPENDFailure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (PredicateFailure UPEND))))

data UPIEND Source #

Instances

Instances details
Data UPIEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UPIEND -> Constr #

dataTypeOf :: UPIEND -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic UPIEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UPIEND :: Type -> Type #

Methods

from :: UPIEND -> Rep UPIEND x #

to :: Rep UPIEND x -> UPIEND #

STS UPIEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Embed UPEND UPIEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UPIEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UPIEND = D1 ('MetaData "UPIEND" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (V1 :: Type -> Type)
type PredicateFailure UPIEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type BaseM UPIEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Environment UPIEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Signal UPIEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type State UPIEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

data UpivotesPredicateFailure Source #

Instances

Instances details
Eq UpivotesPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Data UpivotesPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UpivotesPredicateFailure -> Constr #

dataTypeOf :: UpivotesPredicateFailure -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UpivotesPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic UpivotesPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UpivotesPredicateFailure :: Type -> Type #

NoThunks UpivotesPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UpivotesPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UpivotesPredicateFailure = D1 ('MetaData "UpivotesPredicateFailure" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (C1 ('MetaCons "ApplyVotesFailure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (PredicateFailure APPLYVOTES))))

data UPIVOTES Source #

Instances

Instances details
Data UPIVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UPIVOTES -> Constr #

dataTypeOf :: UPIVOTES -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic UPIVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UPIVOTES :: Type -> Type #

Methods

from :: UPIVOTES -> Rep UPIVOTES x #

to :: Rep UPIVOTES x -> UPIVOTES #

STS UPIVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

HasTrace UPIVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type BaseEnv UPIVOTES Source #

Embed APPLYVOTES UPIVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UPIVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UPIVOTES = D1 ('MetaData "UPIVOTES" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (V1 :: Type -> Type)
type PredicateFailure UPIVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type BaseM UPIVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Environment UPIVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Signal UPIVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type State UPIVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type BaseEnv UPIVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type BaseEnv UPIVOTES = ()

data ApplyVotesPredicateFailure Source #

Instances

Instances details
Eq ApplyVotesPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Data ApplyVotesPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: ApplyVotesPredicateFailure -> Constr #

dataTypeOf :: ApplyVotesPredicateFailure -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ApplyVotesPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic ApplyVotesPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep ApplyVotesPredicateFailure :: Type -> Type #

NoThunks ApplyVotesPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep ApplyVotesPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep ApplyVotesPredicateFailure = D1 ('MetaData "ApplyVotesPredicateFailure" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (C1 ('MetaCons "UpivoteFailure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (PredicateFailure UPIVOTE))))

data APPLYVOTES Source #

Instances

Instances details
Data APPLYVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: APPLYVOTES -> Constr #

dataTypeOf :: APPLYVOTES -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic APPLYVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep APPLYVOTES :: Type -> Type #

STS APPLYVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Embed APPLYVOTES UPIVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Embed UPIVOTE APPLYVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep APPLYVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep APPLYVOTES = D1 ('MetaData "APPLYVOTES" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (V1 :: Type -> Type)
type PredicateFailure APPLYVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type BaseM APPLYVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Environment APPLYVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Signal APPLYVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type State APPLYVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

data UpivotePredicateFailure Source #

Instances

Instances details
Eq UpivotePredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Data UpivotePredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UpivotePredicateFailure -> Constr #

dataTypeOf :: UpivotePredicateFailure -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UpivotePredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic UpivotePredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UpivotePredicateFailure :: Type -> Type #

NoThunks UpivotePredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UpivotePredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UpivotePredicateFailure = D1 ('MetaData "UpivotePredicateFailure" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (C1 ('MetaCons "UPVOTEFailure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (PredicateFailure UPVOTE))))

data UPIVOTE Source #

Instances

Instances details
Data UPIVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UPIVOTE -> Constr #

dataTypeOf :: UPIVOTE -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic UPIVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UPIVOTE :: Type -> Type #

Methods

from :: UPIVOTE -> Rep UPIVOTE x #

to :: Rep UPIVOTE x -> UPIVOTE #

STS UPIVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Embed UPIVOTE APPLYVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Embed UPVOTE UPIVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UPIVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UPIVOTE = D1 ('MetaData "UPIVOTE" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (V1 :: Type -> Type)
type PredicateFailure UPIVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type BaseM UPIVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Environment UPIVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Signal UPIVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type State UPIVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

data UpiregPredicateFailure Source #

Instances

Instances details
Eq UpiregPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Data UpiregPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UpiregPredicateFailure -> Constr #

dataTypeOf :: UpiregPredicateFailure -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UpiregPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic UpiregPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UpiregPredicateFailure :: Type -> Type #

NoThunks UpiregPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UpiregPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UpiregPredicateFailure = D1 ('MetaData "UpiregPredicateFailure" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (C1 ('MetaCons "UPREGFailure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (PredicateFailure UPREG))))

data UPIREG Source #

Instances

Instances details
Data UPIREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UPIREG -> Constr #

dataTypeOf :: UPIREG -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic UPIREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UPIREG :: Type -> Type #

Methods

from :: UPIREG -> Rep UPIREG x #

to :: Rep UPIREG x -> UPIREG #

STS UPIREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

HasTrace UPIREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type BaseEnv UPIREG Source #

Embed UPREG UPIREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UPIREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UPIREG = D1 ('MetaData "UPIREG" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (V1 :: Type -> Type)
type PredicateFailure UPIREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type BaseM UPIREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Environment UPIREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Signal UPIREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type State UPIREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type BaseEnv UPIREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type BaseEnv UPIREG = ()

type UPIState = ((ProtVer, PParams), [(Slot, (ProtVer, PParams))], Map ApName (ApVer, Slot, Metadata), Map UpId (ProtVer, PParams), Map UpId (ApName, ApVer, Metadata), Map UpId Slot, Set (UpId, VKeyGenesis), Set (ProtVer, VKeyGenesis), Map UpId Slot) Source #

The update interface state is shared amongst various rules, so we define it as an alias here.

type UPIEnv = (Slot, Bimap VKeyGenesis VKey, BlockCount, Word8) Source #

The update interface environment is shared amongst various rules, so we define it as an alias here.

data UpendPredicateFailure Source #

S_TryNextRule is a structural PredicateFailure, used to fail from one transition rule to the other. The other PredicateFailures are all throwable.

Instances

Instances details
Eq UpendPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Data UpendPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UpendPredicateFailure -> Constr #

dataTypeOf :: UpendPredicateFailure -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UpendPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic UpendPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UpendPredicateFailure :: Type -> Type #

NoThunks UpendPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UpendPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

data UPEND Source #

Instances

Instances details
Data UPEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UPEND -> Constr #

dataTypeOf :: UPEND -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic UPEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UPEND :: Type -> Type #

Methods

from :: UPEND -> Rep UPEND x #

to :: Rep UPEND x -> UPEND #

STS UPEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Embed UPEND UPIEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Embed FADS UPEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UPEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UPEND = D1 ('MetaData "UPEND" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (V1 :: Type -> Type)
type PredicateFailure UPEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type BaseM UPEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Environment UPEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Signal UPEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type State UPEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

data FadsPredicateFailure Source #

Instances

Instances details
Eq FadsPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Data FadsPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: FadsPredicateFailure -> Constr #

dataTypeOf :: FadsPredicateFailure -> DataType #

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

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

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

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

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

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

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

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

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

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

Show FadsPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic FadsPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep FadsPredicateFailure :: Type -> Type #

type Rep FadsPredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep FadsPredicateFailure = D1 ('MetaData "FadsPredicateFailure" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (V1 :: Type -> Type)

data FADS Source #

Instances

Instances details
Data FADS Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: FADS -> Constr #

dataTypeOf :: FADS -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic FADS Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep FADS :: Type -> Type #

Methods

from :: FADS -> Rep FADS x #

to :: Rep FADS x -> FADS #

STS FADS Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type State FADS Source #

type Signal FADS Source #

type Environment FADS Source #

type BaseM FADS :: Type -> Type Source #

type PredicateFailure FADS = (b :: Type) Source #

Embed FADS UPEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep FADS Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep FADS = D1 ('MetaData "FADS" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (V1 :: Type -> Type)
type PredicateFailure FADS Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type BaseM FADS Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Environment FADS Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Environment FADS = ()
type Signal FADS Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type State FADS Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type State FADS = [(Slot, (ProtVer, PParams))]

data UpvotePredicateFailure Source #

The 3 non-embedded PredicateFailures here are all structural. The disjuntion of the preconditions is True - one rule either fires or the other does.

Instances

Instances details
Eq UpvotePredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Data UpvotePredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UpvotePredicateFailure -> Constr #

dataTypeOf :: UpvotePredicateFailure -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UpvotePredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic UpvotePredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UpvotePredicateFailure :: Type -> Type #

NoThunks UpvotePredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UpvotePredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UpvotePredicateFailure = D1 ('MetaData "UpvotePredicateFailure" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) ((C1 ('MetaCons "ADDVOTEFailure" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (PredicateFailure ADDVOTE))) :+: C1 ('MetaCons "S_HigherThanThdAndNotAlreadyConfirmed" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "S_CfmThdNotReached" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "S_AlreadyConfirmed" 'PrefixI 'False) (U1 :: Type -> Type)))

data UPVOTE Source #

Instances

Instances details
Data UPVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: UPVOTE -> Constr #

dataTypeOf :: UPVOTE -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic UPVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep UPVOTE :: Type -> Type #

Methods

from :: UPVOTE -> Rep UPVOTE x #

to :: Rep UPVOTE x -> UPVOTE #

STS UPVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Embed UPVOTE UPIVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Embed ADDVOTE UPVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UPVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep UPVOTE = D1 ('MetaData "UPVOTE" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (V1 :: Type -> Type)
type PredicateFailure UPVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type BaseM UPVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Environment UPVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Signal UPVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type State UPVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

data AddvotePredicateFailure Source #

These PredicateFailures are all throwable.

Instances

Instances details
Eq AddvotePredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Data AddvotePredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: AddvotePredicateFailure -> Constr #

dataTypeOf :: AddvotePredicateFailure -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AddvotePredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Generic AddvotePredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep AddvotePredicateFailure :: Type -> Type #

NoThunks AddvotePredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep AddvotePredicateFailure Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep AddvotePredicateFailure = D1 ('MetaData "AddvotePredicateFailure" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) ((C1 ('MetaCons "AVSigDoesNotVerify" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NoUpdateProposal" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 UpId))) :+: (C1 ('MetaCons "VoteByNonGenesisDelegate" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 VKey)) :+: C1 ('MetaCons "RepeatVoteByGenesisDelegate" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 VKey))))

data ADDVOTE Source #

Instances

Instances details
Data ADDVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Methods

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

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

toConstr :: ADDVOTE -> Constr #

dataTypeOf :: ADDVOTE -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic ADDVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Associated Types

type Rep ADDVOTE :: Type -> Type #

Methods

from :: ADDVOTE -> Rep ADDVOTE x #

to :: Rep ADDVOTE x -> ADDVOTE #

STS ADDVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

Embed ADDVOTE UPVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep ADDVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Rep ADDVOTE = D1 ('MetaData "ADDVOTE" "Byron.Spec.Ledger.Update" "byron-spec-ledger-0.1.0.0-AWpYh6fpW7YLETcmEzrAvm" 'False) (V1 :: Type -> Type)
type PredicateFailure ADDVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type BaseM ADDVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Environment ADDVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type Signal ADDVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type State ADDVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

findKey :: (v -> Bool) -> Map k v -> Maybe (k, v) Source #

Find the key that corresponds to the value satisfying the given predicate. In case zero or more than one key is found this function returns Nothing.

ppsUpdateFrom :: PParams -> Gen PParams Source #

Generate a protocol parameter update from a given set of current protocol-parameters, ensuring the consistency of the new protocol parameters w.r.t. the current ones, according to the canUpdate predicate in the formal specification.

TODO: we can move this into a Generator's module, but first we need to disentangle the dependencies. Moving this to Byron.Spec.Ledger.Update.Generators will cause a circular dependency. I think the rules need to be moved into their own modules.

increasingProbabilityAt :: Gen a -> (a, a) -> Gen a Source #

Generate values the given distribution in 90% of the cases, and values at the bounds of the range in 10% of the cases.

This can be used to generate enough extreme values. The exponential and linear distributions provided by hedgehog will generate a small percentage of these (0-1%).

randomUpId :: Gen UpId Source #

Generate a random update proposal id, by picking a large number so that the probability of having an update proposal with that id is nearly zero.

reSign :: UProp -> UProp Source #

Update the signature of the update proposal.

pickHighlyEndorsedProtocolVersion Source #

Arguments

:: [(ProtVer, Set VKeyGenesis)]

Current set of endorsements

-> Gen (Maybe ProtVer) 

Given a list of protocol versions and keys endorsing those versions, generate a protocol-version endorsement, or Nothing if the list of endorsements is empty. The version to be endorsed will be selected from those versions that have the most endorsements.

updateProposalAndVotesGen :: UPIEnv -> UPIState -> Gen (Maybe UProp, [Vote]) Source #

Generate an optional update-proposal and a list of votes, given an update environment and state.

The update proposal and votes need to be generated at the same time, since this allow us to generate update votes for update proposals issued in the same block as the votes.

protocolVersionEndorsementGen :: UPIEnv -> UPIState -> Gen ProtVer Source #

Generate an endorsement given an update environment and state.

tamperWithUpdateProposal :: UPIEnv -> UPIState -> UProp -> Gen UProp Source #

Tamper with the update proposal in such a way that the following predicate failures are triggered with equal probability:

  • UPREGFailure
  • UPVFailure
  • UPVFailure
  • UPPVVFailure
  • CannotFollowPv
  • CannotUpdatePv
  • AlreadyProposedPv
  • UPSVVFailure
  • AlreadyProposedSv
  • CannotFollowSv
  • InvalidApplicationName
  • InvalidSystemTags
  • AVChangedInPVUpdate
  • ParamsChangedInSVUpdate
  • PVChangedInSVUpdate
  • NotGenesisDelegate
  • DoesNotVerify

tamperWithVotes :: UPIEnv -> UPIState -> [Vote] -> Gen [Vote] Source #

Tamper with some of the votes provided as parameter in such a way that the following predicate failures are triggered with equal probability:

  • AVSigDoesNotVerify
  • NoUpdateProposal

type family PredicateFailure a = (b :: Type) | b -> a Source #

Descriptive type for the possible failures which might cause a transition to fail.

As a convention, PredicateFailures which are "structural" (meaning that they are not "throwable" in practice, and are used to pass control from one transition rule to another) are prefixed with S_.

Structural PredicateFailures represent conditions between rules where the disjunction of all rules' preconditions is equal to True. That is, either one rule will throw a structural PredicateFailure and the other will succeed, or vice-versa.

Instances

Instances details
type PredicateFailure UPREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type PredicateFailure UPV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type PredicateFailure UPPVV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type PredicateFailure UPSVV Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type PredicateFailure UPIEC Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type PredicateFailure PVBUMP Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type PredicateFailure UPIEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type PredicateFailure UPIVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type PredicateFailure APPLYVOTES Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type PredicateFailure UPIVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type PredicateFailure UPIREG Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type PredicateFailure UPEND Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type PredicateFailure FADS Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type PredicateFailure UPVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type PredicateFailure ADDVOTE Source # 
Instance details

Defined in Byron.Spec.Ledger.Update

type PredicateFailure UTXO Source # 
Instance details

Defined in Byron.Spec.Ledger.STS.UTXO

type PredicateFailure DELEG Source # 
Instance details

Defined in Byron.Spec.Ledger.Delegation

type PredicateFailure ADELEGS Source # 
Instance details

Defined in Byron.Spec.Ledger.Delegation

type PredicateFailure SDELEGS Source # 
Instance details

Defined in Byron.Spec.Ledger.Delegation

type PredicateFailure ADELEG Source # 
Instance details

Defined in Byron.Spec.Ledger.Delegation

type PredicateFailure SDELEG Source # 
Instance details

Defined in Byron.Spec.Ledger.Delegation

type PredicateFailure UTXOW Source # 
Instance details

Defined in Byron.Spec.Ledger.STS.UTXOW

type PredicateFailure UTXOWS Source # 
Instance details

Defined in Byron.Spec.Ledger.STS.UTXOWS

Orphan instances

Hashable a => Hashable (Set a) Source # 
Instance details

Methods

hashWithSalt :: Int -> Set a -> Int Source #

hash :: Set a -> Int Source #

Field1 (a, b, c, d, e, f, g, h, i) (a', b, c, d, e, f, g, h, i) a a' Source # 
Instance details

Methods

_1 :: Lens (a, b, c, d, e, f, g, h, i) (a', b, c, d, e, f, g, h, i) a a' Source #

Field2 (a, b, c, d, e, f, g, h, i) (a, b', c, d, e, f, g, h, i) b b' Source # 
Instance details

Methods

_2 :: Lens (a, b, c, d, e, f, g, h, i) (a, b', c, d, e, f, g, h, i) b b' Source #

Field3 (a, b, c, d, e, f, g, h, i) (a, b, c', d, e, f, g, h, i) c c' Source # 
Instance details

Methods

_3 :: Lens (a, b, c, d, e, f, g, h, i) (a, b, c', d, e, f, g, h, i) c c' Source #