factorial <- function() { x <- readline(“Please input the desired value of a:”)
y <- readline(“Please input the desired value of b:”) z <- readline(“Please input the desired value of c:”)

x <- as.numeric(unlist(strsplit(x, “,”))) y <- as.numeric(unlist(strsplit(y, “,”))) z <- as.numeric(unlist(strsplit(z, “,”)))

posquad <- ((-y) + sqrt((y^2)-(4xz)))/(2*x)

negquad <- ((-y) - sqrt((y^2)-(4xz)))/(2*x)

return(list(posquad, negquad)) } if(interactive()) factorial()