| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Agda.Syntax.Concrete.Attribute
Description
Synopsis
- data Attribute
- data Attr = Attr {}
- type LensAttribute a = (LensRelevance a, LensQuantity a, LensCohesion a, LensModalPolarity a, LensLock a)
- relevanceAttributeTable :: [(String, Relevance)]
- quantityAttributeTable :: [(String, Quantity)]
- cohesionAttributeTable :: [(String, Cohesion)]
- type Attributes = [Attr]
- polarityAttributeTable :: [(String, PolarityModality)]
- lockAttributeTable :: [(String, Lock)]
- attributesMap :: Map String Attribute
- stringToAttribute :: String -> Maybe Attribute
- exprToAttribute :: Range -> Expr -> Maybe Attribute
- setAttribute :: LensAttribute a => Attribute -> a -> a
- setAttributes :: LensAttribute a => [Attribute] -> a -> a
- setPristineRelevance :: LensRelevance a => Relevance -> a -> Maybe a
- setPristineQuantity :: LensQuantity a => Quantity -> a -> Maybe a
- setPristineCohesion :: LensCohesion a => Cohesion -> a -> Maybe a
- setPristinePolarity :: LensModalPolarity a => PolarityModality -> a -> Maybe a
- setPristineLock :: LensLock a => Lock -> a -> Maybe a
- setPristineAttribute :: LensAttribute a => Attribute -> a -> Maybe a
- setPristineAttributes :: LensAttribute a => [Attribute] -> a -> Maybe a
- isRelevanceAttribute :: Attribute -> Maybe Relevance
- isQuantityAttribute :: Attribute -> Maybe Quantity
- isTacticAttribute :: Attribute -> TacticAttribute
- relevanceAttributes :: [Attribute] -> [Attribute]
- quantityAttributes :: [Attribute] -> [Attribute]
- tacticAttributes :: [Attribute] -> [Attribute]
Documentation
An attribute is a modifier for ArgInfo.
Constructors
| RelevanceAttribute Relevance | |
| QuantityAttribute Quantity | |
| TacticAttribute (Ranged Expr) | |
| CohesionAttribute Cohesion | |
| PolarityAttribute PolarityModality | |
| LockAttribute Lock |
Parsed attribute.
Constructors
| Attr | |
type LensAttribute a = (LensRelevance a, LensQuantity a, LensCohesion a, LensModalPolarity a, LensLock a) Source #
(Conjunctive constraint.)
cohesionAttributeTable :: [(String, Cohesion)] Source #
type Attributes = [Attr] Source #
Information about attributes (attribute, range, printed representation).
This information is returned by the parser. Code that calls the
parser should, if appropriate, complain if support for the given
attributes has not been enabled. This can be taken care of by
checkAttributes, which
should not be called until after pragma options have been set.
polarityAttributeTable :: [(String, PolarityModality)] Source #
Modifiers for Polarity.
exprToAttribute :: Range -> Expr -> Maybe Attribute Source #
Parsing an expression into an attribute.
setAttribute :: LensAttribute a => Attribute -> a -> a Source #
Setting an attribute (in e.g. an Arg). Overwrites previous value.
setAttributes :: LensAttribute a => [Attribute] -> a -> a Source #
Setting some attributes in left-to-right order. Blindly overwrites previous settings.
Applying attributes only if they have not been set already.
setPristineRelevance :: LensRelevance a => Relevance -> a -> Maybe a Source #
Setting Relevance if unset.
setPristineQuantity :: LensQuantity a => Quantity -> a -> Maybe a Source #
Setting Quantity if unset.
setPristineCohesion :: LensCohesion a => Cohesion -> a -> Maybe a Source #
Setting Cohesion if unset.
setPristinePolarity :: LensModalPolarity a => PolarityModality -> a -> Maybe a Source #
Setting ModalPolarity if unset.
setPristineAttribute :: LensAttribute a => Attribute -> a -> Maybe a Source #
Setting an unset attribute (to e.g. an Arg).
setPristineAttributes :: LensAttribute a => [Attribute] -> a -> Maybe a Source #
Setting a list of unset attributes.
Filtering attributes
relevanceAttributes :: [Attribute] -> [Attribute] Source #
quantityAttributes :: [Attribute] -> [Attribute] Source #
tacticAttributes :: [Attribute] -> [Attribute] Source #