h$K=y      !"#$%&'()*+,-./0123 4 5 6 7 8 9 : ; < = > ? @ A B C D E F G HIJKLMNOPQRSTUVWXYZ[\]^_`abcdefghijklmnopqrstuvwxyz{|}~                                   2  Safe-Inferred gnuplot9The lines of the gnuplot script to be piped into gnuplot gnuplotOptions for gnuplot ! Safe-Inferred " Safe-Inferred 3 Safe-Inferred ^# Safe-InferredgnuplotEvery option represents an internal state in gnuplot. It is altered with gnuplot's set command. The first field in  is the name of the option and the name of the according internal state in gnuplot.Sometimes the addressed state is not explicitly mentioned but is expressed by the syntax of the values. E.g. you can write set grid xtics and set grid noxtics, but both commands refer to the same internal boolean variable, that we like to call xtics. It is important that the gnuplot Haskell bindings know that these two set commands refer to the same gnuplot state, since we want to simulate a stateless functional interface in front of a stateful imperative one.In case of a such a hidden state, we manage an identifier in the second field of . It is mainly used for distinguishing different hidden states, that are accessed by the same set variable. This second field may not contain valid gnuplot identifiers, however you might use the field for formatting boolean options using  $. gnuplotConstructs a generic option from Strings for the first and second field of .This is very flexible, but not very safe. Use it only as fall-back, if there is no specific setter function in  Graphics.Gnuplot.Frame.OptionSet.1  !"#% Safe-Inferred $ Safe-Inferred[$$ Safe-Inferred  !"#  !"# & Safe-Inferred % Safe-Inferred%% Safe-InferredA&'&' Safe-Inferred)gnuplotUse it this way: import Data.Time import Graphics.Gnuplot.Simple main = plotPath [XTime, XFormat "%m-%d"] $ prepXTime $ (UTCTime (fromGregorian 2008 01 01) 0, 1.0) : (UTCTime (fromGregorian 2008 01 05) 43200, 5.0) : (UTCTime (fromGregorian 2008 01 15) 0, 2.5) : []))' Safe-Inferred *+ Safe-Inferred ,-./01,-./01  Safe-Inferred>345678345678  Safe-Inferredp:;<=>?:;<=>?( Safe-InferredBgnuplotThe default options contain what we expect as default value in gnuplot. We need an entry for every option that cannot be reset by unset.Bgnuplot4Add (set) an option with arguments as plain strings.This is very flexible, but not very safe. Use it only as fall-back, if there is no specific setter function in  Graphics.Gnuplot.Frame.OptionSet.CgnuplotRemove (unset) an option.This is very flexible, but not very safe. Use it only as fall-back, if there is no specific setter function in  Graphics.Gnuplot.Frame.OptionSet.gnuplotConvert the difference between the first and the second option set into a sequence of set and unset commands.Dgnuplot#Set or unset option according to a 2. This is for switches that can be disabled using unset.This is very flexible, but not very safe. Use it only as fall-back, if there is no specific setter function in  Graphics.Gnuplot.Frame.OptionSet. See also: E, B, C.Egnuplot8Add an option with boolean value that is formatted like set style fill border and set style fill noborder'. The name of the internal state (i.e. border3) must be stored in the second field of the option.This is very flexible, but not very safe. Use it only as fall-back, if there is no specific setter function in  Graphics.Gnuplot.Frame.OptionSet. See also D. ABCDE) Safe-InferredzF* Safe-InferredGgnuplotPlots can be assembled using  or mconcat or several functions from  Data.Foldable.gnuplotIn contrast to the Display.toScript method instantiation this function leaves the options, and thus can be used to write the Display.toScript instance for Frame.G  Safe-InferredGG+ Safe-Inferred?  Safe-InferredjFF, Safe-InferredH Safe-InferredIJKIJK Safe-Inferred LgnuplotThe plot function returns , which is nice for programming but ugly for interactive GHCi sessions. For interactive sessions, better use Graphics.Gnuplot.Simple. gfx must be one of the types Plot, Frame,  MultiPlot.This function runs gnuplot asynchronously for interactive terminals (X11, WX) and synchronously for file terminals (PostScript, PNG, etc.). This emulates the behaviour of gnuplot --persist=. However, when running asynchronous we cannot obtain a real +. Thus, in this case we will always return  ExitSuccess.OgnuplotReturn the gnuplot script and the curve files corresponding to your plot data. The first parameter is the directory where the curve files are located. This directory is baked into the gnuplot script and the paths of the curve files.Don't make any assumptions about the structure of the files. Feeding the files to gnuplot, archiving them or study them are the intended uses of them.Pgnuplot(Plot using the default gnuplot terminal.LMNOPLPNMO- Safe-Inferred <Q Safe-Inferred!Tgnuplot0Setting the encoding to anything different from . makes only sense if you write your gnuplot files manually using this encoding.RSTRST Safe-Inferred"LXgnuplot0Setting the encoding to anything different from . makes only sense if you write your gnuplot files manually using this encoding._gnuplotEmbed a font file in the generated PostScript output. Each call adds a new font file, there is no way to remove it again. VWXYZ[\]^_ VWXYZ[\]^_ Safe-Inferred#cgnuplot0Setting the encoding to anything different from . makes only sense if you write your gnuplot files manually using this encoding.abcdefghijklmnabcdefghijklmn Safe-Inferred#_Qpqrstuvwxyz{|}~Qpqrstuvwxyz{|}~/ Safe-Inferred#0 Safe-Inferred# Safe-Inferred$-   Safe-Inferred%gnuplotCount numbers of gnuplot data columns for the respective type.Somehow a writer monad with respect to Sum monoid without material monadic result.Cf. ColumnSet module.gnuplot+For values that are also in Atom class,  must generate a singleton list.gnuplot It must hold ,ColumnCount (length (text x)) == columnCount.1 Safe-Inferred) 2 Safe-Inferred*gnuplotThe type parameter x" is for the values on the X axis, y of the Y axis and a+ is the type of the plotted data. The type a is a pair in case of points in the plane, or a more complex tuple in case of error plots and the like.*3 Safe-Inferred+gnuplot?You can alter the line specification of graphs in a plot using .4 Safe-Inferred+  Safe-Inferred, Safe-Inferred,d)) Safe-Inferred-. Safe-Inferred0IgnuplotPlots can be assembled using  or 4. You can alter attributes of embedded graphs using .gnuplot list Type.listLines (take 30 (let fibs = 0 : 1 : zipWith (+) fibs (tail fibs) in fibs)) list Type.lines (take 30 (let fibs0 = 0 : fibs1; fibs1 = 1 : zipWith (+) fibs0 fibs1 in zip fibs0 fibs1))gnuplot 2function Type.line (linearScale 1000 (-10,10)) singnuplot :functions Type.line (linearScale 1000 (-10,10)) [sin, cos]gnuplot functionsWithLineSpec Type.line (linearScale 1000 (-10,10)) $ map (mapFst (flip LineSpec.title LineSpec.deflt)) [("sin", sin), ("cos", cos)]gnuplot parameterFunction Type.line (linearScale 1000 (0,2*pi)) (\t -> (sin (2*t), cos t)) *+ +* Safe-Inferred1gnuplotPlots can be assembled using  or  or several functions from  Data.Foldable.*++* Safe-Inferred: gnuplotBe careful with - which can only be used as part of gnuplot's plot command but not as part of set . That is, >plotList [LineStyle 0 [LineTitle "foobar"]] [0,5..100::Double]6will leave you with an invalid gnuplot script, whereas plotListStyle [] (defaultStyle {lineSpec = CustomStyle [LineTitle "foobar"]}) [0,5..100::Double]does what you want.The  types would be better enumerations but their interpretations depend on the gnuplot output type. :-(gnuplot)anything that is allowed after gnuplot's set commandgnuplotyou cannot use this, call  insteadgnuplot plotList [] (take 30 (let fibs = 0 : 1 : zipWith (+) fibs (tail fibs) in fibs))gnuplot plotListStyle [] (defaultStyle{plotType = CandleSticks}) (Plot2D.functionToGraph (linearScale 32 (0,2*pi::Double)) (\t -> (-sin t, -2*sin t, 2*sin t, sin t)))gnuplot +plotFunc [] (linearScale 1000 (-10,10)) singnuplot 3plotFuncs [] (linearScale 1000 (-10,10)) [sin, cos]gnuplot plotParamFunc [] (linearScale 1000 (0,2*pi)) (\t -> (sin (2*t), cos t))gnuplot plotParamFuncs [] (linearScale 1000 (0,2*pi)) [\t -> (sin (2*t), cos t), \t -> (cos t, sin (2*t))]gnuplot let xs = [-2,-1.8..2::Double] in plotMesh3d [] [] (do x <- xs; return (do y <- xs; return (x,y,cos(x*x+y*y)))) let phis = linearScale 30 (-pi, pi :: Double) in plotMesh3d [] [] (do phi <- phis; return (do psi <- phis; let r = 5 + sin psi in return (r * cos phi, r * sin phi, cos psi)))gnuplot let xs = [-2,-1.8..2::Double] in plotFunc3d [] [] xs xs (\x y -> exp(-(x*x+y*y)))gnuplotRedirects the output of a plotting function to an EPS file and additionally converts it to PDF. gnuplotCreates an EPS and a PDF graphics and returns a string that can be inserted into a LaTeX document to include this graphic.Different from GHCi, Hugs doesn't output a return value from an IO monad. So you must wrap it with a . Nevertheless this implementation which returns the LaTeX command as string is the most flexible one. gnuplot7Drawing function that expects some gnuplot attributes. gnuplot7Drawing function that expects some gnuplot attributes. ++  Safe-Inferred<gnuplot/Set parameters of viewing a surface graph. See info:gnuplot/viewgnuplotShow flat pixel map.gnuplotrotateX gnuplotrotateZ gnuplotscale gnuplotscaleZ (ABCDE(ABCDE Safe-Inferred=gHH56789:;<#5#=#>#?#@#A#B#C#D#E#F#G#H#I#J#K#L#M#N#O#P#Q#R#S#T#U#V#W%X&X5Y:Z'['\5YO]^_: 5 Y O ] ^ _ : 5 Y O ] ^ _ :(5(`(a(b($)X*5,5cdefghij-55Yk:5Yklmnopqr:5Ykstuvwxyz{|}:.~/5050~0000000O75O:X56X11111B222222222222222222222222222222222222223353445455 ~ ?   O @        F G H Q R S P       L M N >     Y  !X!9""#6####################%%%%%%%%%%&&5&6&&&&&'''''''''(~((6((())))))*******6*******+5+6,6,f,-6--///////060000000015161125262233363333333~3446444444B4~4$gnuplot-0.5.7-2k8P89MQVwO2wYDnh2vlAfGraphics.Gnuplot.FileGraphics.Gnuplot.Frame.OptionGraphics.Gnuplot.DisplayGraphics.Gnuplot.Terminal!Graphics.Gnuplot.Terminal.DefaultGraphics.Gnuplot.Time$Graphics.Gnuplot.Plot.TwoDimensionalGraphics.Gnuplot.Terminal.X11Graphics.Gnuplot.Terminal.WXTGraphics.Gnuplot.Terminal.QT Graphics.Gnuplot.Frame.OptionSetGraphics.Gnuplot.GraphGraphics.Gnuplot.PlotGraphics.Gnuplot.Frame&Graphics.Gnuplot.Frame.OptionSet.StyleGraphics.Gnuplot.AdvancedGraphics.Gnuplot.EncodingGraphics.Gnuplot.Terminal.SVG$Graphics.Gnuplot.Terminal.PostScriptGraphics.Gnuplot.Terminal.PNG#Graphics.Gnuplot.ColorSpecification"Graphics.Gnuplot.LineSpecificationGraphics.Gnuplot.MultiPlotGraphics.Gnuplot.Value.Atom Graphics.Gnuplot.Value.ColumnSetGraphics.Gnuplot.Value.Tuple'Graphics.Gnuplot.Graph.ThreeDimensional%Graphics.Gnuplot.Graph.TwoDimensional*Graphics.Gnuplot.Frame.OptionSet.Histogram&Graphics.Gnuplot.Plot.ThreeDimensionalGraphics.Gnuplot.SimpleGraphics.Gnuplot.ExecuteGraphics.Gnuplot.Private.File Graphics.Gnuplot.Private.Command$Graphics.Gnuplot.Private.FrameOptionaddBool Graphics.Gnuplot.Private.Display!Graphics.Gnuplot.Private.TerminalGraphics.Gnuplot.Utility'Graphics.Gnuplot.Private.FrameOptionSetGraphics.Gnuplot.Private.GraphGraphics.Gnuplot.Private.Plot#Graphics.Gnuplot.Private.GraphEmptyGraphics.Gnuplot.Private.Frame!Graphics.Gnuplot.Private.Encodinglocale+Graphics.Gnuplot.Private.ColorSpecification*Graphics.Gnuplot.Private.LineSpecification$Graphics.Gnuplot.Private.Graph3DType$Graphics.Gnuplot.Private.Graph2DType Graphics.Gnuplot.Private.Graph2D Graphics.Gnuplot.Private.Graph3DTConsnamecontentwrite$fCT$fShowT$fEqTcustomgridsizekeyborderpm3dxRangeyRangezRangexLabelyLabelzLabelxTicksyTickszTicks xLogScale yLogScale zLogScaletitleviewxFormatyFormatzFormattimeFmtxDatayDatazDataCcons prepXTimefunctionToGraph linearScalenoTitlepersist noPersistaddremoveboolean fillSolid fillBorderfillBorderLineTypeplot plotAsyncplotSync fileContents plotDefaultencoding landscapeportraitepscolor monochromefont embedFont transparent noTransparent interlace noInterlace trueColor noTrueColorfontTiny fontSmall fontMedium fontLarge fontGiantdeflt iso_8859_1 iso_8859_15 iso_8859_2 iso_8859_9koi8rkoi8ucp437cp850cp852cp950cp1250cp1251cp1254sjisutf8 lineStylelineType lineWidth lineColor pointType pointSizergbrgb8 paletteFracwhiteblackgray0grey0gray10grey10gray20grey20gray30grey30gray40grey40gray50grey50gray60grey60gray70grey70gray80grey80gray90grey90gray100grey100graygrey lightGray lightGreydarkGraydarkGreyredlightReddarkRedyellow lightYellow darkYellowgreen lightGreen darkGreen springGreen forestGreenseaGreenblue lightBluedarkBlue midnightBluenavy mediumBlue royalblueskybluecyan lightCyandarkCyanmagenta lightMagenta darkMagenta turquoiselightTurquoise darkTurquoisepink lightPinkdarkPinkcoral lightCoral orangeRedsalmon lightSalmon darkSalmon aquamarinekhaki darkKhaki goldenrodlightGoldenrod darkGoldenrodgoldbeigebrownorange darkOrangeviolet darkVioletplumpurplePart partFromFrame partFromPlotsimpleFromFrameArraysimpleFromPartArrayoptions OptionSetoptData optFormat optOthers $fCUTCTime$fCDay $fCWord64 $fCWord32 $fCWord16$fCWord8$fCInt64$fCInt32$fCInt16$fCInt8$fCRatio $fCInteger$fCInt $fCDouble$fCFloatatompairtriple quadrupleLabel ColumnCounttext columnCount$fC(,,,)$fC(,,)$fC(,)$fCLabel$fEqColumnCount$fOrdColumnCount$fShowColumnCountlinespointsimpulsesvectors listLines listPointslistLinesPoints listImpulseslistDots histogramsxErrorBarsRelativeyErrorBarsRelativexyErrorBarsRelativexErrorBarsAbsoluteyErrorBarsAbsolutexyErrorBarsAbsolutexErrorLinesRelativeyErrorLinesRelativexyErrorLinesRelativexErrorLinesAbsoluteyErrorLinesAbsolutexyErrorLinesAbsolute linesPointsdotsstepsfStepshiSteps errorBars errorLinesboxes filledCurves financeBars candleSticksimage filledStripefilledStripeAbovefilledStripeBelowlabelsTypelineSpec clustered clusteredGap errorbars errorbarsGaperrorbarsGapLineWidth rowstacked columnstackedlistfunction functionsfunctionsWithLineSpecparameterFunction listFromFile pathFromFilecloudmeshsurface Attribute3d Plot3dTypeCornersToColorMean GeometricMeanMedianCorner1Corner2Corner3Corner4SurfaceColorMap PlotStyleplotTypePlotTypeLinesPoints LinesPointsImpulsesDotsStepsFStepsHiSteps ErrorBars XErrorBars YErrorBars XYErrorBars ErrorLines XErrorLines YErrorLines XYErrorLinesBoxes FilledCurves BoxErrorBarsBoxXYErrorBars FinanceBars CandleSticksVectorsPM3dLineSpec DefaultStyle CustomStyleLineAttrLineType LineWidth PointType PointSize LineTitleAspectRatioNoRatioSizeScaleSepScale AttributeCustomEPSPNGTerminalGridKeyBorderXTicksYTicks BoxAspect LineStyleTitleXLabelYLabelZLabelXRangeYRangeZRangePaletteColorBoxXTimeXFormat defaultStyleterminalplotList plotListStyle plotListsplotListsStyleplotFunc plotFuncsplotPath plotPaths plotPathStyleplotPathsStyle plotParamFuncplotParamFuncsplotDots plotMesh3d plotFunc3d epspdfPlotinclPlot sizeRatio sizeSquare keyInside keyOutsidexRange2dyRange2dxRange3dyRange3dzRange3dviewMapxTicks2dyTicks2dxTicks3dyTicks3dzTicks3d gridXTicks gridYTicks gridZTicksboxwidthRelativeboxwidthAbsolutesimpleempty tmpScriptrunasyncIfInteractive sizeScalekeyShow keyPosition xRangeBounds yRangeBounds zRangeBounds xLabelText yLabelText zLabelText xTickLabels yTickLabels zTickLabelsboxwidthstyleFillSolidstyleFillBorderstyleHistogramtoScriptBodycommandsfilesScript runScriptpure canonical precommands interactiveformat showTriplet commaConcatsemiColonConcatquote_quote escapeChar assembleCellslistFromMaybeWith formatBool diffToStringghc-prim GHC.TypesBooldeconsPlaininitialCommand commandString defltOptionstoStringcommandbaseGHC.BasemappendFilegraphs_content_ filename_withUniqueFile fromGraphs tmpFileStemoptionsToScript defltOptsplotCmdoptionGHC.IO.ExceptionExitCode formatMaybe PaletteFracRGB8Name pointSize_ pointType_ lineColor_ lineWidth_ lineType_ lineStyle_title_ tupleSizefmap AxisOptionColumns lineSpec_type_column_columnToStringtypmconcatInt System.IOputStr