Euterpea-1.1.1: Library for computer music research and education

Safe HaskellNone
LanguageHaskell98

Euterpea.IO.MUI

Synopsis

Documentation

asyncV :: (NFData c, ArrowReader DeltaT a, ArrowCircuit a, ArrowIO a) => Double -> DeltaT -> PureAuto b c -> a b [(c, Time)] Source

type Dimension = (Int, Int)

A dimension specifies size.

topDown :: UISF a b -> UISF a b

bottomUp :: UISF a b -> UISF a b

leftRight :: UISF a b -> UISF a b

rightLeft :: UISF a b -> UISF a b

setSize :: Dimension -> UISF a b -> UISF a b

A convenience function for setLayout, setSize sets the layout to a fixed size (in pixels).

setLayout :: Layout -> UISF a b -> UISF a b

Set a new layout for this widget.

pad :: (Int, Int, Int, Int) -> UISF a b -> UISF a b

Add space padding around a widget.

data UIParams :: *

The UIParams data type provides an interface for modifying some of the settings for runUI without forcing runUI to take a zillion arguments. Typical usage will be to modify the below defaultUIParams using record syntax.

Instances

runMUI :: UIParams -> UISF () () -> IO () Source

runMUI' :: UISF () () -> IO () Source

label :: UITexty s => s -> UISF a a

Labels are always left aligned and vertically centered.

displayStr :: UISF String ()

DisplayStr is an output widget showing the instantaneous value of a signal of strings.

display :: Show a => UISF a ()

display is a widget that takes any show-able value and displays it.

withDisplay :: Show b => UISF a b -> UISF a b

withDisplay is a widget modifier that modifies the given widget so that it also displays its output value.

textboxE :: UITexty s => s -> UISF (SEvent s) String

textbox :: UITexty s => s -> UISF (SEvent s) String

The textbox widget creates a one line field where users can enter text. It supports mouse clicks and typing as well as the left, right, end, home, delete, and backspace special keys.

The value displayed can be generated by mouse and keyboard events, but it can also be set programmatically by providing the widget's input stream with an event containing the value to display. By using rec and delay, one can update the contents based on e.g. other widgets.

The static argument provides the textbox with initial text.

title :: UITexty s => s -> UISF a b -> UISF a b

Title frames a UI by borders, and displays a static title text.

button :: UITexty s => s -> UISF () Bool

A button is a focusable input widget with a state of being on or off. It can be activated with either a button press, the enter key, or the space key. Buttons also show a static label.

The regular button is down as long as the mouse button or key press is down and then returns to up.

stickyButton :: UITexty s => s -> UISF () Bool

The sticky button, on the other hand, once pressed, remains depressed until is is clicked again to be released. Thus, it looks like a button, but it behaves more like a checkbox.

checkbox :: UITexty s => s -> Bool -> UISF () Bool

Checkbox allows selection or deselection of an item. It has a static label as well as an initial state.

checkGroup :: [(String, a)] -> UISF () [a]

The checkGroup widget creates a group of checkboxes that all send their outputs to the same output stream. It takes a static list of labels for the check boxes and assumes they all start unchecked.

The output stream is a list of each a value that was paired with a String value for which the check box is checked.

radio :: UITexty s => [s] -> Int -> UISF () Int

Radio button presents a list of choices and only one of them can be selected at a time. It takes a static list of choices (as Strings) and the index of the initially selected one, and the widget itself returns the continuous stream representing the index of the selected choice.

hSlider :: RealFrac a => (a, a) -> a -> UISF () a

Horizontal Continuous Slider

vSlider :: RealFrac a => (a, a) -> a -> UISF () a

Vertical Continuous Slider

hiSlider :: Integral a => a -> (a, a) -> a -> UISF () a

Horizontal Discrete Slider

viSlider :: Integral a => a -> (a, a) -> a -> UISF () a

Vertical Discrete Slider

realtimeGraph :: RealFrac a => Layout -> DeltaT -> Color -> UISF [(a, Time)] ()

The realtimeGraph widget creates a graph of the data with trailing values. It takes a dimension parameter, the length of the history of the graph measured in time, and a color for the graphed line. The signal function then takes an input stream of (value,time) event pairs, but since there can be zero or more points at once, we use [] rather than SEvent for the type. The values in the (value,time) event pairs should be between -1 and 1.

histogram :: RealFrac a => Layout -> UISF (SEvent [a]) ()

The histogram widget creates a histogram of the input map. It assumes that the elements are to be displayed linearly and evenly spaced. Also, the values to be plotted must be between 0 and 1 (inclusive).

listbox :: (Eq a, Show a) => [a] -> Int -> UISF (SEvent [a], SEvent Int) Int

The listbox widget creates a box with selectable entries. It takes two static values indicating the initial list of data to display and the initial index selected (use -1 for no selection). It takes two event streams that can be used to independently set the list and index. The output stream is the currently selected index.

Note that the index can be greater than the length of the list (simply indicating no choice selected).

data BufferOperation b :: * -> *

The BufferOperation data type wraps up the data and operational commands to control an eventbuffer.

Constructors

NoBOp

No Buffer Operation

ClearBuffer

Erase the buffer

SkipAheadInBuffer DeltaT

Skip ahead a certain amount of time in the buffer

MergeInBuffer [(DeltaT, b)]

Merge data into the buffer

AppendToBuffer [(DeltaT, b)]

Append data to the end of the buffer

SetBufferPlayStatus Bool (BufferOperation b)

Set a new play status (True = Playing, False = Paused)

SetBufferTempo Tempo (BufferOperation b)

Set the buffer's tempo

canvas :: Dimension -> UISF (SEvent Graphic) ()

Canvas displays any graphics. The input is a signal of graphics events because we only want to redraw the screen when the input is there.

canvas' :: Layout -> (a -> Dimension -> Graphic) -> UISF (SEvent a) ()

canvas' uses a layout and a graphic generator. This allows it to behave similarly to canvas, but it can adjust in cases with stretchy layouts.

makeLayout

Arguments

:: LayoutType

Horizontal Layout information

-> LayoutType

Vertical Layout information

-> Layout 

Layouts for individual widgets typically come in a few standard flavors, so we have this convenience function for their creation. This function takes layout information for first the horizontal dimension and then the vertical.

data LayoutType :: *

A dimension can either be:

Constructors

Stretchy

Stretchy with a minimum size in pixels

Fields

minSize :: Int
 
Fixed

Fixed with a size measured in pixels

Fields

fixedSize :: Int
 

data Color :: *

We provide a data type for colors to allow users to easily and clearly specify common colors. Primary and secondary RGB colors are represented along with a few beige colors for use in many GUI elements.

Constructors

Black 
Blue 
Green 
Cyan 
Red 
Magenta 
Yellow 
White 
Gray 
VLightBeige 
LightBeige

This is the default background color for the UI window.

MediumBeige 
DarkBeige 

(~++) :: SEvent [a] -> SEvent [a] -> SEvent [a] Source