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

Safe HaskellSafe
LanguageHaskell2010

Language.WebIDL.AST

Description

 

Synopsis

Documentation

data Interface a Source #

interface

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 #

Partial Definition

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 #

dictionary

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 #

exception

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 #

enum

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 #

typedef

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 ExceptionMember a Source #

Member of exception definition

Constructors

ExConst a (Const a) 
ExField a Type Ident 

data Attribute a Source #

Attribute member of interface

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 #

Operation member of interface

Instances

Eq a => Eq (Operation a) Source # 

Methods

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

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

Show a => Show (Operation a) Source # 

newtype EnumValue Source #

Value of a enum

Constructors

EnumValue String 

data Const a Source #

const

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 Default Source #

default specification

data Special Source #

Special qualifier

data Type Source #

Types

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 IntegerWidth Source #

Integer width, short, long etc.

Constructors

Short 
Long Int 

data Unsigned Source #

unsigned modifier

Constructors

Unsigned 

type UnionType = [UnionMemberType] Source #

Union of several types

data Null Source #

null keyword

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 #

data Ellipsis Source #

ellipsis marker

Constructors

Ellipsis 

data ReadOnly Source #

readonly marker

Constructors

ReadOnly 

data Inherit Source #

inherit marker

Constructors

Inherit 

newtype Ident Source #

Identifier

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 #