Nothing
#' #' Graphical User Interface for midrangeMCP function
#' #'
#' #' \code{guimidrangeMCP} A Graphical User Interface (GUI) for
#' #' function that returns the MGM, MGR, SNKM and TM tests
#' #' @param gui Logical argument, \code{TRUE} or \code{FALSE}. The default is \code{TRUE}
#' #' @return \code{guimidrangeMCP} presents a GUI for the results of the four multiple
#' #' comparison procedures MGM, MGR, SNKM and TM tests. In addition, the GUI
#' #' returns a graph of the results, as well as the export of these results
#' #' to three types of file extension and latex code.
#' #' @examples
#' #' # Loading package
#' #' library(midrangeMCP)
#' #' if (interactive()) {
#' #' guimidrangeMCP(gui = FALSE)
#' #' }
#' #'
#' #' @import "tcltk"
#' # @import "tkrplot"
#' #' @importFrom "grDevices" "dev.new"
#' # @importFrom "stats" "aov"
#' #' @export
#' guimidrangeMCP <- function(gui = TRUE) {
#' # Language
#' # # portugues
#' # Sys.setenv(LANG = "pt_BR")
#' #
#' # # Ingles
#' # Sys.setenv(LANG = "en")
#'
#' # Language
#' # # portugues
#' # Sys.setenv(LANG = "pt_BR")
#' #
#' # # Ingles
#' # Sys.setenv(LANG = "en")
#'
#' # Environment of package
#' envmidrangeMCP <- new.env(parent = base::emptyenv())
#' assign("dat", NULL, envir = envmidrangeMCP)
#' assign("results", NULL, envir = envmidrangeMCP)
#' assign("LaTeX", NULL, envir = envmidrangeMCP)
#' assign("symmb_promp", NULL, envir = envmidrangeMCP)
#' assign("teste", NULL, envir = envmidrangeMCP)
#' assign("saida", NULL, envir = envmidrangeMCP)
#'
#' # Graphical User Interface
#' if (gui == TRUE) {
#' if (!requireNamespace("tkrplot", quietly = TRUE)) {
#' stop("Package \"tkrplot\" needed for this function to work. Please install it!")
#' } else {
#' #Insert logo
#' tkimage.create("photo", "::image::logomidrangeMCP", file = system.file("etc", "logo.png", package = "midrangeMCP"))
#' # Insert Icons
#' img <- tclVar(); img2 <- tclVar(); img3 <- tclVar()
#' imageinfo <- tkimage.create("photo", img, file = system.file("etc", "info.gif", package = "midrangeMCP"))
#' imageopen <- tkimage.create("photo", img2, file = system.file("etc", "open.gif", package = "midrangeMCP"))
#' imagesaveas <- tkimage.create("photo", img3, file = system.file("etc", "save-as.gif", package = "midrangeMCP"))
#'
#' # Auxiliar functions
#' addScrollbars <- function(parent, widget,type=c("both", "x", "y")) {
#' if(any(type %in% c("both","x"))) {
#' xscr <- ttkscrollbar(parent, orient = "horizontal",
#' command = function(...) tkxview(widget, ...))
#' tkconfigure(widget,
#' xscrollcommand = function(...) tkset(xscr,...))
#' }
#'
#' if(any(type %in% c("both","y"))) {
#' yscr <- ttkscrollbar(parent, orient = "vertical",
#' command = function(...) tkyview(widget, ...))
#' tkconfigure(widget,
#' yscrollcommand = function(...) tkset(yscr,...))
#' }
#'
#' ## place in grid
#' tkgrid(widget, row=0, column=0, sticky="news")
#' if(any(type %in% c("both", "x"))) {
#' tkgrid(xscr, row=1, column=0, sticky="ew")
#' tkgrid.columnconfigure(parent, 0, weight=1)
#' }
#' if(any(type %in% c("both", "y"))) {
#' tkgrid(yscr,row=0,column=1, sticky="ns")
#' tkgrid.rowconfigure(parent, 0, weight=1)
#' }
#'
#'
#' }
#'
#' ##########################
#' # Configuration of widgets
#' ##########################
#' #Clear the configurations of the option function
#' #.Tcl("option clear")
#'
#' # # Geral configurations
#' #.Tcl("option add *Background #e1eff7")
#'
#' # Button and TButton configurations
#' .Tcl("option add *Button.Pady 2
#' option add *Button.Background #e1eff7
#' #option add Button.Foreground #e1eff7
#' #option add *Button.Foreground black
#' option add *Button.Cursor draft_small 46
#' option add *TButton.Cursor draft_small 46")
#'
#' # Label configurations
#' .Tcl("option add *Label.Background #e1eff7")
#'
#' # Chackbutton configurations
#' .Tcl("option add *Checkbutton.Background #e1eff7")
#'
#' # Frame configurations
#' .Tcl("option add *Frame.Background #e1eff7")
#'
#'
#' # Style TFrame
#' #tcl("ttk::style" , "configure" , "Toolbar.TFrame", relief = "solid", expand = TRUE)
#' .Tcl("ttk::style configure Toolbar.TFrame -relief solid -background #e1eff7")
#'
#' # Style LabelFrame
#' .Tcl("ttk::style configure Toolbar.TLabelframe -background #e1eff7
#' ttk::style configure Toolbar.TLabelframe.Label -background #e1eff7")
#'
#'
#' # Style PanedWindow
#' .Tcl("ttk::style configure Toolbar.TPanedwindow -background #e1eff7")
#'
#' # Class disabled/Enabled
#' .Tcl("option add *Ativado.Entry.state normal 81
#' option add *Ativado.Label.state normal 81
#' option add *Ativado.Button.state normal 81
#' option add *Desativado.Entry.state disabled 81
#' option add *Desativado.Label.state disabled 81
#' option add *Desativado.Button.state disabled 81")
#'
#'
#' # Disabled GUI (Type I)
#' oldmode <- tclServiceMode(FALSE)
#'
#' # Top-level window
#' wid <- 1019
#' hei <- 700
#'
#' midrangeMCP <- tktoplevel(
#' width = wid,
#' height = hei,
#' background = "blue"
#'
#' )
#' # Disabled GUI (Type II)
#' #tkwm.state(midrangeMCP, "withdraw")
#'
#' ####################################
#' # Configurations of top-level window
#' ####################################
#'
#' # Title
#' tkwm.title(midrangeMCP,
#' gettext("GUI to the midrangeMCP package", domain = "R-midrangeMCP"))
#'
#' #Icon main toplevel window
#' tcl("wm", "iconphoto", midrangeMCP, "-default", "::image::logomidrangeMCP")
#'
#'
#' # Not propagate
#' tkpack.propagate(midrangeMCP, FALSE)
#'
#'
#'
#' ############
#' # Overall group
#' ############
#' #group.all <- NULL
#' group.all <- ttkpanedwindow(midrangeMCP, orient = "horizontal", style = "Toolbar.TPanedwindow")
#' tkpack(group.all, expand = TRUE, fill = "both")
#' #tkpack(group.all)
#' #tkwinfo("width", group.all)
#' #tkwinfo("height", group.all)
#'
#' ##############
#' # Child groups
#' ##############
#' #group1 <- NULL
#' wid2 <- 380
#' group1 <- ttkpanedwindow(group.all, orient = "vertical", width = wid2, style = "Toolbar.TPanedwindow")
#' tkadd(group.all, group1)
#' #tkwinfo("width", group1)
#' #tkwinfo("height", group1)
#' #group2 <- NULL
#' group2 <- ttkpanedwindow(group.all, orient = "vertical", width = wid - wid2, style = "Toolbar.TPanedwindow")
#' tkadd(group.all, group2)
#' #tkwinfo("width", group2)
#' #tkwinfo("height", group2)
#'
#'
#' # Change width of panes
#' #width <- as.integer(tkwinfo("width", group.all))
#' #tcl(group.all, "sashpos", 0, floor(0.37 * width))
#' #tcl(group.all, "sashpos", 0, 377)
#'
#'
#' #######################
#' # Child of Child groups
#' #######################
#' #Q1
#' child1.group1 <- ttkframe(parent = group1, style = "Toolbar.TFrame", height = 100,
#' padding = c(3,3,3,3))
#' tkadd(group1, child1.group1, weight = 1)
#'
#' #Q2
#' child2.group1 <- ttkframe(parent = group1, style = "Toolbar.TFrame", height = 200,
#' padding = c(3,3,3,3))
#' tkadd(group1, child2.group1, weight = 3)
#' #Q3
#' child1.group2 <- ttkframe(parent = group2, style = "Toolbar.TFrame",
#' padding = c(3,3,3,3))
#' tkadd(group2, child1.group2)
#' #Q4
#' child2.group2 <- ttkpanedwindow(parent = group2, orient = "horizontal", width = 669, style = "Toolbar.TPanedwindow")
#' tkadd(group2, child2.group2)
#' #Q41
#' child21.group2 <- ttkframe(parent = child2.group2, style = "Toolbar.TFrame", width = 40,
#' padding = c(3,3,3,3))
#' tkadd(child2.group2, child21.group2)
#' #Q42
#' child22.group2 <- ttkframe(parent = child2.group2, style = "Toolbar.TFrame", width = 300,
#' padding = c(3,3,3,3))
#' tkadd(child2.group2, child22.group2)
#'
#'
#'
#'
#'
#' ############
#' # Working Q1
#' ############
#'
#' # Label
#' tkpack(tklabel(text = gettext("Enter the data file (.txt or .csv)",
#' domain = "R-midrangeMCP"),
#' parent = child1.group1),
#' anchor = "nw", padx = 2, pady = 1,
#' expand = TRUE, fill = "x")
#' # Entry
#' tkpack(fentry <- tkframe(child1.group1), anchor = "n",
#' expand = TRUE, fill = "x")
#' txt_var <- tclVar(gettext("Select a file ...", domain = "R-midrangeMCP"))
#' ##
#' tkpack(sentry <- tkentry(parent = fentry,
#' textvariable = txt_var),
#' anchor = "nw", padx = "1m", ipadx = "2m", side = "left",
#' expand = TRUE, fill = "x")
#' ##
#' tkpack(bentry <- ttkbutton(parent = fentry,
#' text = gettext("browse", domain = "R-midrangeMCP"), underline = 0
#' ),
#' anchor = "nw")
#' ##
#' # Auxiliar function
#' f.read <- NULL
#' f.read <- function(file) {
#' if (grepl("\\.txt$", file)) {
#' if (tclvalue(group_cbox_1_resp) == "TRUE") {
#' return(read.table(file, header = TRUE, dec = ",", sep = tclvalue(group_cbox_2_resp)))
#' }
#' if (tclvalue(group_cbox_1_resp) == "FALSE") {
#' return(read.table(file, header = TRUE, sep = tclvalue(group_cbox_2_resp)))
#' }
#' }
#' if (grepl("\\.csv$", file)) {
#' if (tclvalue(group_cbox_1_resp)) {
#' return(read.table(file, header = TRUE, dec = ",", sep = tclvalue(group_cbox_2_resp)))
#' }
#' if (tclvalue(group_cbox_1_resp) == FALSE) {
#' return(read.table(file, header = TRUE, sep = tclvalue(group_cbox_2_resp)))
#' }
#' }
#' }
#' ## Event
#'
#' tkbind(bentry, "<ButtonRelease>",
#' function(...) {
#' filetemp <- tkgetOpenFile(filetypes = paste(
#' "{{txt files} {.txt} }" ,
#' "{{csv files} {.csv}}" ,
#' sep = " "))
#' start_dir <- tclvalue(filetemp)
#' if (file.exists(start_dir)) {
#' envmidrangeMCP$dat <- f.read(start_dir)
#' tclvalue(txt_var) <- start_dir
#' tcl(search_results, "delete", "1.0", "end")
#' tkinsert(search_results, "end",
#' paste("The variables in the file:",
#' "===========================",
#' as.character(start_dir),
#' "===========================",
#' sep = "\n"))
#' tkinsert(search_results, "end", "\n")
#' tkinsert(search_results, "end",
#' paste(paste(names(f.read(start_dir)), collapse = "\n", sep = "\n"),
#' sep = "\n"), "variablesTag")
#' tkinsert(search_results, "end", "\n")
#' tkinsert(search_results, "end",
#' paste("===========================",
#' "R object created: 'dat'", sep = "\n"))
#' tkmessageBox(message = gettext("Check the data has been loaded correctly. To do this, use the 'Edit/View' button or the 'Output' frame.", domain = "R-midrangeMCP"))
#' }
#' if (file.exists(start_dir) == FALSE) {
#' tkmessageBox(message = gettext("No data set has been entered!", domain = "R-midrangeMCP"))
#' }
#' }
#' )
#'
#' # Group of buttons
#' tkpack(group_cbox <- tkframe(parent = child1.group1),
#' expand = TRUE, fill = "x", pady = "1m")
#' #tkpack.configure(group_cbox, expand = TRUE, fill = "both")
#'
#' # Checkbox
#' group_cbox_1_resp <- tclVar("FALSE")
#' tkpack(group_cbox_1 <- tkcheckbutton(parent = group_cbox,
#' text = gettext("Comma as decimal points", domain = "R-midrangeMCP"),
#' variable = group_cbox_1_resp,
#' onvalue = "TRUE",
#' offvalue = "FALSE"),
#' anchor = "nw", padx = "1m", side = "left")
#'
#' ##
#' ##Separator
#' tkpack(ttkseparator(parent = group_cbox, orient = "vertical"),
#' fill = "both", side = "left")
#' ##
#' tkpack(tklabel(parent = group_cbox,
#' text = gettext("Separator of variables:",
#' domain = "R-midrangeMCP")),
#' side = "left", anchor = "nw", padx = "1m"
#' )
#' ##
#' group_cbox_2_resp <- tclVar("")
#' tkpack(group_cbox_2 <- tkentry(textvariable = group_cbox_2_resp,
#' parent = group_cbox,
#' width = 5),
#' side = "left", anchor = "nw", padx = "1m"
#' )
#'
#' ##
#' # Group of buttons
#' tkpack(group_buttons <- tkframe(parent = child1.group1),
#' expand = TRUE, fill = "x", anchor = "nw")
#' ## Button of Edit/View
#' tkpack(group_buttons_1 <- ttkbutton(text = gettext("Edit/View", domain = "R-midrangeMCP"),
#' parent = group_buttons),
#' side = "left", anchor = "nw")
#' # Event
#' # This variable is important in the event of the 'bentry' button
#' dat2 <- NULL # This variable is internal, not exported to the console
#' tkbind(group_buttons_1, "<ButtonRelease>",
#' function(...) {
#' if (is.null(envmidrangeMCP$dat)) {
#' tkmessageBox(message = gettext("No data set has been entered!", domain = "R-midrangeMCP"))
#' } else{
#' envmidrangeMCP$dat <- edit(envmidrangeMCP$dat)
#' }
#' }
#' )
#' ## Button Console
#' tkpack(group_buttons_2 <- ttkbutton(text = gettext("Choosing the directory", domain = "R-midrangeMCP"),
#' parent = group_buttons),
#' side = "left", anchor = "nw")
#' # Event
#' tkbind(group_buttons_2, "<ButtonRelease>",
#' function(...) {
#' dir_name <- tkchooseDirectory()
#' if (nchar(dir_name <- tclvalue(dir_name))) {
#' dir_name <- setwd(dir_name)
#' on.exit(setwd(dir_name)) # Return initial directory
#' }
#' }
#' )
#' ## Help button
#' tkpack(bhelp <- tkbutton(text = gettext("help", domain = "R-midrangeMCP"),
#' parent = group_buttons, borderwidth = 0, image = tclvalue(imageinfo),
#' command = function(...){
#' tkmessageBox(message = gettext("To insert a data set, the possible extensions are '.txt' and '.csv'. To do this, use the 'browse' button. If you want to identify a directory, before clicking on the 'browse' button, click on the 'Choosing the directory' button. After entering the data set, if you want to edit or view, click on the 'Edit/View' button. If your data has a comma as a decimal point separator, before clicking on the 'browse' button, activate the 'Comma as decimal points' box. Finally, if the variable separator is different from a blank space, indicate it without quotes in the 'Separator of variables' box.", domain = "R-midrangeMCP"))
#' }),
#' side = "left", anchor = "nw")
#' ##
#' ##
#' ## Output
#' tkpack(frame.output <- ttklabelframe(text = gettext("Output:",
#' domain = "R-midrangeMCP"),
#' parent = child1.group1,
#' width = 40, height = 25, style = "Toolbar.TLabelframe"),
#' side = "top", anchor = "nw", expand = TRUE, fill = "x"
#' )
#'
#' ##
#' tkpack(search_results <- tktext(parent = frame.output, padx = "1m", pady = "1m",
#' height = 10, wrap = "none"),
#' side = "top", anchor = "nw")
#' tktag.configure(search_results, "variablesTag", foreground = "blue" ,
#' font = "courier 10 italic" )
#'
#' addScrollbars(frame.output, search_results)
#'
#'
#' ############
#' # Working Q2
#' ############
#'
#' # Console
#' #########
#' tkpack(frame.console <- ttklabelframe(text = gettext("Console:",
#' domain = "R-midrangeMCP"),
#' parent = child2.group1, style = "Toolbar.TLabelframe"),
#' expand = TRUE, fill = "both")
#' ##
#' ##
#' tkpack(console <- tktext(parent = frame.console, height = 15, wrap = "none"),
#' side = "top", anchor = "nw", expand = TRUE, fill = "both")
#' ##
#' ##
#' addScrollbars(frame.console, console)
#' ##
#' tktag.configure(console, "commandTag", foreground = "blue" ,
#' font = "courier 10 italic" )
#' tktag.configure(console, "outputTag", font = "courier 10" )
#' tktag.configure(console, "errorTag", foreground = "red" ,
#' font = "courier 10 bold" )
#' ##
#' # Console function
#' eval_cmd_chunk <- function(console , cmds) {
#' cmd_chunks <- try(parse(text = cmds), silent = TRUE)
#' if (inherits(cmd_chunks , "try-error")) {
#' tkinsert(t,"end", "Error", "errorTag") # add markup tag
#' }
#' for (cmd in cmd_chunks) {
#' cutoff <- 0.75 * getOption("width")
#' dcmd <- deparse(cmd , width.cutoff = cutoff)
#' command <-
#' paste("mMCP> ",
#' paste(dcmd, collapse = paste("\n", getOption("continue"), sep = "")) ,
#' sep = "" , collapse = "")
#' tkinsert(console , "end" , command , "commandTag" )
#' tkinsert(console , "end" , "\n")
#' ## output, should check for errors in eval!
#' # The function sink() stores the output in a file
#' output <- capture.output(eval(cmd, envir = envmidrangeMCP))
#' output <- paste(output , collapse = "\n" )
#' tkinsert(console, "end", output, "outputTag" )
#' tkinsert(console, "end" , "\n")
#' }
#' }
#'
#'
#' # Button Calculate
#' ##################
#' tkpack(calculate_button <- ttkbutton(text = gettext("Calculate",
#' domain = "R-midrangeMCP"),
#' parent = child2.group1),
#' side = "bottom",
#' anchor = "s",
#' expand = TRUE,
#' fill = "x"
#' )
#'
#' tkbind(calculate_button, "<ButtonRelease>", function(...){
#' results <- NULL
#' tcl(console, "delete", "1.0", "end")
#' if (tclvalue(vari3) == gettext("Model", domain = "R-midrangeMCP")) {
#' capture.output(envmidrangeMCP$results <- midrangeMCP::MRtest(y = aov(eval(parse(text = tclvalue(vari5))), data = envmidrangeMCP$dat),
#' trt = tclvalue(vari6),
#' alpha = eval(parse(text = tclvalue(vari4))),
#' MCP = tclvalue(vari)))
#' objtreat <- as.factor(envmidrangeMCP$dat[,tclvalue(vari6)])
#'
#' # Results in the Console
#' if (tclvalue(vari2) == "latex") {
#' capture.output(envmidrangeMCP$saida <- midrangeMCP::MRwrite(x = envmidrangeMCP$results, extension = 'latex'))
#' envmidrangeMCP$teste <- paste("group.", tclvalue(vari), sep = "")
#' envmidrangeMCP$LaTeX <- envmidrangeMCP$saida[[1]][envmidrangeMCP$teste]
#'
#' eval_cmd_chunk(console, "results; LaTeX")
#' }
#' if (tclvalue(vari2) != "latex") {
#' midrangeMCP::MRwrite(x = envmidrangeMCP$results, MCP = tclvalue(vari), extension = tclvalue(vari2), dataMR = 'all')
#' eval_cmd_chunk(console, "results")
#' }
#'
#' ##
#' #Update plots
#' sapply(as.character(tkwinfo("children", frame.graf)),
#' function(W) tcl("destroy", W))
#'
#' #Frame label
#' tkpack(framelabel <- ttkframe(frame.graf, style = "Toolbar.TFrame",
#' padding = c(3,3,3,3)),
#' side = "top", fill = "x", expand = TRUE)
#'
#' # Frame label aux
#' tkpack(framelabelaux <- ttkframe(framelabel, style = "Toolbar.TFrame",
#' padding = c(3,3,3,3)),
#' side = "top", fill = "x", expand = TRUE)
#'
#' #Frame plot
#' tkpack(frameplot <- ttkframe(frame.graf, style = "Toolbar.TFrame",
#' padding = c(3,3,3,3), height = 360),
#' side = "top", fill = "both", expand = TRUE)
#'
#' tkplotmidrangeMCP3(frameplot, envmidrangeMCP$results, col = heat.colors(length(levels(objtreat))))
#'
#'
#' bsaveas <- tkbutton(parent = framelabelaux, text = gettext("Save as...", domain = "R-midrangeMCP"),
#' borderwidth = 0, underline = 0,
#' image = tclvalue(imagesaveas), compound = "top",
#' command = function(...){
#' #dispplot <<- grDevices::dev.new(noRStudioGD = TRUE) # New device plot
#' #grDevices::dev.new(noRStudioGD = TRUE) # New device plot
#' if (tclvalue(vari3) == gettext("Model", domain = "R-midrangeMCP")) {
#' objtreat <- as.factor(envmidrangeMCP$dat[,tclvalue(vari6)])
#' }
#' if (tclvalue(vari3) == gettext("Response variable", domain = "R-midrangeMCP")) {
#' objtreat <- as.factor(envmidrangeMCP$dat[,tclvalue(vari8)])
#' }
#' if (tclvalue(vari3) == gettext("Averages", domain = "R-midrangeMCP")) {
#' # Treatment levels
#' trat <- strsplit(tclvalue(vari12), split = ",", perl = TRUE)[[1]]
#' trat <- as.factor(trat)
#' objtreat <- trat
#' }
#' xlab <- NULL; ylab <- NULL
#' eval(parse(text = tclvalue(vari18)))
#' hor <- if (tclvalue(vari17) == "") FALSE else eval(parse(text = tclvalue(vari17)))
#' if (tclvalue(vari16) == "") {
#' color <- heat.colors(length(levels(objtreat)))
#' } else {
#' if (any(c(grep("\'", tclvalue(vari16)), grep("\"", tclvalue(vari16))) == 1)) {
#' if (length(grep("\'", tclvalue(vari16))) > 0) {
#' color <- gsub("\'", "", tclvalue(vari16))
#' }
#' if (length(grep("\"", tclvalue(vari16))) > 0) {
#' color <- gsub("\"", "", tclvalue(vari16))
#' }
#' } else{
#' color <- eval(parse(text = tclvalue(vari16)))
#' }
#' }
#' tkplotmidrangeMCP(envmidrangeMCP$results, col = color, horiz = hor, xlab = xlab, ylab = ylab)
#' })
#' tkpack(bsaveas, side = "left")
#'
#' # Frame label aux2
#' tkpack(framelabelaux2 <- ttkframe(framelabelaux, style = "Toolbar.TFrame",
#' padding = c(3,3,3,3)),
#' side = "top", fill = "x", expand = TRUE)
#'
#'
#'
#'
#'
#' }
#' if (tclvalue(vari3) == gettext("Response variable", domain = "R-midrangeMCP")) {
#' objrv <- envmidrangeMCP$dat[,tclvalue(vari7)]
#' objtreat <- as.factor(envmidrangeMCP$dat[,tclvalue(vari8)])
#' capture.output(envmidrangeMCP$results <- midrangeMCP::MRtest(y = objrv,
#' trt = objtreat,
#' dferror = eval(parse(text = tclvalue(vari9))),
#' mserror = eval(parse(text = tclvalue(vari10))),
#' alpha = eval(parse(text = tclvalue(vari4))),
#' MCP = tclvalue(vari)))
#'
#' # Results in the Console
#' if (tclvalue(vari2) == "latex") {
#' capture.output(envmidrangeMCP$saida <- midrangeMCP::MRwrite(x = envmidrangeMCP$results, extension = 'latex'))
#' envmidrangeMCP$teste <- paste("group.", tclvalue(vari), sep = "")
#' envmidrangeMCP$LaTeX <- envmidrangeMCP$saida[[1]][envmidrangeMCP$teste]
#'
#' eval_cmd_chunk(console, "results; LaTeX")
#' }
#' if (tclvalue(vari2) != "latex") {
#' midrangeMCP::MRwrite(x = envmidrangeMCP$results, MCP = tclvalue(vari), extension = tclvalue(vari2), dataMR = 'all')
#' eval_cmd_chunk(console, "results")
#' }
#'
#' ##
#' #Update plots
#' sapply(as.character(tkwinfo("children", frame.graf)),
#' function(W) tcl("destroy", W))
#'
#' #Frame label
#' tkpack(framelabel <- ttkframe(frame.graf, style = "Toolbar.TFrame",
#' padding = c(3,3,3,3)),
#' side = "top", fill = "x", expand = TRUE)
#'
#' # Frame label aux
#' tkpack(framelabelaux <- ttkframe(framelabel, style = "Toolbar.TFrame",
#' padding = c(3,3,3,3)),
#' side = "top", fill = "x", expand = TRUE)
#'
#' #Frame plot
#' tkpack(frameplot <- ttkframe(frame.graf, style = "Toolbar.TFrame",
#' padding = c(3,3,3,3), height = 360),
#' side = "top", fill = "both", expand = TRUE)
#'
#' # Creating an image in the tcltk
#' fator <- 1
#' #Plot
#' ##
#' plotmidrangeMCP <- tkplot(parent = frameplot,
#' function(...) {
#' midrangeMCP::MRbarplot(envmidrangeMCP$results,col = heat.colors(length(levels(objtreat))))
#' }, hscale = fator, vscale = fator)
#' # Auxiliar function
#' f <- function(...) {
#' fatorup <- as.numeric(tclvalue("fator"))
#' if (fator != fatorup) {
#' fator <<- fatorup
#' tkrplot::tkrreplot(plotmidrangeMCP, hscale = fator, vscale = fator)
#' }
#' }
#' # Button save as...
#' #graphics.off() # Erasing All Graphics Devices
#' dispplot <- NULL
#' bsaveas <- tkbutton(parent = framelabelaux, text = gettext("Save as...", domain = "R-midrangeMCP"),
#' borderwidth = 0, underline = 0,
#' image = tclvalue(imagesaveas), compound = "top",
#' command = function(...){
#' dispplot <<- grDevices::dev.new(noRStudioGD = TRUE) # New device plot
#' #grDevices::dev.new(noRStudioGD = TRUE) # New device plot
#' if (tclvalue(vari3) == gettext("Model", domain = "R-midrangeMCP")) {
#' objtreat <- as.factor(envmidrangeMCP$dat[,tclvalue(vari6)])
#' }
#' if (tclvalue(vari3) == gettext("Response variable", domain = "R-midrangeMCP")) {
#' objtreat <- as.factor(envmidrangeMCP$dat[,tclvalue(vari8)])
#' }
#' if (tclvalue(vari3) == gettext("Averages", domain = "R-midrangeMCP")) {
#' # Treatment levels
#' trat <- strsplit(tclvalue(vari12), split = ",", perl = TRUE)[[1]]
#' trat <- as.factor(trat)
#' objtreat <- trat
#' }
#' xlab <- NULL; ylab <- NULL
#' eval(parse(text = tclvalue(vari18)))
#' hor <- if (tclvalue(vari17) == "") FALSE else eval(parse(text = tclvalue(vari17)))
#' if (tclvalue(vari16) == "") {
#' color <- heat.colors(length(levels(objtreat)))
#' } else {
#' if (any(c(grep("\'", tclvalue(vari16)), grep("\"", tclvalue(vari16))) == 1)) {
#' if (length(grep("\'", tclvalue(vari16))) > 0) {
#' color <- gsub("\'", "", tclvalue(vari16))
#' }
#' if (length(grep("\"", tclvalue(vari16))) > 0) {
#' color <- gsub("\"", "", tclvalue(vari16))
#' }
#' } else{
#' color <- eval(parse(text = tclvalue(vari16)))
#' }
#' }
#' midrangeMCP::MRbarplot(envmidrangeMCP$results, col = color, horiz = hor, xlab = xlab, ylab = ylab)
#' })
#' tkpack(bsaveas, side = "left")
#'
#' # Frame label aux2
#' tkpack(framelabelaux2 <- ttkframe(framelabelaux, style = "Toolbar.TFrame",
#' padding = c(3,3,3,3)),
#' side = "top", fill = "x", expand = TRUE)
#' #Label
#' scalelabel <- tklabel(parent = framelabelaux2, text = gettext("Scale of Plot", domain = "R-midrangeMCP"))
#' # Scale of plot
#' s <- tkscale(framelabelaux2, command = f, from = 1, to = 3.00, variable = "fator",
#' showvalue = TRUE, resolution = 0.05, orient = "horiz",
#' background = "#e1eff7", borderwidth = 0)
#'
#' # Drawing the widget
#' tkpack(s)
#' tkpack(scalelabel, before = s)
#' tkpack.configure(s, fill = "both", expand = TRUE, side = "bottom", ipady = 5)
#' #tkpack.configure(scalelabel, side = "bottom", anchor = "s")
#'
#'
#'
#' #tkgrid(plotmidrangeMCP, row = 0, column = 0, sticky = "news")
#' tkpack(plotmidrangeMCP, fill = "both", expand = TRUE)
#' addScrollbars(frameplot, plotmidrangeMCP)
#' }
#' if (tclvalue(vari3) == gettext("Averages", domain = "R-midrangeMCP")) {
#' # if (!is.factor(eval(parse(text = svalue(gme2d))))){
#' # gmessage("The trt argument must be factor")
#' # }
#' # Mean vector
#' aver <- paste("c(", tclvalue(vari11), ")")
#' # Treatment levels
#' trat <- strsplit(tclvalue(vari12), split = ",", perl = TRUE)[[1]]
#' trat <- as.factor(trat)
#'
#' # Functions
#' capture.output(envmidrangeMCP$results <- midrangeMCP::MRtest(y = eval(parse(text = aver)),
#' trt = trat,
#' dferror = eval(parse(text = tclvalue(vari13))),
#' mserror = eval(parse(text = tclvalue(vari14))),
#' alpha = eval(parse(text = tclvalue(vari4))),
#' MCP = tclvalue(vari),
#' replication = eval(parse(text = tclvalue(vari15))),
#' ismean = TRUE))
#'
#' # Results in the Console
#' if (tclvalue(vari2) == "latex") {
#' capture.output(envmidrangeMCP$saida <- midrangeMCP::MRwrite(x = envmidrangeMCP$results, extension = 'latex'))
#' envmidrangeMCP$teste <- paste("group.", tclvalue(vari), sep = "")
#' envmidrangeMCP$LaTeX <- envmidrangeMCP$saida[[1]][envmidrangeMCP$teste]
#'
#' eval_cmd_chunk(console, "results; LaTeX")
#' }
#' if (tclvalue(vari2) != "latex") {
#' midrangeMCP::MRwrite(x = envmidrangeMCP$results, MCP = tclvalue(vari), extension = tclvalue(vari2), dataMR = 'all')
#' eval_cmd_chunk(console, "results")
#' }
#'
#' ##
#' #Update plots
#' sapply(as.character(tkwinfo("children", frame.graf)),
#' function(W) tcl("destroy", W))
#'
#' #Frame label
#' tkpack(framelabel <- ttkframe(frame.graf, style = "Toolbar.TFrame",
#' padding = c(3,3,3,3)),
#' side = "top", fill = "x", expand = TRUE)
#'
#' # Frame label aux
#' tkpack(framelabelaux <- ttkframe(framelabel, style = "Toolbar.TFrame",
#' padding = c(3,3,3,3)),
#' side = "top", fill = "x", expand = TRUE)
#'
#' #Frame plot
#' tkpack(frameplot <- ttkframe(frame.graf, style = "Toolbar.TFrame",
#' padding = c(3,3,3,3), height = 360),
#' side = "top", fill = "both", expand = TRUE)
#'
#' # Creating an image in the tcltk
#' fator <- 1
#' #Plot
#' ##
#' plotmidrangeMCP <- tkplot(parent = frameplot,
#' function(...) {
#' midrangeMCP::MRbarplot(envmidrangeMCP$results,col = heat.colors(length(levels(trat))))
#' }, hscale = fator, vscale = fator)
#' # Auxiliar function
#' f <- function(...) {
#' fatorup <- as.numeric(tclvalue("fator"))
#' if (fator != fatorup) {
#' fator <<- fatorup
#' tkrplot::tkrreplot(plotmidrangeMCP, hscale = fator, vscale = fator)
#' }
#' }
#' # Button save as...
#' #graphics.off() # Erasing All Graphics Devices
#' dispplot <- NULL
#' bsaveas <- tkbutton(parent = framelabelaux, text = gettext("Save as...", domain = "R-midrangeMCP"),
#' borderwidth = 0, underline = 0,
#' image = tclvalue(imagesaveas), compound = "top",
#' command = function(...){
#' dispplot <<- grDevices::dev.new(noRStudioGD = TRUE) # New device plot
#' #grDevices::dev.new(noRStudioGD = TRUE) # New device plot
#' if (tclvalue(vari3) == gettext("Model", domain = "R-midrangeMCP")) {
#' objtreat <- as.factor(envmidrangeMCP$dat[,tclvalue(vari6)])
#' }
#' if (tclvalue(vari3) == gettext("Response variable", domain = "R-midrangeMCP")) {
#' objtreat <- as.factor(envmidrangeMCP$dat[,tclvalue(vari8)])
#' }
#' if (tclvalue(vari3) == gettext("Averages", domain = "R-midrangeMCP")) {
#' # Treatment levels
#' trat <- strsplit(tclvalue(vari12), split = ",", perl = TRUE)[[1]]
#' trat <- as.factor(trat)
#' objtreat <- trat
#' }
#' xlab <- NULL; ylab <- NULL
#' eval(parse(text = tclvalue(vari18)))
#' hor <- if (tclvalue(vari17) == "") FALSE else eval(parse(text = tclvalue(vari17)))
#' if (tclvalue(vari16) == "") {
#' color <- heat.colors(length(levels(objtreat)))
#' } else {
#' if (any(c(grep("\'", tclvalue(vari16)), grep("\"", tclvalue(vari16))) == 1)) {
#' if (length(grep("\'", tclvalue(vari16))) > 0) {
#' color <- gsub("\'", "", tclvalue(vari16))
#' }
#' if (length(grep("\"", tclvalue(vari16))) > 0) {
#' color <- gsub("\"", "", tclvalue(vari16))
#' }
#' } else{
#' color <- eval(parse(text = tclvalue(vari16)))
#' }
#' }
#' midrangeMCP::MRbarplot(envmidrangeMCP$results, col = color, horiz = hor, xlab = xlab, ylab = ylab)
#' })
#' tkpack(bsaveas, side = "left")
#'
#' # Frame label aux2
#' tkpack(framelabelaux2 <- ttkframe(framelabelaux, style = "Toolbar.TFrame",
#' padding = c(3,3,3,3)),
#' side = "top", fill = "x", expand = TRUE)
#' #Label
#' scalelabel <- tklabel(parent = framelabelaux2, text = gettext("Scale of Plot", domain = "R-midrangeMCP"))
#' # Scale of plot
#' s <- tkscale(framelabelaux2, command = f, from = 1, to = 3.00, variable = "fator",
#' showvalue = TRUE, resolution = 0.05, orient = "horiz",
#' background = "#e1eff7", borderwidth = 0)
#'
#' # Drawing the widget
#' tkpack(s)
#' tkpack(scalelabel, before = s)
#' tkpack.configure(s, fill = "both", expand = TRUE, side = "bottom", ipady = 5)
#' #tkpack.configure(scalelabel, side = "bottom", anchor = "s")
#'
#'
#'
#' #tkgrid(plotmidrangeMCP, row = 0, column = 0, sticky = "news")
#' tkpack(plotmidrangeMCP, fill = "both", expand = TRUE)
#' addScrollbars(frameplot, plotmidrangeMCP)
#' }
#' })
#'
#'
#' ############
#' # Working Q3
#' ############
#'
#' # Input
#' #######
#'
#' # Frame
#' tkpack(frame.input <- ttklabelframe(text = gettext("Input", domain = "R-midrangeMCP"), parent = child1.group2,
#' style = "Toolbar.TLabelframe"),
#' side = "top",
#' anchor = "center",
#' expand = TRUE,
#' fill = "x"
#' )
#' # Group.input.top
#' tkpack(group.input.top <- tkframe(parent = frame.input),
#' side = "top",
#' anchor = "center",
#' expand = TRUE,
#' fill = "x"
#' )
#' # Tests
#' tkpack(tklabel(text = gettext("Tests:", domain = "R-midrangeMCP"), parent = group.input.top),
#' side = "left",
#' anchor = "nw"
#' )
#' ##
#' entry.exp <- c("MGM", "MGR", "SNKM", "TM")
#' vari <- tclVar(entry.exp[1])
#' tkpack(tests_box_group <- ttkcombobox(parent = group.input.top,
#' values = entry.exp,
#' textvariable = vari,
#' state = "normal",
#' justify = "left",
#' width = 5),
#' side = "left",
#' anchor = "nw",
#' padx = "1m"
#' )
#' ##
#' tkpack(bgit <- tkbutton(text = gettext("help", domain = "R-midrangeMCP"),
#' parent = group.input.top, borderwidth = 0, image = tclvalue(imageinfo),
#' command = function(...){
#' tkmessageBox(message = gettext("Choose the test for data analysis. The Mean Grouping test based on Midrange (MGM test) and Mean Grouping test based on Range (MGR test) are tests without ambiguity in their results. These tests are similar to the Scott-Knott test. The Tukey Midrange test (TM test) and SNK Midrange test (SNKM test) are tests similar to the Tukey and SNK tests, respectively. these tests are also based on midrange.", domain = "R-midrangeMCP"))
#' }),
#' side = "left",
#' anchor = "nw"
#' )
#' ##
#' ## Export
#' ##
#' tkpack(bexp <- tkbutton(text = gettext("help", domain = "R-midrangeMCP"),
#' parent = group.input.top, borderwidth = 0, image = tclvalue(imageinfo),
#' command = function(...) {
#' tkmessageBox(message = gettext("Choose the type of extension for the data output file. If 'latex', the code will be exported to the Console frame. The remaining options will be exported to the selected directory. The choice of the directory can be made in the 'Choosing the directory' button.", domain = "R-midrangeMCP"))
#' }),
#' side = "right",
#' anchor = "ne"
#' )
#' ##
#' ##
#' entryexp2 <- c("latex", "txt", "xlsx", "csv")
#' vari2 <- tclVar(entryexp2[1])
#' tkpack(entry.exp_radio <- ttkcombobox(parent = group.input.top,
#' values = entryexp2,
#' textvariable = vari2,
#' state = "normal",
#' justify = "left",
#' width = 8),
#' side = "right",
#' anchor = "ne",
#' padx = "1m"
#' )
#' ##
#' tkpack(tklabel(text = gettext("Extension: ", domain = "R-midrangeMCP"),
#' parent = group.input.top),
#' side = "right",
#' anchor = "ne"
#' )
#' ##Separator
#' tkpack(ttkseparator(parent = frame.input, orient = "horizontal"),
#' fill = "both", side = "top", anchor = "center", pady = "2m")
#'
#' # Data Entry Options
#' ####################
#' tkpack(group.entry <- tkframe(parent = frame.input),
#' side = "top",
#' anchor = "center",
#' expand = TRUE,
#' fill = "x"
#' )
#' tkpack(tklabel(text = gettext("Data Entry Options:",
#' domain = "R-midrangeMCP"),
#' parent = frame.input),
#' side = "left",
#' anchor = "nw"
#' )
#' ##
#' entry <- c(gettext("Model", domain = "R-midrangeMCP"),
#' gettext("Response variable", domain = "R-midrangeMCP"),
#' gettext("Averages", domain = "R-midrangeMCP"))
#' vari3 <- tclVar(entry[1])
#'
#' # Auxiliar Function
#'
#' ##
#' tkpack(entry_combobox <- ttkcombobox(parent= frame.input,
#' values = entry,
#' textvariable = vari3,
#' state = "normal",
#' justify = "left",
#' width = 12
#' ),
#' side = "left",
#' anchor = "nw",
#' padx = "1m"
#' )
#'
#' tkbind(entry_combobox, "<<ComboboxSelected>>", function(...){
#' if (tclvalue(vari3) == gettext("Response variable", domain = "R-midrangeMCP")) {
#' tcl(group.rv, "state", "!disabled")
#' child.group.rv <- as.character(tkwinfo("children", group.rv))
#' sapply(child.group.rv, function(W) {
#' tcl(W, "configure", "-state", "normal")
#' })
#' child.group.model <- as.character(tkwinfo("children", group.model))
#' sapply(child.group.model, function(W) {
#' tcl(W, "configure", "-state", "disabled")
#' })
#' child.group.means <- as.character(tkwinfo("children", groupmeans))
#' sapply(child.group.means, function(W) {
#' tcl(W, "configure", "-state", "disabled")
#' })
#' }
#' if (tclvalue(vari3) == gettext("Model", domain = "R-midrangeMCP")) {
#' tcl(group.rv, "state", "!disabled")
#' child.group.rv <- as.character(tkwinfo("children", group.rv))
#' sapply(child.group.rv, function(W) {
#' tcl(W, "configure", "-state", "disabled")
#' })
#' child.group.model <- as.character(tkwinfo("children", group.model))
#' sapply(child.group.model, function(W) {
#' tcl(W, "configure", "-state", "normal")
#' })
#' child.group.means <- as.character(tkwinfo("children", groupmeans))
#' sapply(child.group.means, function(W) {
#' tcl(W, "configure", "-state", "disabled")
#' })
#' }
#' if (tclvalue(vari3) == gettext("Averages", domain = "R-midrangeMCP")) {
#' tcl(group.rv, "state", "!disabled")
#' child.group.rv <- as.character(tkwinfo("children", group.rv))
#' sapply(child.group.rv, function(W) {
#' tcl(W, "configure", "-state", "disabled")
#' })
#' child.group.model <- as.character(tkwinfo("children", group.model))
#' sapply(child.group.model, function(W) {
#' tcl(W, "configure", "-state", "disabled")
#' })
#' child.group.means <- as.character(tkwinfo("children", groupmeans))
#' sapply(child.group.means, function(W) {
#' tcl(W, "configure", "-state", "normal")
#' })
#' }
#' })
#'
#' tkpack(bentry <- tkbutton(text = gettext("help",
#' domain = "R-midrangeMCP"),
#' parent = frame.input, borderwidth = 0, image = tclvalue(imageinfo),
#' command = function(...){
#' tkmessageBox(message = gettext("Choose the type of data entry. If 'Model', enter the experimental model. If 'Response Variable', enter the object name of the responses and treatments variables and if 'Averages', enter the vector of means and treatments. For more details, use the help button on each option. \n The 'Averages' option is the only one that will not need to load a data set. Just enter the recommended options and then click the Calculate button.", domain = "R-midrangeMCP"))
#' }
#' ),
#' side = "left",
#' anchor = "nw"
#' )
#' ##
#'
#'
#' # Significance level
#' tkpack(bsl <- tkbutton(text = gettext("help", domain = "R-midrangeMCP"),
#' parent = frame.input, borderwidth = 0, image = tclvalue(imageinfo),
#' command = function(...){
#' tkmessageBox(message = gettext("Enter the value of the significance level. This value is a number between 0 and 1.", domain = "R-midrangeMCP"))
#' }),
#' side = "right",
#' anchor = "ne"
#' )
#' ##
#' ##
#' vari4 <- tclVar("0.05")
#' ##
#' tkpack(slentry <- tkentry(parent = frame.input,
#' textvariable = vari4, width = 5),
#' anchor = "ne", padx = "2m", side = "right")
#'
#' tkpack(tklabel(text = gettext("Significance level:",
#' domain = "R-midrangeMCP"),
#' parent = frame.input),
#' side = "right",
#' anchor = "ne"
#' )
#'
#' # Option 'Model'
#' ################
#' tkpack(group.model <- ttklabelframe(text = gettext("Model",
#' domain = "R-midrangeMCP"),
#' parent = child21.group2, style = "Toolbar.TLabelframe"),
#' expand = TRUE, fill = "both")
#' ## Enter model
#' tkgrid(label.model <- tklabel(text = gettext("Enter model:",
#' domain = "R-midrangeMCP"),
#' parent = group.model),
#' row = 0, column = 0, sticky = "e"
#' )
#' ##
#' vari5 <- tclVar("")
#' tkgrid(gm1d <- tkentry(textvariable = vari5,
#' parent = group.model, width = 20),
#' row = 0, column = 1, sticky = "e", padx = 2
#' )
#' ##
#' tkgrid(bm1d <- tkbutton(text = gettext("help", domain = "R-midrangeMCP"),
#' parent = group.model, borderwidth = 0, image = tclvalue(imageinfo),
#' command = function(...) {
#' tkmessageBox(message = gettext("Enter the experimental model of type Response Variable (RV) ~ Predictive Variables (PV). These variables are in the 'Output' frame, after entering the data set. For example, in a randomized block design, assuming the 'treat' object corresponding to the treatments, 'block' object corresponding to the blocks and 'resp' object corresponding to the variable response. So, you must enter the following expression: resp ~ trat + block.", domain = "R-midrangeMCP"))
#' }),
#' row = 0, column = 2, sticky = "e")
#' ##
#' ## Treatment
#' tkgrid(lm.treat <- tklabel(text = gettext("Treatment:", domain = "R-midrangeMCP"),
#' parent = group.model),
#' row = 1, column = 0, sticky = "e"
#' )
#' ##
#' vari6 <- tclVar("")
#' tkgrid(treat <- tkentry(textvariable = vari6,
#' parent = group.model, width = 20),
#' row = 1, column = 1, sticky = "e", padx = 2
#' )
#' ##
#' tkgrid(bm2d <- tkbutton(text = gettext("help", domain = "R-midrangeMCP"),
#' parent = group.model, borderwidth = 0, image = tclvalue(imageinfo),
#' command = function(...) {
#' tkmessageBox(message = gettext("Enter the name of the treatments in the experiment model inserted above, in Predictive Variables (PV). The name of the treatment are in the 'Output' frame, after entering the data set. Inserted all the arguments above, click on the 'Calculate' button.", domain = "R-midrangeMCP"))
#' }),
#' row = 1, column = 2, sticky = "e"
#' )
#' ##
#'
#' # Option 'Response variable'
#' ############################
#' tkpack(group.rv <- ttklabelframe(text = gettext("Response variable",
#' domain = "R-midrangeMCP"),
#' parent = child21.group2, style = "Toolbar.TLabelframe",
#' class = "Desativado"),
#' expand = TRUE, fill = "both")
#' # Disabled group.rv
#' tcl(group.rv, "state", "disabled")
#' ## Response
#' tkgrid(label.rv <- tklabel(text = gettext("Response:",
#' domain = "R-midrangeMCP"),
#' parent = group.rv),
#' row = 0, column = 0, sticky = "e"
#' )
#' ##
#' vari7 <- tclVar("")
#' tkgrid(grv1d <- tkentry(textvariable = vari7,
#' parent = group.rv, width = 20),
#' row = 0, column = 1, sticky = "e", padx = 2
#' )
#' ##
#'
#' tkgrid(bgrv1d <- tkbutton(text = gettext("help", domain = "R-midrangeMCP"),
#' parent = group.rv, borderwidth = 0, image = tclvalue(imageinfo),
#' command = function(...) tkmessageBox(message = gettext("Insert the name of the variable response of the experiment model. The name of the response variable are in the 'Output' frame, after inserting the data set.", domain = "R-midrangeMCP"))),
#' row = 0, column = 2, sticky = "e")
#' ##
#' # tkbind(bgrv1d, "<ButtonRelease>", function(){
#' # tkmessageBox(message = gettext("Insert the name of the variable response of the experiment model. The name of the response variable are in the 'Output' frame, after inserting the data set.", domain = "R-midrangeMCP"))
#' # })
#' ## Treatment
#' tkgrid(lrv.treat <- tklabel(text = gettext("Treatment:", domain = "R-midrangeMCP"),
#' parent = group.rv),
#' row = 1, column = 0, sticky = "e"
#' )
#' ##
#' vari8 <- tclVar("")
#' tkgrid(grv2d <- tkentry(textvariable = vari8,
#' parent = group.rv, width = 20),
#' row = 1, column = 1, sticky = "e", padx = 2
#' )
#' ##
#' tkgrid(bgrv2d <- tkbutton(text = gettext("help", domain = "R-midrangeMCP"),
#' parent = group.rv, borderwidth = 0, image = tclvalue(imageinfo),
#' command = function(...) tkmessageBox(message = gettext("Enter the name of the treatment of the experiment model. The name of the response variable are in the 'Output' frame, after entering the data set.", domain = "R-midrangeMCP"))),
#' row = 1, column = 2, sticky = "e"
#' )
#' ##
#'
#' ## DFerror
#' tkgrid(lrv.dfe <- tklabel(text = gettext("DFerror:", domain = "R-midrangeMCP"),
#' parent = group.rv),
#' row = 2, column = 0, sticky = "e"
#' )
#' ##
#' vari9 <- tclVar("")
#' tkgrid(grv3d <- tkentry(textvariable = vari9,
#' parent = group.rv, width = 20),
#' row = 2, column = 1, sticky = "e", padx = 2
#' )
#' ##
#' tkgrid(bgrv3d <- tkbutton(text = gettext("help", domain = "R-midrangeMCP"),
#' parent = group.rv, borderwidth = 0, image = tclvalue(imageinfo),
#' command = function(...) {
#' tkmessageBox(message = gettext("Enter the numeric value of the degrees of freedom of the mean square error of the experiment model.", domain = "R-midrangeMCP"))
#' }),
#' row = 2, column = 2, sticky = "e"
#' )
#' ##
#' ## MSerror
#' tkgrid(lrv.mse <- tklabel(text = gettext("MSerror:", domain = "R-midrangeMCP"),
#' parent = group.rv),
#' row = 3, column = 0, sticky = "e"
#' )
#' ##
#' vari10 <- tclVar("")
#' tkgrid(grv4d <- tkentry(textvariable = vari10,
#' parent = group.rv, width = 20),
#' row = 3, column = 1, sticky = "e", padx = 2
#' )
#' ##
#' tkgrid(bgrv4d <- tkbutton(text = gettext("help", domain = "R-midrangeMCP"),
#' parent = group.rv, borderwidth = 0, image = tclvalue(imageinfo),
#' command = function(...) {
#' tkmessageBox(message = gettext("Enter the value of the mean square error of the experiment model. The value is numeric. Inserted all the arguments above, click on the 'Calculate' button.", domain = "R-midrangeMCP"))
#' }),
#' row = 3, column = 2, sticky = "e"
#' )
#' ##
#'
#' # Option 'Averages'
#' ############################
#' tkpack(groupmeans <- ttklabelframe(text = gettext("Averages",
#' domain = "R-midrangeMCP"),
#' parent = child21.group2, style = "Toolbar.TLabelframe",
#' class = "Desativado"),
#' expand = TRUE, fill = "both")
#' # Disabled groupmeans
#' tcl(groupmeans, "state", "disabled")
#' ## Averages
#' tkgrid(label.averages <- tklabel(text = gettext("Averages:",
#' domain = "R-midrangeMCP"),
#' parent = groupmeans),
#' row = 0, column = 0, sticky = "e"
#' )
#' ##
#' vari11 <- tclVar("")
#' tkgrid(gme1d <- tkentry(textvariable = vari11,
#' parent = groupmeans, width = 20),
#' row = 0, column = 1, sticky = "e", padx = 2
#' )
#' ##
#' ##
#' tkgrid(bgme1d <- tkbutton(text = gettext("help", domain = "R-midrangeMCP"),
#' parent = groupmeans, borderwidth = 0, image = tclvalue(imageinfo),
#' command = function(...) {
#' tkmessageBox(message = gettext("Enter the values of the averages. Each mean of the vector must be separated by a comma. For example, for the vector of the average of four treatments: 10, 20, 30, 40. You do not need to use the concatenate function, i.e., c().", domain = "R-midrangeMCP"))
#' }),
#' row = 0, column = 2, sticky = "e"
#' )
#' ##
#' ## Treatment
#' tkgrid(la.treat <- tklabel(text = gettext("Treatment:", domain = "R-midrangeMCP"),
#' parent = groupmeans),
#' row = 1, column = 0, sticky = "e"
#' )
#' ##
#' vari12 <- tclVar("")
#' tkgrid(gme2d <- tkentry(textvariable = vari12,
#' parent = groupmeans, width = 20),
#' row = 1, column = 1, sticky = "e", padx = 2
#' )
#' ##
#' tkgrid(bgme2d <- tkbutton(text = gettext("help", domain = "R-midrangeMCP"),
#' parent = groupmeans, borderwidth = 0, image = tclvalue(imageinfo),
#' command = function(...) {
#' tkmessageBox(message = gettext("Enter the treatment levels. For example, for a character vector of four treatments: A, B, C, D. You do not need to use the concatenate function, i.e., c(). Nor will you need to use quotes between treatment levels.", domain = "R-midrangeMCP"))
#' }),
#' row = 1, column = 2, sticky = "e"
#' )
#' ##
#' ## DFerror
#' tkgrid(la.dfe <- tklabel(text = gettext("DFerror:", domain = "R-midrangeMCP"),
#' parent = groupmeans),
#' row = 2, column = 0, sticky = "e"
#' )
#' ##
#' vari13 <- tclVar("")
#' tkgrid(gme3d <- tkentry(textvariable = vari13,
#' parent = groupmeans, width = 20),
#' row = 2, column = 1, sticky = "e", padx = 2
#' )
#' ##
#' tkgrid(bgme3d <- tkbutton(text = gettext("help", domain = "R-midrangeMCP"),
#' parent = groupmeans, borderwidth = 0, image = tclvalue(imageinfo),
#' command = function(...) {
#' tkmessageBox(message = gettext("Enter the value of the degrees of freedom of the mean square error of the experiment model. The value is numeric.", domain = "R-midrangeMCP"))
#' }),
#' row = 2, column = 2, sticky = "e"
#' )
#' ##
#' ## MSerror
#' tkgrid(la.mse <- tklabel(text = gettext("MSerror:", domain = "R-midrangeMCP"),
#' parent = groupmeans),
#' row = 3, column = 0, sticky = "e"
#' )
#' ##
#' vari14 <- tclVar("")
#' tkgrid(gme4d <- tkentry(textvariable = vari14,
#' parent = groupmeans, width = 20),
#' row = 3, column = 1, sticky = "e", padx = 2
#' )
#' ##
#' tkgrid(bgme4d <- tkbutton(text = gettext("help", domain = "R-midrangeMCP"),
#' parent = groupmeans, borderwidth = 0, image = tclvalue(imageinfo),
#' command = function(...) {
#' tkmessageBox(message = gettext("Enter the value of the mean square error of the experiment model. The value is numeric.", domain = "R-midrangeMCP"))
#' }),
#' row = 3, column = 2, sticky = "e"
#' )
#' ##
#'
#' ## Replication
#' tkgrid(la.rep <- tklabel(text = gettext("Replication:", domain = "R-midrangeMCP"),
#' parent = groupmeans),
#' row = 4, column = 0, sticky = "e"
#' )
#' ##
#' vari15 <- tclVar("")
#' tkgrid(gme5d <- tkentry(textvariable = vari15,
#' parent = groupmeans, width = 20),
#' row = 4, column = 1, sticky = "e", padx = 2
#' )
#' ##
#' tkgrid(bgme5d <- tkbutton(text = gettext("help", domain = "R-midrangeMCP"),
#' parent = groupmeans, borderwidth = 0, image = tclvalue(imageinfo),
#' command = function(...) {
#' tkmessageBox(message = gettext("Enter the value of number of replications of the treatments. The value is numeric and if the data is unbalanced use the harmonic mean of the replications. Inserted all the arguments above, click on the 'Calculate' button", domain = "R-midrangeMCP"))
#' }),
#' row = 4, column = 2, sticky = "e"
#' )
#' ##
#' ## Options 'Graphic Parameters'
#'
#' # Option 'Graphic Parameters'
#' ###############################
#' tkpack(frame.plot <- ttklabelframe(text = gettext("Graphic Parameters",
#' domain = "R-midrangeMCP"),
#' parent = child21.group2, style = "Toolbar.TLabelframe"),
#' expand = TRUE, fill = "both"
#' )
#' ## Color
#' tkgrid(tklabel(text = gettext("Color:", domain = "R-midrangeMCP"),
#' parent = frame.plot),
#' row = 0, column = 0, sticky = "e", pady = 3
#' )
#' ##
#' vari16 <- tclVar("")
#' tkgrid(ggraf1d <- tkentry(textvariable = vari16,
#' parent = frame.plot, width = 20),
#' row = 0, column = 1, sticky = "e", padx = 2
#' )
#' ##
#' tkgrid(bgraf1d <- tkbutton(text = gettext("help", domain = "R-midrangeMCP"),
#' parent = frame.plot, borderwidth = 0, image = tclvalue(imageinfo),
#' command = function(...) {
#' tkmessageBox(message = gettext("Enter the color name of the chart bars. Place quotation marks around the color names. For example, if you want the color red for the bars, use 'red'. For functions, quotation marks are not necessary, for example gray.colors() function.", domain = "R-midrangeMCP"))
#' }),
#' row = 0, column = 2, sticky = "e"
#' )
#' ##
#'
#' ## Horizontal
#' tkgrid(tklabel(text = gettext("Horizontal:", domain = "R-midrangeMCP"),
#' parent = frame.plot),
#' row = 1, column = 0, sticky = "e", pady = 3
#' )
#' ##
#' vari17 <- tclVar("")
#' tkgrid(ggraf2d <- tkentry(textvariable = vari17,
#' parent = frame.plot, width = 20),
#' row = 1, column = 1, sticky = "e", padx = 2
#' )
#' ##
#' tkgrid(bgraf2d <- tkbutton(text = gettext("help", domain = "R-midrangeMCP"),
#' parent = frame.plot, borderwidth = 0, image = tclvalue(imageinfo),
#' command = function(...) {
#' tkmessageBox(message = gettext("Choose horizontal or vertical bars (FALSE or TRUE).", domain = "R-midrangeMCP"))
#' }),
#' row = 1, column = 2, sticky = "e"
#' )
#' ##
#' ## Axes
#' tkgrid(tklabel(text = gettext("Axes:", domain = "R-midrangeMCP"),
#' parent = frame.plot),
#' row = 2, column = 0, sticky = "e", pady = 3
#' )
#' ##
#' vari18 <- tclVar("")
#' tkgrid(ggraf3d <- tkentry(textvariable = vari18,
#' parent = frame.plot, width = 20),
#' row = 2, column = 1, sticky = "e", padx = 2
#' )
#' ##
#' tkgrid(bgraf3d <- tkbutton(text = gettext("help", domain = "R-midrangeMCP"),
#' parent = frame.plot, borderwidth = 0, image = tclvalue(imageinfo),
#' command = function(...) {
#' tkmessageBox(message = gettext("Enter the axes. Separate them by semicolons. To add the names on the X and Y axes: xlab = 'Label X-axix'; ylab = 'Label Y-axis'.", domain = "R-midrangeMCP"))
#' }),
#' row = 2, column = 2, sticky = "e"
#' )
#' ##
#' ## Plot button
#' tkpack(plot_button <- ttkbutton(text = gettext("Update plot",
#' domain = "R-midrangeMCP"),
#' parent = child21.group2,
#' command = function() {
#' if (tclvalue(vari3) == gettext("Model", domain = "R-midrangeMCP")) {
#' objtreat <- envmidrangeMCP$dat[,tclvalue(vari6)]
#' }
#' if (tclvalue(vari3) == gettext("Response variable", domain = "R-midrangeMCP")) {
#' objtreat <- envmidrangeMCP$dat[,tclvalue(vari8)]
#' }
#' if (tclvalue(vari3) == gettext("Averages", domain = "R-midrangeMCP")) {
#' trat <- strsplit(tclvalue(vari12), split = ",", perl = TRUE)[[1]]
#' trat <- as.factor(trat)
#' objtreat <- trat
#' }
#' xlab <- NULL; ylab <- NULL
#' eval(parse(text = tclvalue(vari18)))
#' hor <- if (tclvalue(vari17) == "") FALSE else eval(parse(text = tclvalue(vari17)))
#' color <- if (tclvalue(vari16) == "") heat.colors(length(levels(objtreat))) else {
#' if (any(c(grep("\'", tclvalue(vari16)), grep("\"", tclvalue(vari16))) == 1)) {
#' if (length(grep("\'", tclvalue(vari16))) > 0) {
#' gsub("\'", "", tclvalue(vari16))
#' }
#' if (length(grep("\"", tclvalue(vari16))) > 0) {
#' gsub("\"", "", tclvalue(vari16))
#' }
#' } else{
#' eval(parse(text = tclvalue(vari16)))
#' }
#' }
#' #Update plots
#' sapply(as.character(tkwinfo("children", frame.graf)),
#' function(W) tcl("destroy", W))
#'
#' #Frame label
#' tkpack(framelabel <- ttkframe(frame.graf, style = "Toolbar.TFrame",
#' padding = c(3,3,3,3)),
#' side = "top", fill = "x", expand = TRUE)
#'
#' # Frame label aux
#' tkpack(framelabelaux <- ttkframe(framelabel, style = "Toolbar.TFrame",
#' padding = c(3,3,3,3)),
#' side = "top", fill = "x", expand = TRUE)
#'
#' #Frame plot
#' tkpack(frameplot <- ttkframe(frame.graf, style = "Toolbar.TFrame",
#' padding = c(3,3,3,3), height = 360),
#' side = "top", fill = "both", expand = TRUE)
#'
#' # Creating an image in the tcltk
#' fator <- 1
#' #Plot
#' ##
#' plotmidrangeMCP <- tkplot(parent = frameplot,
#' function(...) {
#' midrangeMCP::MRbarplot(envmidrangeMCP$results, col = color, horiz = hor, xlab = xlab, ylab = ylab)
#' }, hscale = fator, vscale = fator)
#' # Auxiliar function
#' f <- function(...) {
#' fatorup <- as.numeric(tclvalue("fator"))
#' if (fator != fatorup) {
#' fator <<- fatorup
#' tkrplot::tkrreplot(plotmidrangeMCP, hscale = fator, vscale = fator)
#' }
#' }
#' # Button save as...
#' #graphics.off() # Erasing All Graphics Devices
#' dispplot <- NULL
#' bsaveas <- tkbutton(parent = framelabelaux, text = gettext("Save as...", domain = "R-midrangeMCP"),
#' borderwidth = 0, underline = 0,
#' image = tclvalue(imagesaveas), compound = "top",
#' command = function(...){
#' #dispplot <<- grDevices::dev.new(noRStudioGD = TRUE) # New device plot
#' #grDevices::dev.new(noRStudioGD = TRUE) # New device plot
#' if (tclvalue(vari3) == gettext("Model", domain = "R-midrangeMCP")) {
#' objtreat <- envmidrangeMCP$dat[,tclvalue(vari6)]
#' }
#' if (tclvalue(vari3) == gettext("Response variable", domain = "R-midrangeMCP")) {
#' objtreat <- envmidrangeMCP$dat[,tclvalue(vari8)]
#' }
#'
#' if (tclvalue(vari3) == gettext("Averages", domain = "R-midrangeMCP")) {
#' # Treatment levels
#' trat <- strsplit(tclvalue(vari12), split = ",", perl = TRUE)[[1]]
#' trat <- as.factor(trat)
#' objtreat <- trat
#' }
#' xlab <- NULL; ylab <- NULL
#' eval(parse(text = tclvalue(vari18)))
#' hor <- if (tclvalue(vari17) == "") FALSE else eval(parse(text = tclvalue(vari17)))
#' if (tclvalue(vari16) == "") {
#' color <- heat.colors(length(levels(objtreat)))
#' } else {
#' if (any(c(grep("\'", tclvalue(vari16)), grep("\"", tclvalue(vari16))) == 1)) {
#' if (length(grep("\'", tclvalue(vari16))) > 0) {
#' color <- gsub("\'", "", tclvalue(vari16))
#' }
#' if (length(grep("\"", tclvalue(vari16))) > 0) {
#' color <- gsub("\"", "", tclvalue(vari16))
#' }
#' } else{
#' color <- eval(parse(text = tclvalue(vari16)))
#' }
#' }
#' #midrangeMCP::MRbarplot(envmidrangeMCP$results, col = color, horiz = hor, xlab = xlab, ylab = ylab)
#' tkplotmidrangeMCP(envmidrangeMCP$results, col = color, horiz = hor, xlab = xlab, ylab = ylab)
#' })
#' tkpack(bsaveas, side = "left")
#'
#' # Frame label aux2
#' tkpack(framelabelaux2 <- ttkframe(framelabelaux, style = "Toolbar.TFrame",
#' padding = c(3,3,3,3)),
#' side = "top", fill = "x", expand = TRUE)
#' #Label
#' scalelabel <- tklabel(parent = framelabelaux2, text = gettext("Scale of Plot", domain = "R-midrangeMCP"))
#' # Scale of plot
#' s <- tkscale(framelabelaux2, command = f, from = 1, to = 3.00, variable = "fator",
#' showvalue = TRUE, resolution = 0.05, orient = "horiz",
#' background = "#e1eff7", borderwidth = 0)
#'
#' # Drawing the widget
#' tkpack(s)
#' tkpack(scalelabel, before = s)
#' tkpack.configure(s, fill = "both", expand = TRUE, side = "bottom", ipady = 5)
#' #tkpack.configure(scalelabel, side = "bottom", anchor = "s")
#'
#'
#'
#' #tkgrid(plotmidrangeMCP, row = 0, column = 0, sticky = "news")
#' tkpack(plotmidrangeMCP, fill = "both", expand = TRUE)
#' addScrollbars(frameplot, plotmidrangeMCP)
#' }),
#' side = "bottom",
#' anchor = "s",
#' expand = TRUE,
#' fill = "x"
#' )
#'
#' ############
#' # Working Q4
#' ############
#' tkpack(frame.graf <- ttklabelframe(text = gettext("Plot",
#' domain = "R-midrangeMCP"),
#' parent = child22.group2, style = "Toolbar.TLabelframe"),
#' expand = TRUE, fill = "both"
#' )
#' #tkpack(tklabel(frame.graf, image = "::image::logomidrangeMCP"), expand = TRUE, fill = "both")
#' tkplotmidrangeMCparent(frame.graf, system.file("etc", "logo.png", package = "midrangeMCP"))
#'
#'
#'
#'
#'
#'
#'
#'
#' # Mensagem de protecao para nao fechar o programa por engano
#' tkwm.protocol(midrangeMCP, "WM_DELETE_WINDOW", function(){
#' response <- tkmessageBox(icon = "question",
#' message = gettext("Really close?", domain = "R-midrangeMCP"),
#' type = "yesno" ,
#' parent = midrangeMCP)
#' if (as.character(response) == "yes") {
#' pcreatobj <- c('brow', 'dat2', 'dat', 'results')
#' if (any(ls(.GlobalEnv) == "dat")) {
#' for (i in pcreatobj) {
#' if (!any(ls(.GlobalEnv) == i)) pcreatobj <- pcreatobj[-which(pcreatobj == i)]
#' }
#' rm(list = c(pcreatobj), envir = .GlobalEnv)
#' }
#' }
#' if (as.character(response) == "no") {
#' return()
#' }
#' tkdestroy(midrangeMCP) # Caso contrario feche
#' }
#' )
#'
#' # Activate GUI
#' finish <- tclServiceMode(oldmode)
#'
#'
#' }
#' }
#' #tclServiceMode(TRUE)
#' if (gui == FALSE) {
#' response <- tk_messageBox(
#' title = gettext("Tell me something:", domain = "R-midrangeMCP"),
#' message = gettext("Do you want to use the GUI for the package?", domain = "R-midrangeMCP"),
#' icon = "question",
#' type = "yesno"
#' )
#' if (response == "yes") {
#' guimidrangeMCP(gui = TRUE)
#' }
#' if (response == "no") {
#' tk_messageBox(message = gettext("Use the MRtest function! For help, use ?MRtest", domain = "R-midrangeMCP"))
#' ?midrangeMCP::MRtest
#' }
#'
#' }
#' }
#'
Any scripts or data that you put into this service are public.
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.