HaXPath-0.3.0.1: An XPath-generating embedded domain specific language.
Safe HaskellSafe-Inferred
LanguageHaskell2010

HaXPath.Operators

Description

XPath operators which are re-exported from the HaXPath module for convenience. This module is designed to be imported unqualified.

Synopsis

Documentation

(#) :: (Filterable p, Showed p ~ s) => p -> [Bool' s] -> p infixl 9 Source #

Filter the nodes returned by p such that they match the list of predicates.

(&&.) :: IsString s => Bool' s -> Bool' s -> Bool' s infixr 3 Source #

The XPath and operator.

(/.) :: SlashOperator p q => p -> q -> Path' (Context p) (Showed q) infixl 8 Source #

The XPath / operator.

(//.) :: DoubleSlashOperator p q => p -> q -> Path' (Context p) (Showed q) infixl 8 Source #

The XPath // operator.

(/=.) :: (Eq a, IsString (Showed a)) => a -> a -> Bool' (Showed a) infix 4 Source #

The XPath != operator.

(<.) :: (Ord a, IsString (Showed a)) => a -> a -> Bool' (Showed a) infix 4 Source #

The XPath < operator.

(<=.) :: (Ord a, IsString (Showed a)) => a -> a -> Bool' (Showed a) infix 4 Source #

The XPath <= operator.

(=.) :: (Eq a, IsString (Showed a)) => a -> a -> Bool' (Showed a) infix 4 Source #

The XPath = operator.

(>.) :: (Ord a, IsString (Showed a)) => a -> a -> Bool' (Showed a) infix 4 Source #

The XPath > operator.

(>=.) :: (Ord a, IsString (Showed a)) => a -> a -> Bool' (Showed a) infix 4 Source #

The XPath >= operator.

(||.) :: IsString s => Bool' s -> Bool' s -> Bool' s infixr 2 Source #

The XPath or operator.

(|.) :: (PathLike p, PathLike q, IsExpression p, IsExpression q, Context p ~ Context q, Showed p ~ Showed q, IsString (Showed q)) => p -> q -> Path' (Context p) (Showed q) infix 7 Source #

The union of two node-sets.