language-bluespec-0.1: An implementation of the Bluespec Haskell AST
Safe HaskellSafe-Inferred
LanguageHaskell2010

Language.Bluespec.Classic.AST.SchedInfo

Documentation

data SchedInfo idtype Source #

Constructors

SchedInfo 

Fields

Instances

Instances details
Show idtype => Show (SchedInfo idtype) Source # 
Instance details

Defined in Language.Bluespec.Classic.AST.SchedInfo

Methods

showsPrec :: Int -> SchedInfo idtype -> ShowS #

show :: SchedInfo idtype -> String #

showList :: [SchedInfo idtype] -> ShowS #

Eq idtype => Eq (SchedInfo idtype) Source # 
Instance details

Defined in Language.Bluespec.Classic.AST.SchedInfo

Methods

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

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

Ord idtype => Ord (SchedInfo idtype) Source # 
Instance details

Defined in Language.Bluespec.Classic.AST.SchedInfo

Methods

compare :: SchedInfo idtype -> SchedInfo idtype -> Ordering #

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

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

(>) :: SchedInfo idtype -> SchedInfo idtype -> Bool #

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

max :: SchedInfo idtype -> SchedInfo idtype -> SchedInfo idtype #

min :: SchedInfo idtype -> SchedInfo idtype -> SchedInfo idtype #

(Pretty idtype, Ord idtype) => Pretty (SchedInfo idtype) Source # 
Instance details

Defined in Language.Bluespec.Classic.AST.SchedInfo

Methods

pPrintPrec :: PrettyLevel -> Rational -> SchedInfo idtype -> Doc #

pPrint :: SchedInfo idtype -> Doc #

pPrintList :: PrettyLevel -> [SchedInfo idtype] -> Doc #

data MethodConflictInfo idtype Source #

Constructors

MethodConflictInfo 

Fields

  • sCF :: [(idtype, idtype)]
     
  • sSB :: [(idtype, idtype)]
     
  • sME :: [[idtype]]
     
  • sP :: [(idtype, idtype)]
     
  • sSBR :: [(idtype, idtype)]
     
  • sC :: [(idtype, idtype)]
     
  • sEXT :: [idtype]
     

Instances

Instances details
Show idtype => Show (MethodConflictInfo idtype) Source # 
Instance details

Defined in Language.Bluespec.Classic.AST.SchedInfo

Eq idtype => Eq (MethodConflictInfo idtype) Source # 
Instance details

Defined in Language.Bluespec.Classic.AST.SchedInfo

Methods

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

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

Ord idtype => Ord (MethodConflictInfo idtype) Source # 
Instance details

Defined in Language.Bluespec.Classic.AST.SchedInfo

(Pretty idtype, Ord idtype) => Pretty (MethodConflictInfo idtype) Source # 
Instance details

Defined in Language.Bluespec.Classic.AST.SchedInfo

makeMethodConflictDocs :: Ord idtype => (idtype -> Doc) -> (idtype -> String) -> String -> String -> MethodConflictInfo idtype -> [Doc] Source #