pub struct XmlDecl {
pub version: String,
pub encoding: Option<String>,
pub standalone: Option<Standalone>,
}
Fields§
§version: String
§encoding: Option<String>
§standalone: Option<Standalone>
Trait Implementations§
Source§impl<'a> Parse<'a> for XmlDecl
impl<'a> Parse<'a> for XmlDecl
type Args = ()
type Output = Result<(&'a str, XmlDecl), 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>
impl Eq for XmlDecl
impl StructuralPartialEq for XmlDecl
Auto Trait Implementations§
impl Freeze for XmlDecl
impl RefUnwindSafe for XmlDecl
impl Send for XmlDecl
impl Sync for XmlDecl
impl Unpin for XmlDecl
impl UnwindSafe for XmlDecl
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