First Simio Models 2 / Random Number Generation

p = The steady-state utilitization of a server

L = The steady-state average number of entities in system

W = The steady-state average time in system

Wq = The steady state average time in queue

Lq = The steady-state average number of entities in queue

4.2

MM1<-function(mu,lambda){
  p.v <- lambda / mu
  L.v <- p.v/(1-p.v)
  W.v <- L.v/lambda
  Wq.v <- W.v-(1/mu)
  Lq.v <- lambda*Wq.v
  rList=list(
    p = p.v,
    Lq = Lq.v,
    L = L.v,
    Wq = Wq.v,
    W = W.v
  )
  return(rList)
}

#arrival rate 120 per hour
#service rate 190 per hour

a<-MM1(190,120)
exp100<-100/a$W

The steady-state average time in system is 0.0142857 hours. The expected number of entities processed in 100 hours is 7000 entities.

4.3

The following model was build using Simio, and metrics were calculated as experimental response statistics as shown in the following image.

Simio Results

Simio Results

To demonstrate a SMORE plot - a rotated histogram with quantiles - I have attached the distributions of repeated P-values as follows.

Simio P SMORE

Simio P SMORE

4.9

Expanding upon the previous model, it is now asked to build the model using Simio Processes. This was accomplished by creating a Resource (called Resource 1) and then chaining together processes. An experiment was built using 50 replications.

Simio P SMORE

Simio P SMORE

Simio Process Chain

Simio Process Chain

Simio Model Results

Simio Model Results

4.12

Simio Animation Test (sound integration test warning)

Youtube Link