could not find function "LGB"

Can anyone help me on this?

I am doing a report for significant effects in unreplicated fractional factorials.
I am using R.

The file name is Soup,
Model.1 <- lm (Yield ~ (.)^2, data = Soup)
modc <- lm(y~(.)^2, data=soup)
library(daewr)
LGB(coef(modc)[-1], rpt = FALSE)

This is code that I have been given previously, which worked.

The error message that I get is:
Error in LGB(coef(modc)[-1], rpt = FALSE) : could not find function "LGB"

I have installed and loaded the daewr library as noted.
When I search for LGB, I get then following:

I am using RStudio 2023.03.0 Build 386 and R Version and the latest version of R.
Can anyone advise how to resolve this?

If there is a known issue, can an alternative package and library be used instead.

I installed the latest version of the daewr package (1.2-9) and also notice the LGB() function is not present. You could try installing the previous version (1.1-4) and give that a try. According to daewr/R on GitHub, this was the last time that function was updated.

require(devtools)
install_version("daewr", 
                version = "1.1-4", 
                repos = "http://cran.us.r-project.org")

Open an issue on github, and in the meantime, use the latest repo code, which may have been inadvertently orphaned

LGB <- function(Beta, alpha=.05,rpt=TRUE, plt=TRUE, pltl=TRUE) {
s<-LGBc(Beta,alpha,rpt,plt,pltl)
}

This topic was automatically closed 42 days after the last reply. New replies are no longer allowed.

If you have a query related to it or one of the replies, start a new topic and refer back with a link.