This notebook checks the frame rate of every kinect skeleton file in the military dataset.

If the minimum framerate of the file is less than 10, the frame rate plot is displayed. This is to check if the low frame rate is an outlier or if the frame rate of the file is actually low.

Load

library(ggplot2)
library(dplyr)
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
library(plotly)
## 
## Attaching package: 'plotly'
## The following object is masked from 'package:ggplot2':
## 
##     last_plot
## The following object is masked from 'package:stats':
## 
##     filter
## The following object is masked from 'package:graphics':
## 
##     layout
library(magrittr)

#cat("Files inside lenovo folder are obtained from running Kinect files on Lenovo laptop.\n\n")
#cat("Files inside VAIO folder are obtained from running Kinect files on Sony VAIO laptop.\n\n")
#cat("File naming convention: A file with format .._0i.csv means that the .csv file was obtained in the i-th run of Kinect Studio for that file, without changing the loaded Kinect file in the kinect Studio between consecutive runs.\n\n")


dataDir <- '../../Military/'

# Military Kinect Skeleton Files
files <- c(
  paste0(dataDir, "P061/P061_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_152419_00.csv"),
paste0(dataDir, "P061/P061_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185641_00.csv"),
paste0(dataDir, "P062/P062_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_151523_00.csv"),
paste0(dataDir, "P062/P062_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185137_00.csv"),
paste0(dataDir, "P063/P063_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_154717_00.csv"),
paste0(dataDir, "P063/P063_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190429_00.csv"),
paste0(dataDir, "P064/P064_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_154401_00.csv"),
paste0(dataDir, "P064/P064_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190551_00.csv"),
paste0(dataDir, "P065/P065_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_153925_00.csv"),
paste0(dataDir, "P065/P065_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_184410_00.csv"),
paste0(dataDir, "P067/P067_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_151613_00.csv"),
paste0(dataDir, "P067/P067_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_191204_00.csv"),
paste0(dataDir, "P068/P068_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_150610_00.csv"),
paste0(dataDir, "P068/P068_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190626_00.csv"),
paste0(dataDir, "P069/P069_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_154037_00.csv"),
paste0(dataDir, "P069/P069_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_191057_00.csv"),
paste0(dataDir, "P072/P072_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_152742_00.csv"),
paste0(dataDir, "P072/P072_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185014_00.csv"),
paste0(dataDir, "P073/P073_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_154910_00.csv"),
paste0(dataDir, "P073/P073_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_191510_00.csv"),
paste0(dataDir, "P074/P074_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_150433_00.csv"),
paste0(dataDir, "P074/P074_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190240_00.csv"),
paste0(dataDir, "P077/P077_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_151417_00.csv"),
paste0(dataDir, "P077/P077_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190506_00.csv"),
paste0(dataDir, "P078/P078_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_154505_00.csv"),
paste0(dataDir, "P078/P078_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_184619_00.csv"),
paste0(dataDir, "P079/P079_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_152654_00.csv"),
paste0(dataDir, "P079/P079_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_184928_00.csv"),
paste0(dataDir, "P081/P081_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_153835_00.csv"),
paste0(dataDir, "P081/P081_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185904_00.csv"),
paste0(dataDir, "P082/P082_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_145508_00.csv"),
paste0(dataDir, "P083/P083_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_145337_00.csv"),
paste0(dataDir, "P083/P083_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_194133_00.csv"),
paste0(dataDir, "P084/P084_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_151225_00.csv"),
paste0(dataDir, "P084/P084_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_184118_00.csv"),
paste0(dataDir, "P085/P085_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_154811_00.csv"),
paste0(dataDir, "P085/P085_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_184701_00.csv"),
paste0(dataDir, "P086/P086_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_152157_00.csv"),
paste0(dataDir, "P086/P086_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_191705_00.csv"),
paste0(dataDir, "P087/P087_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_150250_00.csv"),
paste0(dataDir, "P087/P087_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190204_00.csv"),
paste0(dataDir, "P088/P088_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_155347_00.csv"),
paste0(dataDir, "P088/P088_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185449_00.csv"),
paste0(dataDir, "P089/P089_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_151128_00.csv"),
paste0(dataDir, "P089/P089_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185944_00.csv"),
paste0(dataDir, "P090/P090_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_152113_00.csv"),
paste0(dataDir, "P090/P090_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190753_00.csv"),
paste0(dataDir, "P091/P091_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_151337_00.csv"),
paste0(dataDir, "P091/P091_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185547_00.csv"),
paste0(dataDir, "P092/P092_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_153732_00.csv"),
paste0(dataDir, "P092/P092_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_184750_00.csv"),
paste0(dataDir, "P093/P093_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_145715_00.csv"),
paste0(dataDir, "P094/P094_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_153436_00.csv"),
paste0(dataDir, "P094/P094_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_193417_00.csv"),
paste0(dataDir, "P095/P095_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_152602_00.csv"),
paste0(dataDir, "P095/P095_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_191008_00.csv"),
paste0(dataDir, "P096/P096_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_152833_00.csv"),
paste0(dataDir, "P096/P096_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185732_00.csv"),
paste0(dataDir, "P097/P097_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_151846_00.csv"),
paste0(dataDir, "P097/P097_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185317_00.csv"),
paste0(dataDir, "P098/P098_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_153124_00.csv"),
paste0(dataDir, "P098/P098_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190024_00.csv"),
paste0(dataDir, "P099/P099_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_153526_00.csv"),
paste0(dataDir, "P099/P099_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190712_00.csv"),
paste0(dataDir, "P100/P100_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_153032_00.csv"),
paste0(dataDir, "P100/P100_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_184454_00.csv"),
paste0(dataDir, "P101/P101_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_153230_00.csv"),
paste0(dataDir, "P101/P101_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_191339_00.csv"),
paste0(dataDir, "P102/P102_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_155505_00.csv"),
paste0(dataDir, "P102/P102_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_191252_00.csv"),
paste0(dataDir, "P103/P103_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_145842_00.csv"),
paste0(dataDir, "P103/P103_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185404_00.csv"),
paste0(dataDir, "P104/P104_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_153330_00.csv"),
paste0(dataDir, "P104/P104_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_193036_00.csv"),
paste0(dataDir, "P105/P105_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_152246_00.csv"),
paste0(dataDir, "P105/P105_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_193324_00.csv"),
paste0(dataDir, "P106/P106_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_145942_00.csv"),
paste0(dataDir, "P106/P106_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_191820_00.csv"),
paste0(dataDir, "P107/P107_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_151930_00.csv"),
paste0(dataDir, "P107/P107_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_184204_00.csv"),
paste0(dataDir, "P108/P108_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_160842_00.csv"),
paste0(dataDir, "P108/P108_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185050_00.csv"),
paste0(dataDir, "P109/P109_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_150339_00.csv"),
paste0(dataDir, "P109/P109_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_184541_00.csv"),
paste0(dataDir, "P111/P111_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_152936_00.csv"),
paste0(dataDir, "P111/P111_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185219_00.csv"),
paste0(dataDir, "P112/P112_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_145616_00.csv"),
paste0(dataDir, "P112/P112_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185816_00.csv"),
paste0(dataDir, "P113/P113_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_151757_00.csv"),
paste0(dataDir, "P113/P113_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190844_00.csv"),
paste0(dataDir, "P114/P114_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_153632_00.csv"),
paste0(dataDir, "P116/P116_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_150146_00.csv"),
paste0(dataDir, "P116/P116_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_192945_00.csv"),
paste0(dataDir, "P117/P117_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_150043_00.csv"),
paste0(dataDir, "P117/P117_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190119_00.csv"),
paste0(dataDir, "P118/P118_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_154613_00.csv"),
paste0(dataDir, "P118/P118_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190317_00.csv"),
paste0(dataDir, "P119/P119_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_151702_00.csv"),
paste0(dataDir, "P119/P119_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_191422_00.csv"),
paste0(dataDir, "P120/P120_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_152026_00.csv"),
paste0(dataDir, "P120/P120_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_184829_00.csv")
  
)

for (file in files){
  cat(paste("Summary statistics for file", file, ":"),"\n")
  df <- read.csv(file)
  dt0 <- df$unix_timestamp[1] - (df$unix_timestamp[2]-df$unix_timestamp[1])
  df <- df %>% mutate(dt = unix_timestamp  - lag(unix_timestamp, default=dt0[1]))
  df <- df %>% mutate(fr = 1000/dt)
  print(summary(df$fr))
  if (min(df$fr)>=10)
    cat("This file has minimum FPS greater than 10.\n\n")
  if (min(df$fr) < 10)
  {
    cat("This file has minimum FPS lesser than 10. Check plot to see if if it is an outlier or a bad file.\n")
  print(ggplot(df, aes(frame_number, fr)) + geom_line() + geom_point() + ggtitle(file) +
          theme(plot.title = element_text(size = 10, face = "bold")) + ylab("Frame rate (fps)")+xlab("Time in seconds"))
  }
}
## Summary statistics for file ../../Military/P061/P061_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_152419_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   11.49   25.64   30.30   30.87   35.71   71.43 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P061/P061_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185641_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   6.369  25.000  28.571  29.263  32.258  55.556 
## This file has minimum FPS lesser than 10. Check plot to see if if it is an outlier or a bad file.

## Summary statistics for file ../../Military/P062/P062_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_151523_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   10.99   20.83   25.64   26.23   30.30   58.82 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P062/P062_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185137_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   12.66   22.73   26.32   27.47   31.25   47.62 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P063/P063_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_154717_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   11.90   25.00   29.41   29.35   33.33   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P063/P063_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190429_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   8.475  25.641  29.412  30.024  33.333  52.632 
## This file has minimum FPS lesser than 10. Check plot to see if if it is an outlier or a bad file.

## Summary statistics for file ../../Military/P064/P064_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_154401_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   13.89   25.64   30.30   30.62   35.71   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P064/P064_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190551_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##    8.85   27.78   30.30   30.93   34.48   55.56 
## This file has minimum FPS lesser than 10. Check plot to see if if it is an outlier or a bad file.

## Summary statistics for file ../../Military/P065/P065_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_153925_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   12.82   23.81   27.78   28.48   32.26   52.63 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P065/P065_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_184410_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   11.63   22.73   26.32   27.08   30.30   66.67 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P067/P067_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_151613_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   14.49   25.00   28.57   29.71   34.48   58.82 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P067/P067_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_191204_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   11.76   25.00   29.41   29.71   33.33   52.63 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P068/P068_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_150610_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   13.51   23.12   27.78   28.68   34.48   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P068/P068_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190626_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   13.33   28.57   30.30   31.02   33.33   52.63 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P069/P069_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_154037_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   10.87   24.39   29.41   30.31   35.71   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P069/P069_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_191057_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   14.93   27.78   30.30   31.34   34.48   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P072/P072_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_152742_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   13.16   21.28   25.64   26.24   30.30   55.56 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P072/P072_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185014_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   15.38   24.39   27.78   29.06   33.33   52.63 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P073/P073_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_154910_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   12.99   23.81   28.57   28.67   33.33   47.62 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P073/P073_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_191510_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##    5.65   27.78   30.30   31.12   33.33   90.91 
## This file has minimum FPS lesser than 10. Check plot to see if if it is an outlier or a bad file.

## Summary statistics for file ../../Military/P074/P074_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_150433_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   10.99   25.00   28.57   29.23   32.26   66.67 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P074/P074_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190240_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   7.812  26.316  30.303  30.439  34.483  55.556 
## This file has minimum FPS lesser than 10. Check plot to see if if it is an outlier or a bad file.

## Summary statistics for file ../../Military/P077/P077_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_151417_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   13.33   23.81   28.57   28.94   33.33   47.62 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P077/P077_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190506_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   12.66   24.39   27.78   28.98   32.26   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P078/P078_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_154505_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   13.70   25.64   30.30   30.62   35.71   58.82 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P078/P078_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_184619_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   14.93   26.32   30.30   31.18   35.71  166.67 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P079/P079_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_152654_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   10.53   25.00   29.41   29.62   33.33   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P079/P079_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_184928_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   12.66   21.17   25.00   25.58   29.41   47.62 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P081/P081_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_153835_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   15.38   26.15   29.41   30.43   34.48   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P081/P081_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185904_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   5.952  27.778  30.303  31.239  33.333 111.111 
## This file has minimum FPS lesser than 10. Check plot to see if if it is an outlier or a bad file.

## Summary statistics for file ../../Military/P082/P082_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_145508_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   12.66   22.73   27.78   28.17   33.33   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P083/P083_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_145337_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   6.667  23.256  27.778  28.262  32.258  76.923 
## This file has minimum FPS lesser than 10. Check plot to see if if it is an outlier or a bad file.

## Summary statistics for file ../../Military/P083/P083_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_194133_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   8.475  27.778  30.303  30.884  33.333  52.632 
## This file has minimum FPS lesser than 10. Check plot to see if if it is an outlier or a bad file.

## Summary statistics for file ../../Military/P084/P084_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_151225_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   11.11   23.26   27.78   28.30   33.33   47.62 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P084/P084_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_184118_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   17.24   27.03   31.25   31.40   35.71   66.67 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P085/P085_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_154811_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   13.70   21.74   26.32   27.44   32.26   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P085/P085_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_184701_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   15.15   27.03   30.30   31.35   35.71   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P086/P086_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_152157_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   12.99   25.00   30.30   30.34   35.71   47.62 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P086/P086_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_191705_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   6.623  24.390  27.778  28.305  32.258  55.556 
## This file has minimum FPS lesser than 10. Check plot to see if if it is an outlier or a bad file.

## Summary statistics for file ../../Military/P087/P087_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_150250_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   10.42   20.41   25.00   25.98   31.25   45.45 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P087/P087_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190204_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   10.87   27.03   31.25   31.81   35.71   62.50 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P088/P088_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_155347_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   12.99   24.39   28.57   28.98   33.33   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P088/P088_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185449_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   12.20   24.39   28.57   29.32   33.33   58.82 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P089/P089_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_151128_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   14.71   23.81   28.57   29.28   34.48   47.62 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P089/P089_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185944_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##    6.41   25.00   29.41   29.75   34.48   58.82 
## This file has minimum FPS lesser than 10. Check plot to see if if it is an outlier or a bad file.

## Summary statistics for file ../../Military/P090/P090_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_152113_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   10.42   20.41   25.00   25.55   29.41   47.62 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P090/P090_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190753_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   16.67   27.78   30.30   30.49   33.33   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P091/P091_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_151337_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   11.11   21.28   25.64   26.29   30.30   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P091/P091_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185547_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   8.065  23.810  28.571  29.702  34.483  55.556 
## This file has minimum FPS lesser than 10. Check plot to see if if it is an outlier or a bad file.

## Summary statistics for file ../../Military/P092/P092_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_153732_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   11.11   20.41   24.39   25.11   29.41   43.48 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P092/P092_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_184750_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   11.49   21.74   26.32   26.56   31.25   47.62 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P093/P093_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_145715_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   12.66   24.39   29.41   29.46   34.48   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P094/P094_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_153436_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   12.82   21.28   26.32   26.44   30.30   43.48 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P094/P094_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_193417_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   6.173  25.641  29.412  29.635  33.333  58.824 
## This file has minimum FPS lesser than 10. Check plot to see if if it is an outlier or a bad file.

## Summary statistics for file ../../Military/P095/P095_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_152602_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   13.16   22.22   26.32   26.93   31.25   47.62 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P095/P095_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_191008_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   13.33   25.00   29.41   29.89   34.48   55.56 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P096/P096_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_152833_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   16.39   25.64   29.41   29.92   34.48   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P096/P096_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185732_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   12.05   27.78   30.30   30.93   33.33   52.63 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P097/P097_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_151846_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   8.403  20.833  25.000  26.232  31.250  71.429 
## This file has minimum FPS lesser than 10. Check plot to see if if it is an outlier or a bad file.

## Summary statistics for file ../../Military/P097/P097_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185317_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##    8.00   24.39   27.78   28.66   32.26   50.00 
## This file has minimum FPS lesser than 10. Check plot to see if if it is an outlier or a bad file.

## Summary statistics for file ../../Military/P098/P098_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_153124_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   12.20   24.39   28.57   29.21   33.33   47.62 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P098/P098_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190024_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   12.35   24.39   28.57   28.64   32.26   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P099/P099_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_153526_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   14.71   25.00   28.57   29.53   34.48   45.45 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P099/P099_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190712_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   12.82   25.64   28.57   29.76   33.33   58.82 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P100/P100_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_153032_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   12.66   20.83   25.00   25.59   29.41   47.62 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P100/P100_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_184454_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   14.71   26.32   30.30   30.48   34.48   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P101/P101_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_153230_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   12.20   20.83   24.39   25.70   30.30   66.67 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P101/P101_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_191339_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   11.63   22.99   27.03   28.21   33.33   58.82 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P102/P102_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_155505_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   14.08   26.32   29.41   30.27   33.33   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P102/P102_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_191252_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   12.50   27.78   30.30   31.81   34.48  500.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P103/P103_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_145842_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   13.33   21.28   27.03   27.11   32.26   62.50 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P103/P103_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185404_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   18.87   27.78   29.41   30.53   33.33   55.56 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P104/P104_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_153330_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   12.05   20.41   25.00   25.85   30.30   47.62 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P104/P104_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_193036_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   9.174  27.027  30.303  30.747  34.483  62.500 
## This file has minimum FPS lesser than 10. Check plot to see if if it is an outlier or a bad file.

## Summary statistics for file ../../Military/P105/P105_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_152246_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   11.11   23.81   27.78   28.68   33.33   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P105/P105_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_193324_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   10.10   27.78   30.30   30.88   33.33   58.82 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P106/P106_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_145942_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   13.70   22.22   26.32   27.07   31.25   47.62 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P106/P106_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_191820_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   19.23   28.57   30.30   31.02   32.26   76.92 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P107/P107_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_151930_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   11.11   24.39   29.41   30.69   35.71  333.33 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P107/P107_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_184204_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   12.82   23.81   28.57   28.46   32.26   47.62 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P108/P108_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_160842_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   14.29   25.00   29.41   29.93   34.48   62.50 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P108/P108_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185050_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   14.49   27.03   31.25   31.32   34.48   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P109/P109_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_150339_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   15.15   23.81   28.57   28.61   33.33   47.62 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P109/P109_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_184541_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   10.99   22.22   26.32   26.74   30.30   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P111/P111_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_152936_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   9.615  24.390  29.412  29.530  34.483  50.000 
## This file has minimum FPS lesser than 10. Check plot to see if if it is an outlier or a bad file.

## Summary statistics for file ../../Military/P111/P111_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185219_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   8.772  25.000  29.412  29.808  34.483  58.824 
## This file has minimum FPS lesser than 10. Check plot to see if if it is an outlier or a bad file.

## Summary statistics for file ../../Military/P112/P112_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_145616_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   11.11   25.64   29.41   30.47   34.48  333.33 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P112/P112_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_185816_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   14.29   27.78   30.30   30.26   32.26   45.45 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P113/P113_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_151757_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   10.31   20.83   25.00   26.32   31.25   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P113/P113_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190844_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   14.08   24.10   28.57   28.98   33.33   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P114/P114_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_153632_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   14.29   26.32   30.30   30.70   34.48   47.62 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P116/P116_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_150146_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   13.33   25.00   28.57   29.81   34.48   47.62 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P116/P116_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_192945_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   11.36   26.32   29.41   30.08   33.33   52.63 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P117/P117_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_150043_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   12.50   20.41   24.39   25.35   29.41   45.45 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P117/P117_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190119_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   9.009  22.727  27.027  28.144  32.258  52.632 
## This file has minimum FPS lesser than 10. Check plot to see if if it is an outlier or a bad file.

## Summary statistics for file ../../Military/P118/P118_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_154613_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   12.99   23.81   27.78   28.27   32.26   50.00 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P118/P118_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_190317_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   6.024  24.390  28.571  29.153  34.483  52.632 
## This file has minimum FPS lesser than 10. Check plot to see if if it is an outlier or a bad file.

## Summary statistics for file ../../Military/P119/P119_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_151702_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   12.35   24.39   28.57   29.10   34.48   47.62 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P119/P119_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_191422_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##    8.85   23.81   27.78   28.93   33.33   55.56 
## This file has minimum FPS lesser than 10. Check plot to see if if it is an outlier or a bad file.

## Summary statistics for file ../../Military/P120/P120_KINECT_SKELETON_VISIT_1_TASK_4_REP_1_20170621_152026_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   15.62   24.39   28.57   29.13   33.33   47.62 
## This file has minimum FPS greater than 10.
## 
## Summary statistics for file ../../Military/P120/P120_KINECT_SKELETON_VISIT_2_TASK_4_REP_1_20170623_184829_00.csv : 
##    Min. 1st Qu.  Median    Mean 3rd Qu.    Max. 
##   16.13   27.03   30.30   31.18   34.48   52.63 
## This file has minimum FPS greater than 10.