internal error -3 in R_decompress1

Hi,

I was running this code a few times :
x1 <- rnorm(1158) ## creating a continuous variable
x2 <- sample(1:2,1158,replace=T) # creating some sort of grouping variable with 2 groups
y <- rbinom(n = 1158, size = 1, prob= 0.3) # creating a binary (0,1) response variable (with probability of success = 0.3)
a=age(1158, x = 18:89, prob = NULL, name = "Age") #simulating age with “wakefield” package
s=sex(1158) #simulating sex with “wakefield” package
df <- data.frame(y = y, x1 = x1, x2 = x2, a=a, s=s) #merging into one data set

m1 <- lmer(y ~ x1+a+s + (1|x2), data = df)

fixef(m1)["x1"] <-0.032

powerSim(m1)

with success by changing value for fixef(m1)["x1"]. After maybe 4th times of running this simulationI got this error:

powerSim(m1)
Error in str_pad(sc$xc, str_length(sc$Nc)) :
lazy-load database '/Library/Frameworks/R.framework/Versions/3.5/Resources/library/stringi/R/stringi.rdb' is corrupt
In addition: Warning messages:
1: In str_pad(sc$xc, str_length(sc$Nc)) :
restarting interrupted promise evaluation
2: In str_pad(sc$xc, str_length(sc$Nc)) :
internal error -3 in R_decompress1

Please advise,
Ana

This topic was automatically closed 21 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.