library(ipfp)

set.seed(20151007)
A <- matrix(c(1,0,0, 1,0,0, 0,1,0, 0,1,0, 0,0,1), nrow=3)
x <- rgamma(ncol(A), 10, 1/100)
y <- A %*% x
x0 <- x * rgamma(length(x), 10, 10)
ans0 <- ipfp(y, A, x0, full=TRUE)
ans0$x
## [1] 1265.0387  694.1385  861.8151 1355.4993 1077.3767
x1 <- x * rgamma(length(x), 10, 10)
ans1 <- ipfp(y, A, x1, full=TRUE)
ans1$x
## [1] 1173.6607  785.5166 1202.2530 1015.0614 1077.3767