module QueryExample where

import BaseXClient
import Control.Monad

main :: IO ()
main = withSession "localhost" 1984 "admin" "admin" $ \session ->
  withQuery session "for $i in 1 to 10 return <xml>Text { $i }</xml>"
    $ results >=> print