language-webidl-0.1.1.1: Parser and Pretty Printer for WebIDL

Safe HaskellSafe
LanguageHaskell2010

Language.WebIDL.AST

Documentation

data Interface a Source #

Constructors

Interface a Ident (Maybe Ident) [InterfaceMember a] 

Instances

Eq a => Eq (Interface a) Source # 

Methods

(==) :: Interface a -> Interface a -> Bool #

(/=) :: Interface a -> Interface a -> Bool #

Show a => Show (Interface a) Source # 

data Partial a Source #

Instances

Eq a => Eq (Partial a) Source # 

Methods

(==) :: Partial a -> Partial a -> Bool #

(/=) :: Partial a -> Partial a -> Bool #

Show a => Show (Partial a) Source # 

Methods

showsPrec :: Int -> Partial a -> ShowS #

show :: Partial a -> String #

showList :: [Partial a] -> ShowS #

data Dictionary a Source #

Instances

Eq a => Eq (Dictionary a) Source # 

Methods

(==) :: Dictionary a -> Dictionary a -> Bool #

(/=) :: Dictionary a -> Dictionary a -> Bool #

Show a => Show (Dictionary a) Source # 

data Exception a Source #

Constructors

Exception a Ident (Maybe Ident) [ExceptionMember a] 

Instances

Eq a => Eq (Exception a) Source # 

Methods

(==) :: Exception a -> Exception a -> Bool #

(/=) :: Exception a -> Exception a -> Bool #

Show a => Show (Exception a) Source # 

data Enum a Source #

Constructors

Enum a Ident [EnumValue] 

Instances

Eq a => Eq (Enum a) Source # 

Methods

(==) :: Enum a -> Enum a -> Bool #

(/=) :: Enum a -> Enum a -> Bool #

Show a => Show (Enum a) Source # 

Methods

showsPrec :: Int -> Enum a -> ShowS #

show :: Enum a -> String #

showList :: [Enum a] -> ShowS #

data Typedef a Source #

Constructors

Typedef a Type Ident 

Instances

Eq a => Eq (Typedef a) Source # 

Methods

(==) :: Typedef a -> Typedef a -> Bool #

(/=) :: Typedef a -> Typedef a -> Bool #

Show a => Show (Typedef a) Source # 

Methods

showsPrec :: Int -> Typedef a -> ShowS #

show :: Typedef a -> String #

showList :: [Typedef a] -> ShowS #

data Attribute a Source #

Instances

Eq a => Eq (Attribute a) Source # 

Methods

(==) :: Attribute a -> Attribute a -> Bool #

(/=) :: Attribute a -> Attribute a -> Bool #

Show a => Show (Attribute a) Source # 

data Operation a Source #

Instances

Eq a => Eq (Operation a) Source # 

Methods

(==) :: Operation a -> Operation a -> Bool #

(/=) :: Operation a -> Operation a -> Bool #

Show a => Show (Operation a) Source # 

data Const a Source #

Instances

Eq a => Eq (Const a) Source # 

Methods

(==) :: Const a -> Const a -> Bool #

(/=) :: Const a -> Const a -> Bool #

Show a => Show (Const a) Source # 

Methods

showsPrec :: Int -> Const a -> ShowS #

show :: Const a -> String #

showList :: [Const a] -> ShowS #

data Type Source #

Instances

Eq Type Source # 

Methods

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

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

Show Type Source # 

Methods

showsPrec :: Int -> Type -> ShowS #

show :: Type -> String #

showList :: [Type] -> ShowS #

data Inherit Source #

Constructors

Inherit 

data Null Source #

Constructors

Null 

Instances

Eq Null Source # 

Methods

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

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

Show Null Source # 

Methods

showsPrec :: Int -> Null -> ShowS #

show :: Null -> String #

showList :: [Null] -> ShowS #

newtype Ident Source #

Constructors

Ident String 

Instances

Eq Ident Source # 

Methods

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

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

Ord Ident Source # 

Methods

compare :: Ident -> Ident -> Ordering #

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

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

(>) :: Ident -> Ident -> Bool #

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

max :: Ident -> Ident -> Ident #

min :: Ident -> Ident -> Ident #

Show Ident Source # 

Methods

showsPrec :: Int -> Ident -> ShowS #

show :: Ident -> String #

showList :: [Ident] -> ShowS #