Código e Resultados

# Pacotes

library("readxl")
library("ggplot2")
library("rsm")
library("plotly")
library("tidyverse")
library("emmeans")
library("magrittr")

# Dados

dados <- read_excel("dados_walmes.xlsx", sheet = "Tabela")

# Análise

lattice::cloud(Tempo ~ Largura + Comprimento, data = dados, cex = 2, col = "red")

# Ajuste

tb <- dados %>% group_by(Grupo, Comprimento, Largura) %>%
        summarise(y = mean(Tempo),
                  s = sd(Tempo),
                  n = n()
                  ) %>% ungroup()

ajuste <- lm(y ~ Comprimento * Largura, data = tb)

summary(ajuste)
## 
## Call:
## lm(formula = y ~ Comprimento * Largura, data = tb)
## 
## Residuals:
##       1       2       3       4       5 
##  0.1187  0.1187 -0.4725  0.1176  0.1176 
## 
## Coefficients:
##                     Estimate Std. Error t value Pr(>|t|)
## (Intercept)          1.14113    2.24586   0.508    0.701
## Comprimento          0.08936    0.63219   0.141    0.911
## Largura             -0.46333    1.67055  -0.277    0.828
## Comprimento:Largura  0.25481    0.46958   0.543    0.683
## 
## Residual standard error: 0.5283 on 1 degrees of freedom
## Multiple R-squared:  0.7949, Adjusted R-squared:  0.1797 
## F-statistic: 1.292 on 3 and 1 DF,  p-value: 0.5562
# ANOVA 

anova(ajuste)
## Analysis of Variance Table
## 
## Response: y
##                     Df  Sum Sq Mean Sq F value Pr(>F)
## Comprimento          1 0.84221 0.84221  3.0179 0.3325
## Largura              1 0.15734 0.15734  0.5638 0.5900
## Comprimento:Largura  1 0.08218 0.08218  0.2945 0.6835
## Residuals            1 0.27907 0.27907