Model optimization requirement,

Hello,
I have an issues when trying to run a malm(Malquist Analysis), after balancing my data and running the model, it gives me a waring "Model not optimized"

library(readxl)
 DMUsoybeans <- read_excel("DMUsoybeans.xlsx")
#> Error: `path` does not exist: 'DMUsoybeans.xlsx'
View(DMUsoybeans)
 as.data.frame(x): object 'DMUsoybeans' not found
library("Formula", lib.loc="~/R/win-library/3.5")
library("plm", lib.loc="~/R/win-library/3.5")
Dsoybeans<- as.data.frame(DMUsoybeans,row.names = NULL, optional = FALSE)
#> Error in as.data.frame(DMUsoybeans, row.names = NULL, optional = FALSE): object 'DMUsoybeans' not found
Dosybalance<- make.pbalanced(Dsoybeans,balance.type = "fill", index = NULL)
#> Error in make.pbalanced(Dsoybeans, balance.type = "fill", index = NULL): object 'Dsoybeans' not found
library("productivity", lib.loc="~/R/win-library/3.5")
#> 
#> * Please cite the 'productivity' package as:
#>   Dakpo K.H., Desjeux Y. and Latruffe L. (2018). productivity: Indices of Productivity and Profitability Using Data Envelopment Analysis (DEA). R package version 1.1.0.
#> 
#> See also: citation("productivity")
#> 
#> * For any questions, suggestions, or comments on the 'productivity' package, please make use of Tracker facilities at:
#>   https://r-forge.r-project.org/projects/productivity/
DMUSOY<- malm(data=Dosybalance,id.var ="DMU", time.var = "year",x.var=c("B012","B013","B014"),y.vars =c("Cropyeilt"),tech.reg = FALSE, rts = ("crs"),orientation = c("in"),parallel = TRUE,scaled = TRUE)
#> Error in is.data.frame(data): object 'Dosybalance' not found
DMUSOY<- malm(data=Dosybalance,id.var ="DMU", time.var = "year",x.var=c("B012","B013","B014"),y.vars =c("Cropyeilt"),tech.reg = FALSE, rts = ("crs"),orientation = c("in"),parallel = TRUE,cores =max(1, detectCores() - 1) ,scaled = TRUE)
#> Error in is.data.frame(data): object 'Dosybalance' not found

Created on 2018-09-05 by the reprex package (v0.2.0).