pub enum Subset {
MarkupDecl(MarkupDeclaration),
DeclSep {
reference: Reference,
expansion: Option<Box<Subset>>,
},
None,
}
Variants§
Implementations§
Source§impl Subset
impl Subset
pub fn get_entity(&self) -> Option<&EntityDeclaration>
Trait Implementations§
Source§impl<'a> Parse<'a> for Subset
impl<'a> Parse<'a> for Subset
type Args = (Rc<RefCell<HashMap<(Name, EntitySource), EntityValue>>>, &'a Config, EntitySource)
type Output = Result<(&'a str, Vec<Subset>), Err<Error>>
fn parse(input: &'a str, args: Self::Args) -> Self::Output
fn is_char(c: char) -> bool
fn parse_char(input: &str) -> IResult<&str, char>
fn is_whitespace(c: char) -> bool
fn parse_multispace1(input: &str) -> IResult<&str, ()>
fn parse_multispace0(input: &str) -> IResult<&str, ()>
fn is_name_start_char(c: char) -> bool
fn is_name_char(c: char) -> bool
fn parse_name_char(input: &str) -> IResult<&str, char>
fn parse_name_start_char(input: &str) -> IResult<&str, char>
fn parse_nmtoken(input: &str) -> IResult<&str, String>
fn parse_nmtokens(input: &str) -> IResult<&str, Vec<String>>
fn parse_name(input: &str) -> IResult<&str, Name>
fn parse_names(input: &str) -> IResult<&str, Vec<Name>>
fn parse_eq(input: &str) -> IResult<&str, ()>
fn capture_span<O, F>( f: F, ) -> Box<dyn FnMut(&'a str) -> IResult<&'a str, (&'a str, O)> + 'a>
Source§impl ParseDeclSep for Subset
impl ParseDeclSep for Subset
type Output = Option<Subset>
fn parse_decl_sep( input: &str, entity_references: Rc<RefCell<HashMap<(Name, EntitySource), EntityValue>>>, entity_source: EntitySource, ) -> IResult<&str, Self::Output>
fn expand_entity( reference: &Reference, entity_references: &Rc<RefCell<HashMap<(Name, EntitySource), EntityValue>>>, entity_source: EntitySource, ) -> Option<EntityValue>
Source§impl<'a> ParseNamespace<'a> for Subset
impl<'a> ParseNamespace<'a> for Subset
fn parse_namespace_attribute_name(input: &str) -> IResult<&str, Name>
fn parse_prefixed_attribute_name(input: &str) -> IResult<&str, Name>
fn parse_non_colonized_name(input: &str) -> IResult<&str, String>
fn parse_non_colonized_name_char(input: &str) -> IResult<&str, char>
fn parse_non_colonized_name_start_char(input: &str) -> IResult<&str, char>
fn parse_qualified_name(input: &str) -> IResult<&str, Name>
fn parse_prefixed_name(input: &str) -> IResult<&str, Name>
impl Eq for Subset
impl StructuralPartialEq for Subset
Auto Trait Implementations§
impl Freeze for Subset
impl RefUnwindSafe for Subset
impl Send for Subset
impl Sync for Subset
impl Unpin for Subset
impl UnwindSafe for Subset
Blanket Implementations§
Source§impl<T> BorrowMut<T> for Twhere
T: ?Sized,
impl<T> BorrowMut<T> for Twhere
T: ?Sized,
Source§fn borrow_mut(&mut self) -> &mut T
fn borrow_mut(&mut self) -> &mut T
Mutably borrows from an owned value. Read more