module Text.XML.HXT.Arrow.XmlState.SystemConfig
where
import Control.Arrow
import Data.Map ( insert )
import Text.XML.HXT.DOM.Interface
import Text.XML.HXT.Arrow.XmlState.ErrorHandling
import Text.XML.HXT.Arrow.XmlState.TypeDefs
withTrace :: Int -> SysConfig
withTrace :: Int -> SysConfig
withTrace = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState Int
theTraceLevel
withSysAttr :: String -> String -> SysConfig
withSysAttr :: String -> String -> SysConfig
withSysAttr String
n String
v = forall s a. Selector s a -> (a -> a) -> s -> s
chgS Selector XIOSysState Attributes
theAttrList (forall k v. Eq k => k -> v -> AssocList k v -> AssocList k v
addEntry String
n String
v)
withAcceptedMimeTypes :: [String] -> SysConfig
withAcceptedMimeTypes :: [String] -> SysConfig
withAcceptedMimeTypes = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState [String]
theAcceptedMimeTypes
withMimeTypeHandler :: String -> IOSArrow XmlTree XmlTree -> SysConfig
withMimeTypeHandler :: String -> IOSArrow XmlTree XmlTree -> SysConfig
withMimeTypeHandler String
mt IOSArrow XmlTree XmlTree
pa = forall s a. Selector s a -> (a -> a) -> s -> s
chgS Selector XIOSysState MimeTypeHandlers
theMimeTypeHandlers forall a b. (a -> b) -> a -> b
$ forall k a. Ord k => k -> a -> Map k a -> Map k a
insert String
mt IOSArrow XmlTree XmlTree
pa
withMimeTypeFile :: String -> SysConfig
withMimeTypeFile :: String -> SysConfig
withMimeTypeFile = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState String
theMimeTypeFile
withFileMimeType :: String -> SysConfig
withFileMimeType :: String -> SysConfig
withFileMimeType = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState String
theFileMimeType
withWarnings :: Bool -> SysConfig
withWarnings :: Bool -> SysConfig
withWarnings = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState Bool
theWarnings
withErrors :: Bool -> SysConfig
withErrors :: Bool -> SysConfig
withErrors Bool
b = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState (String -> IO ())
theErrorMsgHandler String -> IO ()
h
where
h :: String -> IO ()
h | Bool
b = String -> IO ()
errorOutputToStderr
| Bool
otherwise = forall a b. a -> b -> a
const forall a b. (a -> b) -> a -> b
$ forall (m :: * -> *) a. Monad m => a -> m a
return ()
withRemoveWS :: Bool -> SysConfig
withRemoveWS :: Bool -> SysConfig
withRemoveWS = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState Bool
theRemoveWS
withPreserveComment :: Bool -> SysConfig
= forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState Bool
thePreserveComment
withParseByMimeType :: Bool -> SysConfig
withParseByMimeType :: Bool -> SysConfig
withParseByMimeType = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState Bool
theParseByMimeType
withParseHTML :: Bool -> SysConfig
withParseHTML :: Bool -> SysConfig
withParseHTML = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState Bool
theParseHTML
withValidate :: Bool -> SysConfig
withValidate :: Bool -> SysConfig
withValidate = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState Bool
theValidate
withSubstDTDEntities :: Bool -> SysConfig
withSubstDTDEntities :: Bool -> SysConfig
withSubstDTDEntities = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState Bool
theSubstDTDEntities
withSubstHTMLEntities :: Bool -> SysConfig
withSubstHTMLEntities :: Bool -> SysConfig
withSubstHTMLEntities = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState Bool
theSubstHTMLEntities
withCheckNamespaces :: Bool -> SysConfig
withCheckNamespaces :: Bool -> SysConfig
withCheckNamespaces = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState Bool
theCheckNamespaces
withCanonicalize :: Bool -> SysConfig
withCanonicalize :: Bool -> SysConfig
withCanonicalize = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState Bool
theCanonicalize
withIgnoreNoneXmlContents :: Bool -> SysConfig
withIgnoreNoneXmlContents :: Bool -> SysConfig
withIgnoreNoneXmlContents = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState Bool
theIgnoreNoneXmlContents
withStrictInput :: Bool -> SysConfig
withStrictInput :: Bool -> SysConfig
withStrictInput = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState Bool
theStrictInput
withEncodingErrors :: Bool -> SysConfig
withEncodingErrors :: Bool -> SysConfig
withEncodingErrors = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState Bool
theEncodingErrors
withInputEncoding :: String -> SysConfig
withInputEncoding :: String -> SysConfig
withInputEncoding = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState String
theInputEncoding
withDefaultBaseURI :: String -> SysConfig
withDefaultBaseURI :: String -> SysConfig
withDefaultBaseURI = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState String
theDefaultBaseURI
withInputOption :: String -> String -> SysConfig
withInputOption :: String -> String -> SysConfig
withInputOption String
n String
v = forall s a. Selector s a -> (a -> a) -> s -> s
chgS Selector XIOSysState Attributes
theInputOptions (forall k v. Eq k => k -> v -> AssocList k v -> AssocList k v
addEntry String
n String
v)
withInputOptions :: Attributes -> SysConfig
withInputOptions :: Attributes -> SysConfig
withInputOptions = forall (t :: * -> *) a b.
Foldable t =>
(a -> b -> b) -> b -> t a -> b
foldr forall {k} (cat :: k -> k -> *) (a :: k) (b :: k) (c :: k).
Category cat =>
cat a b -> cat b c -> cat a c
(>>>) forall a. a -> a
id forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a b. (a -> b) -> [a] -> [b]
map (forall a b c. (a -> b -> c) -> (a, b) -> c
uncurry String -> String -> SysConfig
withInputOption)
withRedirect :: Bool -> SysConfig
withRedirect :: Bool -> SysConfig
withRedirect = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState Bool
theRedirect
withProxy :: String -> SysConfig
withProxy :: String -> SysConfig
withProxy = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState String
theProxy
withIndent :: Bool -> SysConfig
withIndent :: Bool -> SysConfig
withIndent = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState Bool
theIndent
withOutputEncoding :: String -> SysConfig
withOutputEncoding :: String -> SysConfig
withOutputEncoding = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState String
theOutputEncoding
withOutputXML :: SysConfig
withOutputXML :: SysConfig
withOutputXML = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState XIOXoutConfig
theOutputFmt XIOXoutConfig
XMLoutput
withOutputHTML :: SysConfig
withOutputHTML :: SysConfig
withOutputHTML = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState XIOXoutConfig
theOutputFmt XIOXoutConfig
HTMLoutput
withOutputXHTML :: SysConfig
withOutputXHTML :: SysConfig
withOutputXHTML = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState XIOXoutConfig
theOutputFmt XIOXoutConfig
XHTMLoutput
withOutputPLAIN :: SysConfig
withOutputPLAIN :: SysConfig
withOutputPLAIN = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState XIOXoutConfig
theOutputFmt XIOXoutConfig
PLAINoutput
withXmlPi :: Bool -> SysConfig
withXmlPi :: Bool -> SysConfig
withXmlPi = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState Bool
theXmlPi
withNoEmptyElemFor :: [String] -> SysConfig
withNoEmptyElemFor :: [String] -> SysConfig
withNoEmptyElemFor = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState [String]
theNoEmptyElemFor
withAddDefaultDTD :: Bool -> SysConfig
withAddDefaultDTD :: Bool -> SysConfig
withAddDefaultDTD = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState Bool
theAddDefaultDTD
withTextMode :: Bool -> SysConfig
withTextMode :: Bool -> SysConfig
withTextMode = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState Bool
theTextMode
withShowTree :: Bool -> SysConfig
withShowTree :: Bool -> SysConfig
withShowTree = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState Bool
theShowTree
withShowHaskell :: Bool -> SysConfig
withShowHaskell :: Bool -> SysConfig
withShowHaskell = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState Bool
theShowHaskell
withCompression :: (CompressionFct, DeCompressionFct) -> SysConfig
withCompression :: (CompressionFct, CompressionFct) -> SysConfig
withCompression = forall s a. Selector s a -> a -> s -> s
setS (Selector XIOSysState CompressionFct
theBinaryCompression forall s a b. Selector s a -> Selector s b -> Selector s (a, b)
.&&&. Selector XIOSysState CompressionFct
theBinaryDeCompression)
withStrictDeserialize :: Bool -> SysConfig
withStrictDeserialize :: Bool -> SysConfig
withStrictDeserialize = forall s a. Selector s a -> a -> s -> s
setS Selector XIOSysState Bool
theStrictDeserialize
yes :: Bool
yes :: Bool
yes = Bool
True
no :: Bool
no :: Bool
no = Bool
False