Linearidade na aplicação de extensômetros nas pontes de Wheatstone

\(e = (-DR1/R+DR2/R+DR3/R-DR4/R)/(4+2*(DR1/R+DR2/R+DR3/R+DR4/R))*E\)

rm (list=ls())
par(mfrow=c(2, 4))

prc <- 50/100
Rs <- 120 #ohms
E <- 24000 #mV

P <- seq(-Rs*prc,Rs*prc,by=0.01)
N <- seq(Rs*prc,-Rs*prc,by=-0.01)
wheat <- function(E, DR1,DR2,DR3,DR4) {
  return((-DR1/Rs+DR2/Rs+DR3/Rs-DR4/Rs)/(4+2*(DR1/Rs+DR2/Rs+DR3/Rs+DR4/Rs))*E)
}
plot(N, wheat(E, N, 0, 0, 0), type='l', xlab=expression(Omega), ylab="mV", main="1/4, 1N")
plot(N, wheat(E, 0, N, 0, 0), type='l', xlab=expression(Omega), ylab="mV", main="1/4, 2N")
plot(N, wheat(E, N, P, 0, 0), type='l', xlab=expression(Omega), ylab="mV", main="2/4, 1N 2P")
plot(N, wheat(E, N, N, 0, 0), type='l', xlab=expression(Omega), ylab="mV", main="2/4, 1N 2N")
plot(N, wheat(E, N, 0, P, 0), type='l', xlab=expression(Omega), ylab="mV", main="2/4, 1N 3P")
plot(N, wheat(E, N, 0, 0, N), type='l', xlab=expression(Omega), ylab="mV", main="2/4, 1N 4N")
plot(N, wheat(E, N, P, P, N), type='l', xlab=expression(Omega), ylab="mV", main="4/4, 1N 2P 3P 4N")
plot(N, wheat(E, N, P, P, P), type='l', xlab=expression(Omega), ylab="mV", main="4/4, 1N 2P 3P 4P")

plot of chunk unnamed-chunk-1