library(magrittr)
library(ggplot2)

# original data 
x=c(25, 12.5, 6.25, 3.125, 1, 0.5) %>% log2()
y=c(0.737, 0.525, 0.371, 0.259, 0.164, 0.048) %>% log2()
df <- tibble::tibble(x = x , y = y )

# original data plot 
df %>% ggplot2::ggplot(aes(x = x, y = y)) + ggplot2::geom_point() + geom_line()

#Build model 
mm <- lm(y ~ x, data = df)

# build formula 
y.pred = mm$coefficients[[2]] * df$x + mm$coefficients[[1]]
 
# plot from prediction  
df.pred <-tibble::tibble(x = x , y = y.pred )

df.pred %>% ggplot2::ggplot(aes(x = x, y = y)) + ggplot2::geom_point() + geom_line()

Created on 2022-04-06 by the reprex package (v2.0.0)