| Safe Haskell | None | 
|---|---|
| Language | Haskell98 | 
Pdf.Toolbox.Document.Pdf
Description
Basic implementation of pdf monad
- type Pdf m = PdfE (Pdf' m)
- data Pdf' m a
- runPdf :: MonadIO m => RIS -> [StreamFilter] -> Pdf m a -> m (Either PdfError a)
- runPdfWithHandle :: MonadIO m => Handle -> [StreamFilter] -> Pdf m a -> m (Either PdfError a)
- document :: MonadIO m => Pdf m Document
- flushObjectCache :: Monad m => Pdf m ()
- withoutObjectCache :: Monad m => Pdf m () -> Pdf m ()
- knownFilters :: [StreamFilter]
- isEncrypted :: MonadIO m => Pdf m Bool
- setUserPassword :: MonadIO m => ByteString -> Pdf m Bool
- defaultUserPassword :: ByteString
- decrypt :: MonadIO m => Ref -> Object a -> Pdf m (Object a)
- class Monad m => MonadIO m where
Documentation
Basic implementation of pdf monad
runPdf :: MonadIO m => RIS -> [StreamFilter] -> Pdf m a -> m (Either PdfError a) Source
Execute PDF action with RIS
runPdfWithHandle :: MonadIO m => Handle -> [StreamFilter] -> Pdf m a -> m (Either PdfError a) Source
Execute PDF action with Handle
flushObjectCache :: Monad m => Pdf m () Source
Remove all objects from cache
withoutObjectCache :: Monad m => Pdf m () -> Pdf m () Source
Perform action without adding objects to cache. Note: the existent cache is not flushed, and is used within the action
knownFilters :: [StreamFilter]
All stream filters implemented by the toolbox
Right now it contains only FlateDecode filter
isEncrypted :: MonadIO m => Pdf m Bool Source
Whether the PDF document it encrypted
setUserPassword :: MonadIO m => ByteString -> Pdf m Bool Source
Set the password to be user for decryption
Returns False when the password is wrong
defaultUserPassword :: ByteString Source
The default user password
decrypt :: MonadIO m => Ref -> Object a -> Pdf m (Object a) Source
Decrypt PDF object using user password is set
class Monad m => MonadIO m where
Monads in which IO computations may be embedded.
 Any monad built by applying a sequence of monad transformers to the
 IO monad will be an instance of this class.
Instances should satisfy the following laws, which state that liftIO
 is a transformer of monads:
Instances
| MonadIO IO | |
| MonadIO m => MonadIO (MaybeT m) | |
| MonadIO (Generator r) | |
| MonadIO (Consumer c) | |
| MonadIO m => MonadIO (ListT m) | |
| MonadIO m => MonadIO (IdentityT m) | |
| MonadIO m => MonadIO (Pdf' m) | |
| MonadIO m => MonadIO (ExceptT e m) | |
| (Monoid w, MonadIO m) => MonadIO (WriterT w m) | |
| (Monoid w, MonadIO m) => MonadIO (WriterT w m) | |
| (Error e, MonadIO m) => MonadIO (ErrorT e m) | |
| MonadIO m => MonadIO (StateT s m) | |
| MonadIO m => MonadIO (StateT s m) | |
| MonadIO m => MonadIO (ReaderT r m) | |
| (Monoid w, MonadIO m) => MonadIO (RWST r w s m) | |
| (Monoid w, MonadIO m) => MonadIO (RWST r w s m) |