program: Programs with Environments and Managed Resources

This is a package candidate release! Here you can preview how this package release will appear once published to the main package index (which can be accomplished via the 'maintain' link below). Please note that once a package has been published to the main package index it cannot be undone! Please consult the package uploading documentation for more information.

[maintain] [Publish]

Please see the README on GitHub at https://github.com/typedbyte/program


[Skip to Readme]

Properties

Versions 0.1.0.0, 0.1.0.0
Change log ChangeLog.md
Dependencies base (>=4.7 && <5) [details]
License BSD-3-Clause
Copyright 2021 Michael Szvetits
Author Michael Szvetits
Maintainer typedbyte@qualified.name
Category Control
Home page https://github.com/typedbyte/program#readme
Bug tracker https://github.com/typedbyte/program/issues
Source repo head: git clone https://github.com/typedbyte/program
Uploaded by MichaelSzvetits at 2021-12-02T16:13:20Z

Modules

[Index] [Quick Jump]

Downloads

Maintainer's Corner

Package maintainers

For package maintainers and hackage trustees


Readme for program-0.1.0.0

[back to package description]

program

Hackage

Overview

program is a library for writing programs with environments and managed resources, written in Haskell. It aims to be simple, has minimal dependencies and combines features of various existing approaches for threading an environment through an application (e.g., RIO, ReaderT, Handle Pattern, record-of-functions) and for managing resources without nested bracket-functions (e.g., managed). The library and its documentation can be found on Hackage.

Example

The following simple example copies count characters from one file to another, where count is demanded from the environment e by the function copy (via pull) and supplied by main. Note that we do not need to close file handles, because resources are managed automatically.

{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE TypeOperators    #-}
module Example where

-- base
import Control.Monad
import Control.Monad.IO.Class
import System.IO

-- program
import Control.Program (Program, Has, manage, pull, runProgram)

copy :: e `Has` Int => FilePath -> FilePath -> Program e ()
copy from to = do
  fromHandle <- manage (withFile from ReadMode)
  toHandle   <- manage (withFile to WriteMode)
  count      <- pull
  liftIO . replicateM_ count $
    hGetChar fromHandle >>= hPutChar toHandle

main :: IO ()
main = do
  runProgram
    ( 10 :: Int )
    ( copy "/tmp/source" "/tmp/target" )

In larger applications, the environment would contain many more complex values (all demanded by Has) and can also be used to manage mutable state. See the documentation on Hackage for more details.

Advantages