diff --git a/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/execute-results/html.json b/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/execute-results/html.json index c0469fa..aba5078 100644 --- a/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/execute-results/html.json +++ b/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/execute-results/html.json @@ -1,8 +1,8 @@ { - "hash": "ce4083462c73006aa212a21024561275", + "hash": "07cad3ed80372fe50830d24f44828b6c", "result": { "engine": "knitr", - "markdown": "---\ntitle: \"Getting details of historic orthophoto imagery with R\"\nauthor: \"al\"\ndate: \"2024-11-15\"\ndate-modified: \"2024-11-17\"\ncategories: [fwapg, r, bcdata]\nimage: \"image.jpg\"\nparams:\n repo_owner: \"NewGraphEnvironment\"\n repo_name: \"new_graphiti\"\n post_name: \"2024-11-15-bcdata-ortho-historic\"\n update_gis: FALSE\nformat: \n html:\n code-fold: true\n---\n\n\nWe would like to obtain historic ortho photo imagery so that we can compare historic watershed conditions compared to current (ex. floodplain vegetation clearing, channel morphology, etc.). First we will generate an area of interest. In our first few code chunks we load our packages and load in some functions that will help us do this work.\n\n\n\n\n::: {.cell}\n\n```{.r .cell-code}\nsuppressMessages(library(tidyverse))\nlibrary(ggplot2)\nlibrary(bcdata)\nlibrary(fwapgr)\nsuppressMessages(library(sf))\n# library(leaflet)\n# library(leafem)\n```\n:::\n\n::: {.cell}\n\n```{.r .cell-code}\npath_post <- fs::path(\n here::here(),\n \"posts\",\n params$post_name\n)\n```\n:::\n\n::: {.cell}\n\n```{.r .cell-code}\nstaticimports::import(\n dir = fs::path(\n path_post,\n \"scripts\"\n ),\n outfile = fs::path(\n path_post,\n \"scripts\",\n \"staticimports\",\n ext = \"R\"\n )\n)\n```\n:::\n\n::: {.cell}\n\n```{.r .cell-code}\nsource(\n fs::path(\n path_post,\n \"scripts\",\n \"staticimports\",\n ext = \"R\"\n )\n)\n\n\nlfile_name <- function(dat_name = NULL, ext = \"geojson\") {\n fs::path(\n path_post,\n \"data\",\n paste0(dat_name, \".\", ext)\n )\n}\n\nlburn_sf <- function(dat = NULL, dat_name = NULL) {\n if (is.null(dat_name)) {\n cli::cli_abort(\"You must provide a name for the GeoJSON file using `dat_name`.\")\n }\n \n dat |>\n sf::st_write(\n lfile_name(dat_name),\n delete_dsn = TRUE\n # append = FALSE\n )\n}\n\n# Function to validate and repair geometries\nlngs_geom_validate <- function(layer) {\n layer <- sf::st_make_valid(layer)\n layer <- layer[sf::st_is_valid(layer), ]\n return(layer)\n}\n```\n:::\n\n\n\n## Download Spatial Data Layers\nHere we download our area of interest which is the Neexdzii Kwah River (a.k.a Upper Bulkley River) which is located between Houston, BC (just south of Smithers) and Topley, BC which is east of Houston and north of Burns Lake, BC. We hit up our remote database managed by Simon Norris with a package built by Poisson Consulting specifically for the task. We use the `downstream_route_measure` of the Bulkley River (identified through a unique `blue_line_key`) to query the watershed area upstream of the point where the Neexdzii Kwah River enters the Wedzin Kwah River (a.k.a Morice River).\n\n\n::: {.cell}\n\n```{.r .cell-code}\n# lets build a custom watersehed just for upstream of the confluence of Neexdzii Kwa and Wetzin Kwa\n# blueline key\nblk <- 360873822\n# downstream route measure\ndrm <- 166030.4\n\naoi <- fwapgr::fwa_watershed_at_measure(blue_line_key = blk, \n downstream_route_measure = drm) |> \n sf::st_transform(4326)\n\n\n#get the bounding box of our aoi\n# aoi_bb <- sf::st_bbox(aoi)\n\n#lets burn this so we don't need to download each time\naoi <- lngs_geom_validate(aoi)\nlburn_sf(\n aoi,\n deparse(substitute(aoi)))\n```\n:::\n\n\nNext we grab a few key layers from the BC Data Catalougue API using convience functions in our `rfp` package (\"Reproducable Field Products\") which wrap the provincially maintained `bcdata` package. We grab:\n\n - Railways\n - Streams in the Bulkley Watershed group that are 5th order or greater.\n - [Historic Imagery Points](https://catalogue.data.gov.bc.ca/dataset/airborne-imagery-historical-index-map-points)\n - [Historic Imagery Polygons](https://catalogue.data.gov.bc.ca/dataset/airborne-imagery-historical-index-map-polygons)\n - [NTS 1:50,000 Grid](https://catalogue.data.gov.bc.ca/) (we will see why in a second)\n - [Air Photo Centroids](https://catalogue.data.gov.bc.ca/dataset/airphoto-centroids)\n \n\n\n\n::: {.cell}\n\n```{.r .cell-code}\n# grab all the railways\nl_rail <- rfp::rfp_bcd_get_data(\n bcdata_record_id = \"whse_basemapping.gba_railway_tracks_sp\"\n) |> \n sf::st_transform(4326) |> \n janitor::clean_names() \n\n\n# streams in the bulkley and then filter to just keep the big ones\nl_streams <- rfp::rfp_bcd_get_data(\n bcdata_record_id = \"whse_basemapping.fwa_stream_networks_sp\",\n col_filter = \"watershed_group_code\",\n col_filter_value = \"BULK\",\n # grab a smaller object by including less columns\n col_extract = c(\"linear_feature_id\", \"stream_order\", \"gnis_name\", \"downstream_route_measure\", \"blue_line_key\", \"length_metre\")\n) |> \n sf::st_transform(4326) |> \n janitor::clean_names() |> \n dplyr::filter(stream_order > 4)\n\n# historic orthophotos\n# WHSE_IMAGERY_AND_BASE_MAPS.AIMG_HIST_INDEX_MAPS_POLY\n#https://catalogue.data.gov.bc.ca/dataset/airborne-imagery-historical-index-map-points\nl_imagery <- rfp::rfp_bcd_get_data(\n bcdata_record_id = \"WHSE_IMAGERY_AND_BASE_MAPS.AIMG_ORTHOPHOTO_TILES_POLY\") |> \n sf::st_transform(4326) |> \n janitor::clean_names()\n\nl_imagery_hist <- rfp::rfp_bcd_get_data(\n bcdata_record_id = \"WHSE_IMAGERY_AND_BASE_MAPS.AIMG_HIST_INDEX_MAPS_POINT\") |> \n sf::st_transform(4326) |> \n janitor::clean_names()\n\nl_imagery_grid <- rfp::rfp_bcd_get_data(\n bcdata_record_id = \"WHSE_BASEMAPPING.NTS_50K_GRID\") |> \n sf::st_transform(4326) |> \n janitor::clean_names()\n```\n:::\n\n\nFollowing download we run some clean up to ensure the geometry of our spatial files is \"valid\", trim to our area of interest and burn locally so that every time we rerun iterations of this memo we don't need to wait for the download process which takes a little longer than we want to wait.\n\n\n::: {.cell}\n\n```{.r .cell-code}\n# get a list of the objects in our env that start with l_\nls <- ls()[stringr::str_starts(ls(), \"l_\")] \n\nlayers_all <- tibble::lst(\n !!!mget(ls)\n)\n\n# Apply validation to the AOI and layers\nlayers_all <- purrr::map(\n layers_all, \n lngs_geom_validate\n )\n\n# clip them with purrr and sf\nlayers_trimmed <- purrr::map(\n layers_all,\n ~ sf::st_intersection(.x, aoi)\n) \n\n# Burn each `sf` object to GeoJSON\npurrr::walk2(\n layers_trimmed,\n names(layers_trimmed),\n lburn_sf\n)\n```\n:::\n\n::: {.cell}\n\n```{.r .cell-code}\n# lets use the nts mapsheet to query the photo centroids to avoid a massive file download\ncol_value <- layers_trimmed$l_imagery_grid |> \n dplyr::pull(map_tile) \n\n \n\nl_photo_centroids <- rfp::rfp_bcd_get_data(\n bcdata_record_id = \"WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP\",\n col_filter = \"nts_tile\",\n col_filter_value = col_value) |> \n sf::st_transform(4326) |> \n janitor::clean_names()\n\n# Apply validation to the AOI and layers\nl_photo_centroids <-lngs_geom_validate(l_photo_centroids)\n\n# clip to aoi - can use layers_trimmed$aoi \nl_photo_centroids <- sf::st_intersection(l_photo_centroids, aoi)\n\n\nlburn_sf(l_photo_centroids, \"l_photo_centroids\")\n```\n:::\n\n\nNext - we read the layers back in. The download step is skipped now unless we turn it on again by changing the `update_gis` param in our memo `yaml` header to `TRUE`.\n\n\n::: {.cell}\n\n```{.r .cell-code}\n# now we read in all the sf layers that are local so it is really quick\nlayers_to_load <- fs::dir_ls(\n fs::path(\n path_post,\n \"data\"),\n glob = \"*.geojson\"\n)\n\nlayers_trimmed <- layers_to_load |>\n purrr::map(\n ~ sf::st_read(\n .x, quiet = TRUE)\n ) |> \n purrr::set_names(\n nm =tools::file_path_sans_ext(\n basename(\n names(\n layers_to_load\n )\n )\n )\n )\n```\n:::\n\n\nOK, seems we cannot get machine readable historical air photo information from the downloaded from the BC data catalogue [Historic Imagery Points](https://catalogue.data.gov.bc.ca/dataset/airborne-imagery-historical-index-map-points)\n and [Historic Imagery Polygons](https://catalogue.data.gov.bc.ca/dataset/airborne-imagery-historical-index-map-polygons) layers perhpas because the majority of the photos are not georeferenced? What we see in the map under the table below (red dot on map) is one point which contains 8 records including links to pdfs and kmls which are basically a georeferenced drawing of where the imagery overlaps. From as far as I can tell - if we wanted to try to use these kmls or pdfs to select orthoimagery we would need to manually eyeball where the photo polygons overlap where we want to see imagery for and manually write down identifiers for photo by hand. Maybe I am missing something but it sure seems that way. \n \n \n\n::: {.cell}\n\n```{.r .cell-code}\n#This what the information in the [Historic Imagery Points](https://catalogue.data.gov.bc.ca/dataset/airborne-imagery-historical-index-map-points) layer looks like.\n\nlayers_trimmed$l_imagery_hist |> \n sf::st_drop_geometry() |> \n knitr::kable()\n```\n\n::: {.cell-output-display}\n\n\n|id | historical_index_map_id|scale_category |geoextent_mapsheet |map_tag | start_year| end_year|kml_url |pdf_url | objectid|se_anno_cad_data | area_ha|localcode_ltree |refine_method |wscode_ltree |\n|:---------------------------------------------------------|-----------------------:|:--------------|:------------------|:--------|----------:|--------:|:-----------------------------------------------------------------------------------|:------------------------------------------------------------------------------------------------------------------------------------------|--------:|:----------------|--------:|:-----------------|:-------------|:------------|\n|WHSE_IMAGERY_AND_BASE_MAPS.AIMG_HIST_INDEX_MAPS_POINT.557 | 557|large |093l_e |093l_e_1 | 1950| 1963|https://openmaps.gov.bc.ca/flight_indices/kml/large_scale/093/93l_e_1_1950_1963.kml |https://openmaps.gov.bc.ca/flight_indices/pdf/large_scale_block_10000_to_25000/093_nts/93l_e/93l_e_sheet_1_20ch_1950_1963.pdf | 1860|NA | 231944.7|400.431358.585806 |CUT |400.431358 |\n|WHSE_IMAGERY_AND_BASE_MAPS.AIMG_HIST_INDEX_MAPS_POINT.558 | 558|large |093l_e |093l_e_2 | 1971| 1974|https://openmaps.gov.bc.ca/flight_indices/kml/large_scale/093/93l_e_2_1971_1974.kml |https://openmaps.gov.bc.ca/flight_indices/pdf/large_scale_block_10000_to_25000/093_nts/93l_e/93l_e_sheet_2_20ch_1971_1974.pdf | 1861|NA | 231944.7|400.431358.585806 |CUT |400.431358 |\n|WHSE_IMAGERY_AND_BASE_MAPS.AIMG_HIST_INDEX_MAPS_POINT.559 | 559|large |093l_e |093l_e_3 | 1975| 1975|https://openmaps.gov.bc.ca/flight_indices/kml/large_scale/093/93l_e_3_1975.kml |https://openmaps.gov.bc.ca/flight_indices/pdf/large_scale_block_10000_to_25000/093_nts/93l_e/93l_e_sheet_3_20k_1975.pdf | 1862|NA | 231944.7|400.431358.585806 |CUT |400.431358 |\n|WHSE_IMAGERY_AND_BASE_MAPS.AIMG_HIST_INDEX_MAPS_POINT.560 | 560|large |093l_e |093l_e_4 | 1980| 1980|https://openmaps.gov.bc.ca/flight_indices/kml/large_scale/093/93l_e_4_1980.kml |https://openmaps.gov.bc.ca/flight_indices/pdf/large_scale_block_10000_to_25000/093_nts/93l_e/93l_e_sheet_4_20k_1980.pdf | 1863|NA | 231944.7|400.431358.585806 |CUT |400.431358 |\n|WHSE_IMAGERY_AND_BASE_MAPS.AIMG_HIST_INDEX_MAPS_POINT.561 | 561|large |093l_e |093l_e_5 | 1980| 1980|https://openmaps.gov.bc.ca/flight_indices/kml/large_scale/093/93l_e_5_1980.kml |https://openmaps.gov.bc.ca/flight_indices/pdf/large_scale_block_10000_to_25000/093_nts/93l_e/93l_e_sheet_5_10k_1980.pdf | 1864|NA | 231944.7|400.431358.585806 |CUT |400.431358 |\n|WHSE_IMAGERY_AND_BASE_MAPS.AIMG_HIST_INDEX_MAPS_POINT.562 | 562|large |093l_e |093l_e_6 | 1981| 1983|https://openmaps.gov.bc.ca/flight_indices/kml/large_scale/093/93l_e_6_1981_1983.kml |https://openmaps.gov.bc.ca/flight_indices/pdf/large_scale_block_10000_to_25000/093_nts/93l_e/93l_e_sheet_6_20k_1981_1983.pdf | 1865|NA | 231944.7|400.431358.585806 |CUT |400.431358 |\n|WHSE_IMAGERY_AND_BASE_MAPS.AIMG_HIST_INDEX_MAPS_POINT.563 | 563|large |093l_e |093l_e_7 | 1989| 1989|https://openmaps.gov.bc.ca/flight_indices/kml/large_scale/093/93l_e_7_1989.kml |https://openmaps.gov.bc.ca/flight_indices/pdf/large_scale_block_10000_to_25000/093_nts/93l_e/93l_e_sheet_7_15k_1989.pdf | 1866|NA | 231944.7|400.431358.585806 |CUT |400.431358 |\n|WHSE_IMAGERY_AND_BASE_MAPS.AIMG_HIST_INDEX_MAPS_POINT.564 | 564|large |093l_e |093l_e_8 | 1990| 1990|https://openmaps.gov.bc.ca/flight_indices/kml/large_scale/093/93l_e_8_1990.kml |https://openmaps.gov.bc.ca/flight_indices/pdf/large_scale_block_10000_to_25000/093_nts/93l_e/93l_e_sheet_8_10k_15k_1990_bw_1990_colour.pdf | 1867|NA | 231944.7|400.431358.585806 |CUT |400.431358 |\n\n\n:::\n:::\n\n::: {.cell}\n\n```{.r .cell-code}\nmap <- ggplot() +\n geom_sf(\n data = layers_trimmed$aoi,\n fill = \"transparent\",\n color = \"black\",\n linewidth = .5\n ) +\n geom_sf(\n data = layers_trimmed$l_streams,\n color = \"blue\",\n size = 1\n ) +\n geom_sf(\n data = layers_trimmed$l_rail,\n color = \"black\",\n size = 1\n ) +\n # geom_sf(\n # data = layers_trimmed$l_imagery,\n # alpha = 0,\n # ) +\n geom_sf(\n data = layers_trimmed$l_imagery_hist,\n color = \"red\",\n size = 2\n ) +\n geom_sf(\n data = layers_trimmed$l_imagery_grid,\n alpha = 0.25,\n ) +\n geom_sf_text(\n data = layers_trimmed$l_imagery_grid,\n aes(label = map_tile),\n size = 3 # Adjust size of the text labels as needed\n )\n # ggdark::dark_theme_void()\n\n\nmap\n```\n\n::: {.cell-output-display}\n![](index_files/figure-html/unnamed-chunk-1-1.png){width=672}\n:::\n:::\n\n\nIt does however seem that the [Air Photo Centroids](https://catalogue.data.gov.bc.ca/dataset/airphoto-centroids) are georeferenced \n\n\n\n::: {.cell}\n\n```{.r .cell-code}\n#if we go through the online interface, we can use a NTS 1:50,000 map sheet to export a CSV file that does contain information about individual air photo locations (centre coordinate?). Our study area is huge so to begin with we can look at the area from somewhere around the confluence of McQuarie Creek and the Neexdzii Kwah up to say the upstream end of Bulkley Lake. For this area we just have two 1:50,000 map sheets (`093L09` and `093L08`). \n```\n:::\n\n::: {.cell}\n\n```{.r .cell-code}\n# ## Download Photo Information\n\n# Next, we go into the provincial [WIMSI](https://www2.gov.bc.ca/gov/content/data/geographic-data-services/digital-imagery/air-photos) service and for each NTS 1:50,000 grid - we state the date range we would like to search and export. Thinking we may be able to hit the API directly with a query in the future which would eliminate the painful point and click portion of this workflow. For now though - we are doing this piece manually and chose the following options:\n# \n# - `Years from`: 1950 to 2024\n# - `Media`: All\n# - `Only show georeferenced images`: - No\n# \n# Running these options exports a csv for each query. We saved them in this repo with their original sane names `airphotos.{mapsheet}.csv`.\n\nknitr::include_graphics(fs::path(\n path_post,\n \"fig\",\n \"Screenshot1\",\n ext = \"png\"\n )\n)\n```\n:::\n\n::: {.cell}\n\n```{.r .cell-code}\n# At this point we have downloaded two csvs (one for each NTS 1:50,000 mapsheet of course) with information about the airphotos including UTM coordinates that we will assume for now are the photo centres. In our next steps we read in what we have, turn into spatial object, trim to overall study area and plot.\n# list csvs\nls <- fs::dir_ls(\n fs::path(\n path_post,\n \"data\"),\n glob = \"*.csv\"\n)\n\nphotos_raw <- ls |> \n purrr::map_df(\n readr::read_csv\n ) |> \n sf::st_as_sf(\n coords = c(\"Longitude\", \"Latitude\"), crs = 4326\n ) |> \n janitor::clean_names() |> \n dplyr::mutate(photo_date = lubridate::mdy(photo_date)) \n\n\nphotos_aoi <- sf::st_intersection(\n photos_raw, \n layers_trimmed$aoi |> st_make_valid()\n )\n```\n:::\n\n::: {.cell}\n\n```{.r .cell-code}\nmap +\n geom_sf(\n data = layers_trimmed$l_photo_centroids,\n alpha = 0.25\n ) \n```\n\n::: {.cell-output-display}\n![](index_files/figure-html/map2-1.png){width=672}\n:::\n\n```{.r .cell-code}\n # geom_sf_text(\n # data = photos_aoi,\n # aes(\n # label = \n # paste(\n # # roll_frame_series,\n # frame,\n # sep = \"-\"\n # )\n # ),\n # size = 2 # Adjust size of the text labels as needed\n # )\n```\n:::\n\n\nThat is a lot of photos! 7910 photos to be exact!!!\n\n\n\n::: {.cell}\n\n```{.r .cell-code}\nq_buffer <- 500\nq_drm_main <- 263795\nq_drm_other <- 5000\n```\n:::\n\n\n## Clip Photo Information with Streams Buffers\nHere are our query parameters to narrow down the area within our selected mapsheets in which we want to find photos for:\n\n - Buffer: 500m - size of buffer used on either side of stream lines selected\n - Stream segments: \n + Bulkley River (`gnis_name` in the stream layer)\n + Maxan Creek\n + Buck Creek\n + stream segments which begin before 5000 from the mainstem\n\n\n\n\n::: {.cell}\n\n```{.r .cell-code}\n# We use the `downstream_route_measure` of the stream layer to exclude areas upstream of Bulkley Lake (also known as Taman Creek). We find it in QGIS by highlighting the stream layer and clicking on our segment of interest while we have the information tool selected - the resulting pop-up looks like this in QGIS.\nknitr::include_graphics(fs::path(\n path_post,\n \"fig\",\n \"Screenshot2\",\n ext = \"png\"\n )\n)\n```\n:::\n\n::: {.cell}\n\n```{.r .cell-code}\naoi_refined_raw <- layers_trimmed$l_streams |> \n # removed & downstream_route_measure < q_drm_main for bulkley as doestn't cahnge 1960s query and increases beyond just by 5 photos\n dplyr::filter(gnis_name == \"Bulkley River\"|\n gnis_name != \"Bulkley River\" & downstream_route_measure < q_drm_other |\n gnis_name %in% c(\"Maxan Creek\", \"Buck Creek\")) |> \n # dplyr::arrange(downstream_route_measure) |>\n # calculate when we get to length_m by adding up the length_metre field and filtering out everything up to length_m\n # dplyr::filter(cumsum(length_metre) <= length_m) |>\n sf::st_union() |> \n # we need to run st_sf or we get a sp object in a list...\n sf::st_sf()\n \naoi_refined_buffered <- sf::st_buffer(\n aoi_refined_raw,\n q_buffer, endCapStyle = \"FLAT\"\n) \n\nphotos_aoi_refined <- sf::st_intersection(\n layers_trimmed$l_photo_centroids, \n aoi_refined_buffered\n )\n```\n:::\n\n\nLet's plot again and include our buffered areas around the first 5000m of streams (area in red) along with the location of the photo points that land within that area. Looks like this give us 968 photos.\n\n\n::: {.cell}\n\n```{.r .cell-code}\nmap +\n geom_sf(\n data = aoi_refined_buffered,\n color = \"red\",\n alpha= 0\n ) +\n geom_sf(\n data = photos_aoi_refined,\n alpha = 0.25,\n ) \n```\n\n::: {.cell-output-display}\n![](index_files/figure-html/map3-1.png){width=672}\n:::\n:::\n\n\n## Filter Photos by Date\nNow lets filter by date to see what our options are including the earliest photos possible. Here is our range to choose from:\n\n\n::: {.cell}\n\n```{.r .cell-code}\nrange(photos_aoi_refined$photo_date)\n```\n\n::: {.cell-output .cell-output-stdout}\n\n```\n[1] \"1963-08-07\" \"2019-09-18\"\n```\n\n\n:::\n:::\n\n::: {.cell}\n\n```{.r .cell-code}\nq_date_end1 <- \"1969-12-31\"\nq_date_start1 <- \"1970-01-01\"\nq_date_end2 <- \"1975-12-31\"\n```\n:::\n\n\nThere is lots going on here so we will map a comparison of a couple of options. First we will look at all photos available for before 1970 (red dots on map below). We will also see what photos we have for between 1970-01-01 and on or before 1975-12-31 (blue dots on map below)?\n\n\n::: {.cell}\n\n```{.r .cell-code}\nphotos1 <- photos_aoi_refined |> \n dplyr::filter(\n photo_date <= q_date_end1\n )\n\nphotos2 <- photos_aoi_refined |> \n dplyr::filter(\n photo_date >= q_date_start1 &\n photo_date <= q_date_end2\n )\n```\n:::\n\n::: {.cell}\n\n```{.r .cell-code}\nmap +\n geom_sf(\n data = photos1,\n color = \"red\",\n alpha = 0.25,\n ) \n```\n\n::: {.cell-output-display}\n![](index_files/figure-html/map4-1.png){width=672}\n:::\n\n```{.r .cell-code}\nmap + \n geom_sf(\n data = photos2,\n color = \"blue\",\n alpha = 0.25,\n ) \n```\n\n::: {.cell-output-display}\n![](index_files/figure-html/map4-2.png){width=672}\n:::\n:::\n\n\nWell we have some tough decisions to make as we seem to have better coverage in the Maxan Creek drainage in the 70s (144 photos) but good coverage of the mainstem Neexdzii Kwah in the 60s (83 photos)...\n\n
\n\n \nThe table below can be used to filter photos from any time (provided it's location falls in the watershed area we clipped our downloaded points to) and export the result to csv or excel file. This could be useful for narrowing down our search not only to timescales but also to specific mapsheets with options given for both NTS 1:50,000 as well as BCGS 1:20,000 grid mapsheets.\n\n\n::: {.cell}\n\n```{.r .cell-code}\nphotos_aoi_refined |> \n my_dt_table(cols_freeze_left = 2)\n```\n\n::: {.cell-output-display}\n\n```{=html}\n
\n\n```\n\n:::\n:::\n\n\n## Export `csv` Files with Photo Information\nLet's burn out some csvs that can be used to find the imagery for:\n\n - \"before 1969-12-31\" \n - 1970-01-01 to 1975-12-31 timeline\n\n\n::: {.cell}\n\n```{.r .cell-code}\nlfile_name_photos <- function(dat = NULL){\n fs::path(\n path_post,\n \"exports\",\n paste(\n \"airphotos\",\n paste(range(dat$photo_date), collapse = \"_\"),\n sep = \"_\"\n ),\n ext = \"csv\"\n )\n}\n\n# path_output <- fs::path(\n# path_post,\n# \"exports\",\n# paste(\n# \"airphotos\",\n# paste(range(photos$photo_date), collapse = \"_\"),\n# sep = \"_\"\n# ),\n# ext = \"csv\"\n# )\n\nphotos1 |> \n readr::write_csv(\n lfile_name_photos(photos1), na =\"\"\n )\n\nphotos2 |> \n readr::write_csv(\n lfile_name_photos(photos2), na =\"\"\n )\n\nlpath_link <- function(dat = NULL){\n paste0(\n \"https://github.com/NewGraphEnvironment/new_graphiti/tree/main/posts/2024-11-15-bcdata-ortho-historic/exports/\",\n basename(\n lfile_name_photos(dat)\n )\n )\n}\n```\n:::\n\n\nWe can view and download exported csv files [here](https://github.com/NewGraphEnvironment/new_graphiti/tree/main/posts/2024-11-15-bcdata-ortho-historic/exports/)\n\n## Pick a Horse\nWe are absolutely privaledged to potentially have the assistance of [Mike Price](https://www.researchgate.net/profile/Michael-Price-14) to help us obtain this imagery from the UBC archives. Sooo... - unless he has a preference that 100% can override our recommendation - we would think that he would probably prefer clear direction from us. Soooo - to start - thinking the best plan is to go with the imagery in the timeframe of 1971-06-05, 1975-09-18\" since the coverage seems much better than the earlier images... The name of the csv with that information is `airphotos_1971-06-05_1975-09-18.csv` and the file can found along with the other export at the link above or individually [here](https://github.com/NewGraphEnvironment/new_graphiti/tree/main/posts/2024-11-15-bcdata-ortho-historic/exports/airphotos_1971-06-05_1975-09-18.csv).\n\n## Outstanding Issues\n\n - Why does the date range of the photos we can get IDs for through the [WIMSI](https://www2.gov.bc.ca/gov/content/data/geographic-data-services/digital-imagery/air-photos) online portal not overlap the dates listed in the BC Data Catalouge [Historic Imagery Points](https://catalogue.data.gov.bc.ca/dataset/airborne-imagery-historical-index-map-points) for the dates in the Historic Imagery Points that are listed as 1950 - 1963 vs our earliest records from the portal at 1963-08-07??!!\n\n\n", + "markdown": "---\ntitle: \"Getting details of historic orthophoto imagery with R\"\nauthor: \"al\"\ndate: \"2024-11-15\"\ndate-modified: \"2024-11-17\"\ncategories: [fwapg, r, bcdata, imagery, api]\nimage: \"image.jpg\"\nparams:\n repo_owner: \"NewGraphEnvironment\"\n repo_name: \"new_graphiti\"\n post_name: \"2024-11-15-bcdata-ortho-historic\"\n update_gis: FALSE\nformat: \n html:\n code-fold: true\n---\n\n\nWe would like to obtain historic ortho photo imagery so that we can compare historic watershed conditions compared to current (ex. floodplain vegetation clearing, channel morphology, etc.). First we will generate an area of interest. In our first few code chunks we load our packages and load in some functions that will help us do this work.\n\n\n\n\n::: {.cell}\n\n```{.r .cell-code}\nsuppressMessages(library(tidyverse))\nlibrary(ggplot2)\nlibrary(bcdata)\nlibrary(fwapgr)\nlibrary(knitr)\nsuppressMessages(library(sf))\n# library(leaflet)\n# library(leafem)\n```\n:::\n\n::: {.cell}\n\n```{.r .cell-code}\npath_post <- fs::path(\n here::here(),\n \"posts\",\n params$post_name\n)\n```\n:::\n\n::: {.cell}\n\n```{.r .cell-code}\nstaticimports::import(\n dir = fs::path(\n path_post,\n \"scripts\"\n ),\n outfile = fs::path(\n path_post,\n \"scripts\",\n \"staticimports\",\n ext = \"R\"\n )\n)\n```\n:::\n\n::: {.cell}\n\n```{.r .cell-code}\nsource(\n fs::path(\n path_post,\n \"scripts\",\n \"staticimports\",\n ext = \"R\"\n )\n)\n\n\nlfile_name <- function(dat_name = NULL, ext = \"geojson\") {\n fs::path(\n path_post,\n \"data\",\n paste0(dat_name, \".\", ext)\n )\n}\n\nlburn_sf <- function(dat = NULL, dat_name = NULL) {\n if (is.null(dat_name)) {\n cli::cli_abort(\"You must provide a name for the GeoJSON file using `dat_name`.\")\n }\n \n dat |>\n sf::st_write(\n lfile_name(dat_name),\n delete_dsn = TRUE\n # append = FALSE\n )\n}\n\n# Function to validate and repair geometries\nlngs_geom_validate <- function(layer) {\n layer <- sf::st_make_valid(layer)\n layer <- layer[sf::st_is_valid(layer), ]\n return(layer)\n}\n```\n:::\n\n\n\n## Download Spatial Data Layers\nHere we download our area of interest which is the Neexdzii Kwah River (a.k.a Upper Bulkley River) which is located between Houston, BC (just south of Smithers) and Topley, BC which is east of Houston and north of Burns Lake, BC. We hit up our remote database managed by Simon Norris with a package built by Poisson Consulting specifically for the task. We use the `downstream_route_measure` of the Bulkley River (identified through a unique `blue_line_key`) to query the watershed area upstream of the point where the Neexdzii Kwah River enters the Wedzin Kwah River (a.k.a Morice River).\n\n\n::: {.cell}\n\n```{.r .cell-code}\n# lets build a custom watersehed just for upstream of the confluence of Neexdzii Kwa and Wetzin Kwa\n# blueline key\nblk <- 360873822\n# downstream route measure\ndrm <- 166030.4\n\naoi <- fwapgr::fwa_watershed_at_measure(blue_line_key = blk, \n downstream_route_measure = drm) |> \n sf::st_transform(4326)\n\n\n#get the bounding box of our aoi\n# aoi_bb <- sf::st_bbox(aoi)\n\n#lets burn this so we don't need to download each time\naoi <- lngs_geom_validate(aoi)\nlburn_sf(\n aoi,\n deparse(substitute(aoi)))\n```\n:::\n\n\nNext we grab a few key layers from the BC Data Catalougue API using convience functions in our `rfp` package (\"Reproducable Field Products\") which wrap the provincially maintained `bcdata` package. We grab:\n\n - Railways\n - Streams in the Bulkley Watershed group that are 4th order or greater.\n - [Historic Imagery Points](https://catalogue.data.gov.bc.ca/dataset/airborne-imagery-historical-index-map-points)\n - [Historic Imagery Polygons](https://catalogue.data.gov.bc.ca/dataset/airborne-imagery-historical-index-map-polygons)\n - [NTS 1:50,000 Grid](https://catalogue.data.gov.bc.ca/) (we will see why in a second)\n - [Air Photo Centroids](https://catalogue.data.gov.bc.ca/dataset/airphoto-centroids)\n \n\n\n\n::: {.cell}\n\n```{.r .cell-code}\n# grab all the railways\nl_rail <- rfp::rfp_bcd_get_data(\n bcdata_record_id = \"whse_basemapping.gba_railway_tracks_sp\"\n) |> \n sf::st_transform(4326) |> \n janitor::clean_names() \n\n\n# streams in the bulkley and then filter to just keep the big ones\nl_streams <- rfp::rfp_bcd_get_data(\n bcdata_record_id = \"whse_basemapping.fwa_stream_networks_sp\",\n col_filter = \"watershed_group_code\",\n col_filter_value = \"BULK\",\n # grab a smaller object by including less columns\n col_extract = c(\"linear_feature_id\", \"stream_order\", \"gnis_name\", \"downstream_route_measure\", \"blue_line_key\", \"length_metre\")\n) |> \n sf::st_transform(4326) |> \n janitor::clean_names() |> \n dplyr::filter(stream_order >= 4)\n\n# historic orthophotos\n# WHSE_IMAGERY_AND_BASE_MAPS.AIMG_HIST_INDEX_MAPS_POLY\n#https://catalogue.data.gov.bc.ca/dataset/airborne-imagery-historical-index-map-points\nl_imagery <- rfp::rfp_bcd_get_data(\n bcdata_record_id = \"WHSE_IMAGERY_AND_BASE_MAPS.AIMG_ORTHOPHOTO_TILES_POLY\") |> \n sf::st_transform(4326) |> \n janitor::clean_names()\n\nl_imagery_hist <- rfp::rfp_bcd_get_data(\n bcdata_record_id = \"WHSE_IMAGERY_AND_BASE_MAPS.AIMG_HIST_INDEX_MAPS_POINT\") |> \n sf::st_transform(4326) |> \n janitor::clean_names()\n\nl_imagery_grid <- rfp::rfp_bcd_get_data(\n bcdata_record_id = \"WHSE_BASEMAPPING.NTS_50K_GRID\") |> \n sf::st_transform(4326) |> \n janitor::clean_names()\n```\n:::\n\n\nFollowing download we run some clean up to ensure the geometry of our spatial files is \"valid\", trim to our area of interest and burn locally so that every time we rerun iterations of this memo we don't need to wait for the download process which takes a little longer than we want to wait.\n\n\n::: {.cell}\n\n```{.r .cell-code}\n# get a list of the objects in our env that start with l_\nls <- ls()[stringr::str_starts(ls(), \"l_\")] \n\nlayers_all <- tibble::lst(\n !!!mget(ls)\n)\n\n# Apply validation to the AOI and layers\nlayers_all <- purrr::map(\n layers_all, \n lngs_geom_validate\n )\n\n# clip them with purrr and sf\nlayers_trimmed <- purrr::map(\n layers_all,\n ~ sf::st_intersection(.x, aoi)\n) \n\n# Burn each `sf` object to GeoJSON\npurrr::walk2(\n layers_trimmed,\n names(layers_trimmed),\n lburn_sf\n)\n```\n:::\n\n::: {.cell}\n\n```{.r .cell-code}\n# lets use the nts mapsheet to query the photo centroids to avoid a massive file download\ncol_value <- layers_trimmed$l_imagery_grid |> \n dplyr::pull(map_tile) \n\n \n\nl_photo_centroids <- rfp::rfp_bcd_get_data(\n bcdata_record_id = \"WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP\",\n col_filter = \"nts_tile\",\n col_filter_value = col_value) |> \n sf::st_transform(4326) |> \n janitor::clean_names()\n\n# Apply validation to the AOI and layers\nl_photo_centroids <-lngs_geom_validate(l_photo_centroids)\n\n# clip to aoi - can use layers_trimmed$aoi \nl_photo_centroids <- sf::st_intersection(l_photo_centroids, aoi)\n\n\nlburn_sf(l_photo_centroids, \"l_photo_centroids\")\n```\n:::\n\n\nNext - we read the layers back in. The download step is skipped now unless we turn it on again by changing the `update_gis` param in our memo `yaml` header to `TRUE`.\n\n\n::: {.cell}\n\n```{.r .cell-code}\n# now we read in all the sf layers that are local so it is really quick\nlayers_to_load <- fs::dir_ls(\n fs::path(\n path_post,\n \"data\"),\n glob = \"*.geojson\"\n)\n\nlayers_trimmed <- layers_to_load |>\n purrr::map(\n ~ sf::st_read(\n .x, quiet = TRUE)\n ) |> \n purrr::set_names(\n nm =tools::file_path_sans_ext(\n basename(\n names(\n layers_to_load\n )\n )\n )\n )\n```\n:::\n\n\nOK, seems we cannot get machine readable historical air photo information from the downloaded from the BC data catalogue [Historic Imagery Points](https://catalogue.data.gov.bc.ca/dataset/airborne-imagery-historical-index-map-points) layer perhaps because the majority of the photos are not georeferenced? What we see in the map and table below (red dot on map) is one point which contains 8 records including links to pdfs and kmls which are basically a georeferenced drawing of where the imagery overlaps (@fig-1). From as far as I can tell - if we wanted to try to use the kmls or pdfs linked in the attribute tables of the \"Historic Imagery Points\" layer to select orthoimagery we would need to eyeball where the photo polygons overlap where we want to see imagery for and manually write down identifiers for photo by hand. Maybe I am missing something but it sure seems that way. \n\n\n::: {.cell}\n\n```{.r .cell-code}\nmap <- ggplot() +\n geom_sf(\n data = layers_trimmed$aoi,\n fill = \"transparent\",\n color = \"black\",\n linewidth = .5\n ) +\n geom_sf(\n data = layers_trimmed$l_streams,\n color = \"blue\",\n size = 1\n ) +\n geom_sf_text(\n data = layers_trimmed$l_streams |> dplyr::distinct(gnis_name, .keep_all = TRUE),\n aes(\n label = gnis_name\n ),\n size = 2 # Adjust size of the text labels as needed\n ) +\n geom_sf(\n data = layers_trimmed$l_rail,\n color = \"black\",\n size = 1\n ) +\n geom_sf(\n data = layers_trimmed$l_imagery_hist,\n color = \"red\",\n size = 2\n ) +\n geom_sf(\n data = layers_trimmed$l_imagery_grid,\n alpha = 0.25,\n ) +\n geom_sf_text(\n data = layers_trimmed$l_imagery_grid,\n aes(label = map_tile),\n size = 3 # Adjust size of the text labels as needed\n )\n\nmap\n```\n\n::: {.cell-output-display}\n![](index_files/figure-html/map1-1.png){width=672}\n:::\n:::\n\n::: {.cell}\n\n```{.r .cell-code}\n#This what the information in the [Historic Imagery Points](https://catalogue.data.gov.bc.ca/dataset/airborne-imagery-historical-index-map-points) layer looks like.\n\nlayers_trimmed$l_imagery_hist |> \n sf::st_drop_geometry() |> \n knitr::kable()\n```\n\n::: {.cell-output-display}\n\n\n|id | historical_index_map_id|scale_category |geoextent_mapsheet |map_tag | start_year| end_year|kml_url |pdf_url | objectid|se_anno_cad_data | area_ha|localcode_ltree |refine_method |wscode_ltree |\n|:---------------------------------------------------------|-----------------------:|:--------------|:------------------|:--------|----------:|--------:|:-----------------------------------------------------------------------------------|:------------------------------------------------------------------------------------------------------------------------------------------|--------:|:----------------|--------:|:-----------------|:-------------|:------------|\n|WHSE_IMAGERY_AND_BASE_MAPS.AIMG_HIST_INDEX_MAPS_POINT.557 | 557|large |093l_e |093l_e_1 | 1950| 1963|https://openmaps.gov.bc.ca/flight_indices/kml/large_scale/093/93l_e_1_1950_1963.kml |https://openmaps.gov.bc.ca/flight_indices/pdf/large_scale_block_10000_to_25000/093_nts/93l_e/93l_e_sheet_1_20ch_1950_1963.pdf | 1860|NA | 231944.7|400.431358.585806 |CUT |400.431358 |\n|WHSE_IMAGERY_AND_BASE_MAPS.AIMG_HIST_INDEX_MAPS_POINT.558 | 558|large |093l_e |093l_e_2 | 1971| 1974|https://openmaps.gov.bc.ca/flight_indices/kml/large_scale/093/93l_e_2_1971_1974.kml |https://openmaps.gov.bc.ca/flight_indices/pdf/large_scale_block_10000_to_25000/093_nts/93l_e/93l_e_sheet_2_20ch_1971_1974.pdf | 1861|NA | 231944.7|400.431358.585806 |CUT |400.431358 |\n|WHSE_IMAGERY_AND_BASE_MAPS.AIMG_HIST_INDEX_MAPS_POINT.559 | 559|large |093l_e |093l_e_3 | 1975| 1975|https://openmaps.gov.bc.ca/flight_indices/kml/large_scale/093/93l_e_3_1975.kml |https://openmaps.gov.bc.ca/flight_indices/pdf/large_scale_block_10000_to_25000/093_nts/93l_e/93l_e_sheet_3_20k_1975.pdf | 1862|NA | 231944.7|400.431358.585806 |CUT |400.431358 |\n|WHSE_IMAGERY_AND_BASE_MAPS.AIMG_HIST_INDEX_MAPS_POINT.560 | 560|large |093l_e |093l_e_4 | 1980| 1980|https://openmaps.gov.bc.ca/flight_indices/kml/large_scale/093/93l_e_4_1980.kml |https://openmaps.gov.bc.ca/flight_indices/pdf/large_scale_block_10000_to_25000/093_nts/93l_e/93l_e_sheet_4_20k_1980.pdf | 1863|NA | 231944.7|400.431358.585806 |CUT |400.431358 |\n|WHSE_IMAGERY_AND_BASE_MAPS.AIMG_HIST_INDEX_MAPS_POINT.561 | 561|large |093l_e |093l_e_5 | 1980| 1980|https://openmaps.gov.bc.ca/flight_indices/kml/large_scale/093/93l_e_5_1980.kml |https://openmaps.gov.bc.ca/flight_indices/pdf/large_scale_block_10000_to_25000/093_nts/93l_e/93l_e_sheet_5_10k_1980.pdf | 1864|NA | 231944.7|400.431358.585806 |CUT |400.431358 |\n|WHSE_IMAGERY_AND_BASE_MAPS.AIMG_HIST_INDEX_MAPS_POINT.562 | 562|large |093l_e |093l_e_6 | 1981| 1983|https://openmaps.gov.bc.ca/flight_indices/kml/large_scale/093/93l_e_6_1981_1983.kml |https://openmaps.gov.bc.ca/flight_indices/pdf/large_scale_block_10000_to_25000/093_nts/93l_e/93l_e_sheet_6_20k_1981_1983.pdf | 1865|NA | 231944.7|400.431358.585806 |CUT |400.431358 |\n|WHSE_IMAGERY_AND_BASE_MAPS.AIMG_HIST_INDEX_MAPS_POINT.563 | 563|large |093l_e |093l_e_7 | 1989| 1989|https://openmaps.gov.bc.ca/flight_indices/kml/large_scale/093/93l_e_7_1989.kml |https://openmaps.gov.bc.ca/flight_indices/pdf/large_scale_block_10000_to_25000/093_nts/93l_e/93l_e_sheet_7_15k_1989.pdf | 1866|NA | 231944.7|400.431358.585806 |CUT |400.431358 |\n|WHSE_IMAGERY_AND_BASE_MAPS.AIMG_HIST_INDEX_MAPS_POINT.564 | 564|large |093l_e |093l_e_8 | 1990| 1990|https://openmaps.gov.bc.ca/flight_indices/kml/large_scale/093/93l_e_8_1990.kml |https://openmaps.gov.bc.ca/flight_indices/pdf/large_scale_block_10000_to_25000/093_nts/93l_e/93l_e_sheet_8_10k_15k_1990_bw_1990_colour.pdf | 1867|NA | 231944.7|400.431358.585806 |CUT |400.431358 |\n\n\n:::\n:::\n\n \n
\n\n\n::: {.cell}\n\n```{.r .cell-code}\nmy_caption <- \"Screenshot of kml downloaded from link provided in Historic Imagery Points.\"\nknitr::include_graphics(fs::path(\n path_post,\n \"fig\",\n \"Screenshot1\",\n ext = \"png\"\n )\n)\n```\n\n::: {.cell-output-display}\n![Screenshot of kml downloaded from link provided in Historic Imagery Points.](fig/Screenshot1.png){#fig-1 width=1492}\n:::\n:::\n\n\n\n\n
\n \nFor the [Historic Imagery Polygons](https://catalogue.data.gov.bc.ca/dataset/airborne-imagery-historical-index-map-polygons) layer the range of `year_operational` is 1996, 2013. This is not as far back as we would prefer to be looking.\n \n\n
\n\nIt does however seem that each of the [Air Photo Centroids](https://catalogue.data.gov.bc.ca/dataset/airphoto-centroids) are georeferenced with a date range of:\n\n\n\n::: {.cell}\n\n```{.r .cell-code}\nrange(layers_trimmed$l_photo_centroids$photo_date)\n```\n\n::: {.cell-output .cell-output-stdout}\n\n```\n[1] \"1963-08-07\" \"2019-09-18\"\n```\n\n\n:::\n:::\n\n::: {.cell}\n\n```{.r .cell-code}\n# At this point we have downloaded two csvs (one for each NTS 1:50,000 mapsheet of course) with information about the airphotos including UTM coordinates that we will assume for now are the photo centres. In our next steps we read in what we have, turn into spatial object, trim to overall study area and plot.\n# list csvs\nls <- fs::dir_ls(\n fs::path(\n path_post,\n \"data\"),\n glob = \"*.csv\"\n)\n\nphotos_raw <- ls |> \n purrr::map_df(\n readr::read_csv\n ) |> \n sf::st_as_sf(\n coords = c(\"Longitude\", \"Latitude\"), crs = 4326\n ) |> \n janitor::clean_names() |> \n dplyr::mutate(photo_date = lubridate::mdy(photo_date)) \n\n\nphotos_aoi <- sf::st_intersection(\n photos_raw, \n layers_trimmed$aoi |> st_make_valid()\n )\n```\n:::\n\n::: {.cell}\n\n```{.r .cell-code}\nmap +\n geom_sf(\n data = layers_trimmed$l_photo_centroids,\n alpha = 0.25\n ) \n```\n\n::: {.cell-output-display}\n![](index_files/figure-html/map2-1.png){width=672}\n:::\n:::\n\n\nThat is a lot of photos! 7910 photos to be exact!!!\n\n\n\n::: {.cell}\n\n```{.r .cell-code}\nq_buffer <- 500\nq_drm_main <- 263795\nq_drm_other <- 5000\n```\n:::\n\n\n## Clip Photo Information with Streams Buffers\nHere are our query parameters to narrow down the area within our study are watershed in which we want to find photos for:\n\n - Buffer: 500m - size of buffer used on either side of stream lines selected\n - Stream segments: \n + Bulkley River (`gnis_name` in the stream layer)\n + Maxan Creek\n + Buck Creek\n + for each remaining stream - segments of that stream which begin before 5000m from the downstream system\n\n\n\n\n::: {.cell}\n\n```{.r .cell-code}\n# We use the `downstream_route_measure` of the stream layer to exclude areas upstream of Bulkley Lake (also known as Taman Creek). We find it in QGIS by highlighting the stream layer and clicking on our segment of interest while we have the information tool selected - the resulting pop-up looks like this in QGIS.\nknitr::include_graphics(fs::path(\n path_post,\n \"fig\",\n \"Screenshot2\",\n ext = \"png\"\n )\n)\n```\n:::\n\n::: {.cell}\n\n```{.r .cell-code}\nr_streams <- c(\"Maxan Creek\", \"Buck Creek\")\n\naoi_refined_raw <- layers_trimmed$l_streams |> \n # removed & downstream_route_measure < q_drm_main for bulkley as doestn't cahnge 1960s query and increases beyond just by 5 photos\n dplyr::filter(gnis_name == \"Bulkley River\"|\n gnis_name != \"Bulkley River\" & downstream_route_measure < q_drm_other |\n gnis_name %in% r_streams) |> \n # dplyr::arrange(downstream_route_measure) |>\n # calculate when we get to length_m by adding up the length_metre field and filtering out everything up to length_m\n # dplyr::filter(cumsum(length_metre) <= length_m) |>\n sf::st_union() |> \n # we need to run st_sf or we get a sp object in a list...\n sf::st_sf()\n \naoi_refined_buffered <- sf::st_buffer(\n aoi_refined_raw,\n q_buffer, endCapStyle = \"FLAT\"\n) \n\nphotos_aoi_refined <- sf::st_intersection(\n layers_trimmed$l_photo_centroids, \n aoi_refined_buffered\n )\n```\n:::\n\n\nLet's plot again and include our buffered areas around the first 5000m of streams (area in red) along with the location of the photo points that land within that area. Looks like this give us 1506 photos.\n\n\n::: {.cell}\n\n```{.r .cell-code}\nmap +\n geom_sf(\n data = aoi_refined_buffered,\n color = \"red\",\n alpha= 0\n ) +\n geom_sf(\n data = photos_aoi_refined,\n alpha = 0.25,\n ) \n```\n\n::: {.cell-output-display}\n![](index_files/figure-html/map3-1.png){width=672}\n:::\n:::\n\n\nThat is not as many photos - but still quite a few (1506). The table below can be used to filter these photos from any time and/or mapsheet and export the result to csv or excel file. \n\n\n::: {.cell}\n\n```{.r .cell-code}\nphotos_aoi_refined |> \n my_dt_table(cols_freeze_left = 2)\n```\n\n::: {.cell-output-display}\n\n```{=html}\n
\n\n```\n\n:::\n:::\n\n\n## Filter Photos by Date\nNow lets map by year to see what our options are including the earliest photos possible. Here is our range to choose from:\n\n\n::: {.cell}\n\n```{.r .cell-code}\nrange(photos_aoi_refined$photo_date)\n```\n\n::: {.cell-output .cell-output-stdout}\n\n```\n[1] \"1963-08-07\" \"2019-09-18\"\n```\n\n\n:::\n:::\n\n`\n\n\n::: {.cell}\n\n```{.r .cell-code}\nmap +\ngeom_sf(\n data = photos_aoi_refined |> dplyr::filter(photo_year <= \"1975\")\n ) +\n facet_wrap(~ photo_year)\n```\n\n::: {.cell-output-display}\n![](index_files/figure-html/map4-1.png){width=672}\n:::\n:::\n\n\nWell - looks like we get really good coverage of the Bulkley River mainstem in 1968 then much better coverage of the Buck Creek drainage and Maxan Creek in 1971. For 1975 - the coverage of the Bulkley mainstem and Maxan Creek is pretty good...\n\n
\n\nThinking the ideal thing to do is to grab the photos from:\n\n - 1968 all\n - 1971 for the Buck Creek and Maxan Creek areas only\n - 1975 Maxan Creek only\n\n
\n\n\n::: {.cell}\n\n```{.r .cell-code}\n# spatially represent just Buck and Maxan, buffer and clip the 1971 photos\n# \"r_\" is for \"refine\"\nr_year1 <- \"1968\"\nr_year2 <- \"1971\"\nr_year3 <- \"1975\"\n\nr_streams2 <- c(\"Maxan Creek\")\n\nl_streams_refined1 <- layers_trimmed$l_streams |> \n # we defined r_streams in chunk way above \n dplyr::filter(gnis_name %in% r_streams) |> \n sf::st_union() |> \n # we need to run st_sf or we get a sp object in a list...\n sf::st_sf()\n \naoi_refined_buffered2 <- sf::st_buffer(\n l_streams_refined1,\n q_buffer, endCapStyle = \"FLAT\"\n) \n\nl_streams_refined2 <- layers_trimmed$l_streams |> \n # we defined r_streams in chunk way above \n dplyr::filter(gnis_name %in% r_streams2) |> \n sf::st_union() |> \n # we need to run st_sf or we get a sp object in a list...\n sf::st_sf()\n \naoi_refined_buffered3 <- sf::st_buffer(\n l_streams_refined2,\n q_buffer, endCapStyle = \"FLAT\"\n) \n\n# filter first year\nphotos1 <- photos_aoi_refined |> \n dplyr::filter(\n photo_year == r_year1\n )\n\n# filter second year using just the streams we want to include\nphotos2 <- sf::st_intersection(\n layers_trimmed$l_photo_centroids |> dplyr::filter(photo_year == r_year2), \n aoi_refined_buffered2\n )\n\n# filter second year using just the streams we want to include\nphotos3 <- sf::st_intersection(\n layers_trimmed$l_photo_centroids |> dplyr::filter(photo_year == r_year3), \n aoi_refined_buffered3\n )\n\nphotos_all <- dplyr::bind_rows(photos1, photos2, photos3)\n```\n:::\n\n\n\nNow let's have a look at what we have\n\n::: {.cell}\n\n```{.r .cell-code}\nmap +\n geom_sf(\n data = photos_all\n )\n```\n\n::: {.cell-output-display}\n![](index_files/figure-html/map5-1.png){width=672}\n:::\n:::\n\n\n## Export `csv` with Photo Information\nLet's burn out csv that can be used to find the imagery for the 137 photos above.\n\n\n\n::: {.cell}\n\n```{.r .cell-code}\nlfile_name_photos <- function(dat = NULL){\n fs::path(\n path_post,\n \"exports\",\n paste(\n \"airphotos\",\n paste(range(dat$photo_date), collapse = \"_\"),\n sep = \"_\"\n ),\n ext = \"csv\"\n )\n}\n\nphotos_all |> \n readr::write_csv(\n lfile_name_photos(photos_all), na =\"\"\n )\n\n\nlpath_link <- function(dat = NULL){\n paste0(\n \"https://github.com/NewGraphEnvironment/new_graphiti/tree/main/posts/2024-11-15-bcdata-ortho-historic/exports/\",\n basename(\n lfile_name_photos(dat)\n )\n )\n}\n```\n:::\n\n\nWe can view and download exported csv files [here](https://github.com/NewGraphEnvironment/new_graphiti/tree/main/posts/2024-11-15-bcdata-ortho-historic/exports/). \n\n\n\n\n", "supporting": [ "index_files" ], diff --git a/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/figure-html/map1-1.png b/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/figure-html/map1-1.png new file mode 100644 index 0000000..9163181 Binary files /dev/null and b/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/figure-html/map1-1.png differ diff --git a/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/figure-html/map2-1.png b/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/figure-html/map2-1.png index 229a01b..88ea1c8 100644 Binary files a/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/figure-html/map2-1.png and b/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/figure-html/map2-1.png differ diff --git a/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/figure-html/map3-1.png b/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/figure-html/map3-1.png index c236a1c..8e2bc45 100644 Binary files a/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/figure-html/map3-1.png and b/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/figure-html/map3-1.png differ diff --git a/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/figure-html/map4-1.png b/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/figure-html/map4-1.png index 9a691d3..f2d4abd 100644 Binary files a/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/figure-html/map4-1.png and b/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/figure-html/map4-1.png differ diff --git a/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/figure-html/map5-1.png b/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/figure-html/map5-1.png new file mode 100644 index 0000000..32ada6e Binary files /dev/null and b/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/figure-html/map5-1.png differ diff --git a/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/figure-html/unnamed-chunk-1-1.png b/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/figure-html/unnamed-chunk-1-1.png index 275bc4e..9163181 100644 Binary files a/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/figure-html/unnamed-chunk-1-1.png and b/_freeze/posts/2024-11-15-bcdata-ortho-historic/index/figure-html/unnamed-chunk-1-1.png differ diff --git a/posts/2024-11-15-bcdata-ortho-historic/data/l_streams.geojson b/posts/2024-11-15-bcdata-ortho-historic/data/l_streams.geojson index e860e09..73120f5 100644 --- a/posts/2024-11-15-bcdata-ortho-historic/data/l_streams.geojson +++ b/posts/2024-11-15-bcdata-ortho-historic/data/l_streams.geojson @@ -4,35 +4,98 @@ "crs": { "type": "name", "properties": { "name": "urn:ogc:def:crs:OGC:1.3:CRS84" } }, "features": [ { "type": "Feature", "properties": { "linear_feature_id": 17079329, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 203964.02077159, "blue_line_key": 360873822, "length_metre": 283.817596166258, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4799452, 54.4976495 ], [ -126.478499899999989, 54.4991891 ], [ -126.4780806, 54.4994768 ], [ -126.4775455, 54.4997516 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17081504, "stream_order": 4, "gnis_name": "North Ailport Creek", "downstream_route_measure": 592.66960243761002, "blue_line_key": 360864097, "length_metre": 3773.1880106194499, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.159466299999977, 54.4881643 ], [ -126.159461, 54.4882269 ], [ -126.159401300000013, 54.488442 ], [ -126.1592038, 54.4886172 ], [ -126.158943099999988, 54.4887909 ], [ -126.1587093, 54.4888208 ], [ -126.158707, 54.4888479 ], [ -126.1585638, 54.4889262 ], [ -126.15826, 54.48909 ], [ -126.1580778, 54.4892566 ], [ -126.157925800000015, 54.4894418 ], [ -126.157775500000014, 54.489608399999987 ], [ -126.1576543, 54.4898035 ], [ -126.1576871, 54.489993 ], [ -126.1579253, 54.4901154 ], [ -126.157998, 54.4901795 ], [ -126.1580082, 54.4902607 ], [ -126.157923400000016, 54.4903675 ], [ -126.157755400000013, 54.4905427 ], [ -126.1577385, 54.4905968 ], [ -126.1575205, 54.4908432 ], [ -126.157201300000011, 54.4909885 ], [ -126.1568689, 54.4910882 ], [ -126.156570300000013, 54.4911622 ], [ -126.1560368, 54.4913032 ], [ -126.155760199999989, 54.4914941 ], [ -126.1558828, 54.4917134 ], [ -126.1560391, 54.4919142 ], [ -126.156072, 54.4921307 ], [ -126.156052, 54.4921663 ], [ -126.155823200000015, 54.4923671 ], [ -126.1556047, 54.4926149 ], [ -126.155464, 54.4928713 ], [ -126.155436, 54.4930593 ], [ -126.15561, 54.4932174 ], [ -126.1557479, 54.4934353 ], [ -126.15594990000001, 54.493666 ], [ -126.1562272, 54.4938782 ], [ -126.156237399999981, 54.4939594 ], [ -126.1562662, 54.4941944 ], [ -126.1562492, 54.4942214 ], [ -126.156173400000014, 54.4944265 ], [ -126.155992500000011, 54.4946102 ], [ -126.1559418, 54.4946629 ], [ -126.155891700000012, 54.4947071 ], [ -126.155694200000013, 54.4948823 ], [ -126.1555741, 54.4950674 ], [ -126.155420399999983, 54.4952711 ], [ -126.155327, 54.4955118 ], [ -126.1553098, 54.4957453 ], [ -126.15532730000001, 54.4959433 ], [ -126.1553307, 54.4961327 ], [ -126.1553379, 54.4962225 ], [ -126.155303099999983, 54.496518699999989 ], [ -126.1551631, 54.4967665 ], [ -126.155010899999979, 54.4969246 ], [ -126.1547459, 54.4972066 ], [ -126.1546695, 54.4974202 ], [ -126.154727900000012, 54.4976823 ], [ -126.15484, 54.497856 ], [ -126.1549336, 54.4980469 ], [ -126.154999, 54.4982277 ], [ -126.155060299999988, 54.4984542 ], [ -126.155093799999989, 54.498635099999987 ], [ -126.1551216, 54.4989142 ], [ -126.1551397, 54.4991036 ], [ -126.155140100000011, 54.4993016 ], [ -126.1550791, 54.4995067 ], [ -126.155082, 54.4997046 ], [ -126.1551007, 54.4998855 ], [ -126.155091, 54.500000500000013 ], [ -126.1550909, 54.5000023 ], [ -126.1550829, 54.5001276 ], [ -126.154989, 54.5003769 ], [ -126.154984899999988, 54.500656 ], [ -126.154925600000013, 54.5008426 ], [ -126.1547748, 54.5010106 ], [ -126.154556199999988, 54.5012656 ], [ -126.1543235, 54.501512 ], [ -126.1540575, 54.5017484 ], [ -126.153703600000014, 54.5019563 ], [ -126.153522700000011, 54.50214 ], [ -126.153286900000012, 54.502395 ], [ -126.1530895, 54.5025702 ], [ -126.1529842, 54.5027482 ], [ -126.152999, 54.5027752 ], [ -126.1529638, 54.5028465 ], [ -126.1527793, 54.5030401 ], [ -126.1526575, 54.5032438 ], [ -126.152531700000011, 54.503493 ], [ -126.1524046, 54.5037594 ], [ -126.1522988, 54.5039459 ], [ -126.152218, 54.5042407 ], [ -126.152140899999978, 54.5044359 ], [ -126.1520044, 54.5046395 ], [ -126.1518677, 54.5048161 ], [ -126.1517134, 54.5050283 ], [ -126.1516076, 54.5052149 ], [ -126.1515159, 54.5054371 ], [ -126.151423099999988, 54.5056422 ], [ -126.1512535, 54.5058629 ], [ -126.1511636, 54.5060595 ], [ -126.1510713, 54.5062631 ], [ -126.150900100000015, 54.5065295 ], [ -126.1507758, 54.5067331 ], [ -126.1506557, 54.5069183 ], [ -126.1503855, 54.5072629 ], [ -126.150232399999979, 54.507458 ], [ -126.150104200000015, 54.5077415 ], [ -126.1500136, 54.5079195 ], [ -126.1499071, 54.5081146 ], [ -126.1496692, 54.5084237 ], [ -126.1495184, 54.5085917 ], [ -126.149327700000015, 54.5088922 ], [ -126.149180699999988, 54.5092212 ], [ -126.148978199999988, 54.5094861 ], [ -126.1487438, 54.509751 ], [ -126.148607700000014, 54.5099191 ], [ -126.148432899999975, 54.5102025 ], [ -126.1483258, 54.5104062 ], [ -126.1481233, 54.5106711 ], [ -126.147872799999988, 54.510926 ], [ -126.1476116, 54.5111354 ], [ -126.1472894, 54.5113162 ], [ -126.1470617, 54.5114729 ], [ -126.1470412, 54.5115441 ], [ -126.146702599999983, 54.5117435 ], [ -126.146459, 54.5119172 ], [ -126.1462451, 54.5121109 ], [ -126.1460334, 54.5122847 ], [ -126.1457704, 54.5125126 ], [ -126.1455552, 54.5126963 ], [ -126.145373, 54.5128629 ], [ -126.145064, 54.5130894 ], [ -126.1446976, 54.513270200000015 ], [ -126.1442677, 54.5134298 ], [ -126.143937200000011, 54.5135309 ], [ -126.143541599999978, 54.5136562 ], [ -126.143208699999988, 54.513791499999989 ], [ -126.1428569, 54.5139453 ], [ -126.1424141, 54.5140792 ], [ -126.1419548, 54.5142387 ], [ -126.1415092, 54.514435199999987 ], [ -126.1412308, 54.5146446 ], [ -126.1411522, 54.5148853 ], [ -126.1409148, 54.5151858 ], [ -126.1405039, 54.5153197 ], [ -126.1403463, 54.5153695 ], [ -126.1400908, 54.5155077 ], [ -126.1398443, 54.515717 ], [ -126.139598799999987, 54.5158822 ], [ -126.139472, 54.5159421 ], [ -126.1393866, 54.5160574 ], [ -126.139065, 54.5162297 ], [ -126.1387781, 54.5163665 ], [ -126.138411, 54.5165288 ], [ -126.1383614, 54.5165716 ], [ -126.138225399999982, 54.5167667 ], [ -126.1382259, 54.5169646 ], [ -126.1382207, 54.5170273 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17082310, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 4385.6749615108502, "blue_line_key": 360869846, "length_metre": 577.07427611560297, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5631111, 54.4839714 ], [ -126.5631678, 54.4840269 ], [ -126.563206499999978, 54.4841623 ], [ -126.563202800000013, 54.4842434 ], [ -126.5632046, 54.4844499 ], [ -126.563216099999977, 54.4845226 ], [ -126.5632684, 54.4847035 ], [ -126.5633051, 54.4848658 ], [ -126.563444600000011, 54.4850851 ], [ -126.5635749, 54.4852674 ], [ -126.5637044, 54.4853956 ], [ -126.563853099999974, 54.4854967 ], [ -126.5639117, 54.4855608 ], [ -126.564148499999988, 54.4857189 ], [ -126.564497199999977, 54.4858514 ], [ -126.5647655, 54.4859824 ], [ -126.5649764, 54.486094900000012 ], [ -126.565124700000013, 54.4861974 ], [ -126.5653939, 54.486347 ], [ -126.5656788, 54.4864866 ], [ -126.56596519999998, 54.4866005 ], [ -126.5660847, 54.486666 ], [ -126.5663219, 54.4868512 ], [ -126.5663911, 54.4869694 ], [ -126.5665023, 54.4871502 ], [ -126.5666489, 54.4873069 ], [ -126.5668077, 54.4874992 ], [ -126.566892, 54.4876444 ], [ -126.5670645, 54.4878538 ], [ -126.56716, 54.4880446 ], [ -126.5671698, 54.4881714 ], [ -126.5671762, 54.488315199999988 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17078883, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 0.0, "blue_line_key": 360747751, "length_metre": 17.962357591266102, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4775455, 54.4997516 ], [ -126.4777535, 54.4998585 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17075485, "stream_order": 5, "gnis_name": "Richfield Creek", "downstream_route_measure": 1647.9288294196999, "blue_line_key": 360788426, "length_metre": 184.50088329492999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.335637899999981, 54.5184843 ], [ -126.3355807, 54.51865380000001 ], [ -126.3355908, 54.5187435 ], [ -126.3355818, 54.5188873 ], [ -126.3355628, 54.5189414 ], [ -126.3354709, 54.5191465 ], [ -126.3354624, 54.5192889 ], [ -126.335436, 54.5194684 ], [ -126.335316, 54.5196279 ], [ -126.3351661, 54.519796 ], [ -126.334893, 54.5199512 ], [ -126.3348272, 54.5200124 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099282, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 25619.861856862401, "blue_line_key": 360880905, "length_metre": 354.98508635699102, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4124935, 54.2906877 ], [ -126.4134144, 54.2904185 ], [ -126.4140753, 54.2902761 ], [ -126.414386400000012, 54.2902248 ], [ -126.4147099, 54.2902277 ], [ -126.415258799999989, 54.2904057 ], [ -126.4158538, 54.2905367 ], [ -126.416278100000014, 54.2908586 ], [ -126.416912599999989, 54.291152 ], [ -126.4171951, 54.2912289 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17060559, "stream_order": 4, "gnis_name": "Richfield Creek", "downstream_route_measure": 18883.060850423401, "blue_line_key": 360788426, "length_metre": 20.401386486214701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1898967, 54.5964313 ], [ -126.189881899999975, 54.5964312 ], [ -126.1895842, 54.5964597 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17083636, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1284.7887409960799, "blue_line_key": 360875052, "length_metre": 92.215550232772102, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3347657, 54.4782518 ], [ -126.334881599999974, 54.4783885 ], [ -126.335043399999989, 54.4784996 ], [ -126.3353013, 54.478595 ], [ -126.3356659, 54.4786662 ], [ -126.3358634, 54.4787246 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17082100, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 227966.754840671, "blue_line_key": 360873822, "length_metre": 157.66629970088999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2671007, 54.4868084 ], [ -126.2669067, 54.4867059 ], [ -126.2666428, 54.4864752 ], [ -126.266636299999988, 54.4863484 ], [ -126.2667895, 54.4861448 ], [ -126.266784, 54.4859738 ], [ -126.2667583, 54.4859012 ], [ -126.266653800000014, 54.4858642 ], [ -126.2664506, 54.485877 ], [ -126.2663262, 54.485909799999988 ], [ -126.266180099999985, 54.4859966 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102113, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 28261.845173766698, "blue_line_key": 360881038, "length_metre": 36.180540233186797, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0693736, 54.2450147 ], [ -126.069240199999982, 54.2449663 ], [ -126.0691986, 54.2448937 ], [ -126.069235699999979, 54.244812499999988 ], [ -126.069254500000014, 54.2447413 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17096794, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 13552.967602843401, "blue_line_key": 360881038, "length_metre": 127.705635389916, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1393379, 54.3322732 ], [ -126.1393226, 54.3322547 ], [ -126.1391766, 54.3321521 ], [ -126.1389811, 54.3320852 ], [ -126.1386429, 54.3320681 ], [ -126.138411600000012, 54.3320795 ], [ -126.13805760000001, 54.3320724 ], [ -126.1377995, 54.3320296 ], [ -126.137558, 54.3319883 ], [ -126.137526799999989, 54.3319869 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100773, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 19294.283619366499, "blue_line_key": 360880905, "length_metre": 244.11989759666599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.366802799999988, 54.2661243 ], [ -126.3668602, 54.2661884 ], [ -126.367053899999988, 54.2662739 ], [ -126.36732619999998, 54.2663237 ], [ -126.367463, 54.2663365 ], [ -126.3675077, 54.2663821 ], [ -126.3674876, 54.2664448 ], [ -126.3674047, 54.2665601 ], [ -126.3671149, 54.266769499999988 ], [ -126.367302599999988, 54.2669262 ], [ -126.3673254, 54.26708 ], [ -126.3672894, 54.2671327 ], [ -126.367055, 54.2672082 ], [ -126.3670044, 54.2672879 ], [ -126.3669796, 54.2674318 ], [ -126.366987099999989, 54.2675671 ], [ -126.367119100000011, 54.2676682 ], [ -126.367192399999979, 54.2677152 ], [ -126.3672687, 54.2677337 ], [ -126.3673145, 54.2677351 ], [ -126.3673597, 54.2677451 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099755, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 7972.7534463593502, "blue_line_key": 360877225, "length_metre": 154.38782326984099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1966821, 54.2842232 ], [ -126.1967342, 54.2841534 ], [ -126.1967144, 54.2839725 ], [ -126.1965718, 54.2838073 ], [ -126.196375800000013, 54.283776 ], [ -126.196283600000015, 54.2837746 ], [ -126.19602660000001, 54.2836962 ], [ -126.195996099999974, 54.2836863 ], [ -126.1959395, 54.2836136 ], [ -126.195942, 54.2835866 ], [ -126.195929799999973, 54.2835595 ], [ -126.1959299, 54.2835324 ], [ -126.195917699999981, 54.2835054 ], [ -126.196022, 54.2833188 ], [ -126.1960245, 54.2832918 ], [ -126.1960416, 54.2832647 ], [ -126.196027, 54.2832376 ], [ -126.1960295, 54.2832106 ], [ -126.19600530000001, 54.2831294 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17081351, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 227414.73864266, "blue_line_key": 360873822, "length_metre": 188.28129038492901, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2723906, 54.4896796 ], [ -126.2721909, 54.4896483 ], [ -126.271876299999988, 54.4895329 ], [ -126.2716381, 54.4893749 ], [ -126.2715954, 54.4893293 ], [ -126.2714165, 54.4892253 ], [ -126.271116099999986, 54.4891114 ], [ -126.270783, 54.488986 ], [ -126.2705134, 54.4888821 ], [ -126.270257699999988, 54.4887596 ], [ -126.270157399999988, 54.4886485 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17078348, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 7371.2377362442403, "blue_line_key": 360869846, "length_metre": 154.09452486629999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5897641, 54.5025046 ], [ -126.589898299999987, 54.5026058 ], [ -126.590033099999985, 54.5026627 ], [ -126.5902302, 54.5027382 ], [ -126.5904282, 54.5027966 ], [ -126.5906405, 54.5028635 ], [ -126.5908356, 54.5029305 ], [ -126.591064499999987, 54.503006 ], [ -126.5911831, 54.5030814 ], [ -126.5913432, 54.5032281 ], [ -126.5913953, 54.5034176 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17085892, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 233080.322350656, "blue_line_key": 360873822, "length_metre": 36.928464092119, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.251113, 54.4650209 ], [ -126.2508827, 54.4649796 ], [ -126.25068779999998, 54.4649212 ], [ -126.250628699999979, 54.4648671 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17082242, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 228266.217514149, "blue_line_key": 360873822, "length_metre": 116.663083937046, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2646751, 54.4861063 ], [ -126.264456400000014, 54.4859212 ], [ -126.2642406, 54.4857004 ], [ -126.2640612, 54.4855978 ], [ -126.2638864, 54.4854412 ], [ -126.263619499999976, 54.4852645 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17088228, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 190104.36055880299, "blue_line_key": 360873822, "length_metre": 346.34747702289002, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5506756, 54.448453 ], [ -126.5509623, 54.4481582 ], [ -126.551806199999973, 54.4478107 ], [ -126.5519926, 54.4475715 ], [ -126.551965399999986, 54.4473336 ], [ -126.5515103, 54.4467782 ], [ -126.5513112, 54.4466258 ], [ -126.550704, 54.4463865 ], [ -126.549966099999978, 54.4463253 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17068230, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 12784.040966706199, "blue_line_key": 360875378, "length_metre": 860.83665825586002, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.593403, 54.555931 ], [ -126.5934934, 54.555968 ], [ -126.593798400000011, 54.556073400000017 ], [ -126.5941128, 54.556223 ], [ -126.594267, 54.5562529 ], [ -126.594391299999984, 54.5562557 ], [ -126.5946693, 54.5562614 ], [ -126.594919299999987, 54.556213 ], [ -126.595170799999977, 54.5561461 ], [ -126.5953265, 54.5561218 ], [ -126.595466500000015, 54.5561147 ], [ -126.5957745, 54.5561119 ], [ -126.596052499999985, 54.5561176 ], [ -126.5964243, 54.5561076 ], [ -126.5965211, 54.5560549 ], [ -126.5965545, 54.5559937 ], [ -126.596664499999989, 54.5559595 ], [ -126.5969287, 54.5559552 ], [ -126.597192, 54.5559609 ], [ -126.597298599999974, 54.5559723 ], [ -126.5975756, 54.555995100000011 ], [ -126.5978237, 54.5560093 ], [ -126.5979774, 54.5560122 ], [ -126.5983625, 54.5560207 ], [ -126.598672900000011, 54.5560179 ], [ -126.598801599999987, 54.5559296 ], [ -126.598888, 54.5557786 ], [ -126.5990202, 54.5556376 ], [ -126.599246099999988, 54.555481 ], [ -126.599467099999984, 54.5553955 ], [ -126.5996871, 54.5553271 ], [ -126.5998762, 54.5552773 ], [ -126.600003899999976, 54.5552346 ], [ -126.6000491, 54.5552175 ], [ -126.6002691, 54.5551776 ], [ -126.60059720000001, 54.5551021 ], [ -126.6007382, 54.5550779 ], [ -126.6010039, 54.555048 ], [ -126.6010992, 54.5550138 ], [ -126.6014263, 54.5549483 ], [ -126.6017726, 54.5548557 ], [ -126.6021007, 54.5548087 ], [ -126.6024302, 54.5547076 ], [ -126.602775, 54.5546336 ], [ -126.603131599999983, 54.5546321 ], [ -126.6035034, 54.5546293 ], [ -126.603858, 54.5546549 ], [ -126.6040417, 54.5546492 ], [ -126.6043521, 54.5546464 ], [ -126.604553, 54.5546692 ], [ -126.604889, 54.5547204 ], [ -126.6052603, 54.554719 ], [ -126.605524599999981, 54.5547147 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17106363, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 0.0, "blue_line_key": 360880905, "length_metre": 498.00737724353797, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4251983, 54.182049 ], [ -126.425197, 54.1820931 ], [ -126.425192700000011, 54.1821658 ], [ -126.4252025, 54.182247 ], [ -126.42519870000001, 54.1822911 ], [ -126.425194499999989, 54.1823637 ], [ -126.4251109, 54.1824876 ], [ -126.4250468, 54.1825304 ], [ -126.42499620000001, 54.1825831 ], [ -126.424947499999988, 54.1826372 ], [ -126.4248536, 54.1826885 ], [ -126.4247597, 54.1827127 ], [ -126.4246507, 54.1827383 ], [ -126.4245575, 54.182754 ], [ -126.424432599999975, 54.1827696 ], [ -126.424342400000015, 54.1827768 ], [ -126.424233199999989, 54.1827825 ], [ -126.4241254, 54.1827981 ], [ -126.42397, 54.1828309 ], [ -126.4238159, 54.182846499999989 ], [ -126.4237214, 54.1828793 ], [ -126.4236574, 54.182942 ], [ -126.424035599999982, 54.1832368 ], [ -126.4241245, 54.1832937 ], [ -126.424214099999986, 54.1833493 ], [ -126.4243011, 54.1834319 ], [ -126.42440280000001, 54.1835145 ], [ -126.4244887, 54.1836071 ], [ -126.4245422, 54.1837153 ], [ -126.4246129, 54.1838435 ], [ -126.424653600000013, 54.1839332 ], [ -126.424520699999988, 54.1840927 ], [ -126.424411, 54.18412690000001 ], [ -126.424191599999986, 54.1842024 ], [ -126.424049699999983, 54.1842451 ], [ -126.423939800000014, 54.1843135 ], [ -126.423796599999989, 54.1843733 ], [ -126.4236102, 54.1844246 ], [ -126.4234396, 54.1844659 ], [ -126.423285299999975, 54.1844887 ], [ -126.423115399999986, 54.1844944 ], [ -126.422918, 54.1844545 ], [ -126.4227681, 54.1843975 ], [ -126.4226177, 54.1843491 ], [ -126.4224513, 54.1843177 ], [ -126.422251399999979, 54.184332 ], [ -126.422112399999989, 54.1843733 ], [ -126.4220149, 54.1844345 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17104490, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 23212.159652274, "blue_line_key": 360877225, "length_metre": 98.1130940691272, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.277129, 54.2130996 ], [ -126.2774375, 54.2130882 ], [ -126.2775601, 54.2130725 ], [ -126.2778541, 54.213034099999987 ], [ -126.27818, 54.2129885 ], [ -126.278272699999974, 54.2129814 ], [ -126.2783781, 54.212992799999981 ], [ -126.2784689, 54.2130312 ], [ -126.278526, 54.2130953 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17106707, "stream_order": 4, "gnis_name": "Buck Creek", "downstream_route_measure": 63853.756878647298, "blue_line_key": 360886221, "length_metre": 110.51840414965299, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3599877, 54.1760175 ], [ -126.3584181, 54.1756408 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101048, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 21734.191453809501, "blue_line_key": 360886221, "length_metre": 1198.6181001935799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.630401600000013, 54.2690069 ], [ -126.630328, 54.2689599 ], [ -126.6302695, 54.2689044 ], [ -126.63022740000001, 54.2688232 ], [ -126.6302016, 54.2687235 ], [ -126.6302081, 54.2686153 ], [ -126.6301982, 54.2685256 ], [ -126.630220099999988, 54.2684358 ], [ -126.6302691, 54.268366 ], [ -126.6303655, 54.2682863 ], [ -126.6304627, 54.2682251 ], [ -126.630587299999988, 54.2681553 ], [ -126.6307157, 54.2680954 ], [ -126.6308411, 54.2680442 ], [ -126.630936399999982, 54.267974400000014 ], [ -126.631033, 54.2679217 ], [ -126.6311419, 54.2678619 ], [ -126.6313007, 54.2677921 ], [ -126.6314595, 54.2677152 ], [ -126.6316028, 54.2676269 ], [ -126.6317456, 54.26754 ], [ -126.6318738, 54.2674531 ], [ -126.6319995, 54.2673663 ], [ -126.6320984, 54.2672865 ], [ -126.6321788, 54.2671896 ], [ -126.6322476, 54.2670914 ], [ -126.6323283, 54.2670216 ], [ -126.6324385, 54.2669789 ], [ -126.6325473, 54.2669262 ], [ -126.6326733, 54.2668664 ], [ -126.632861599999984, 54.2668165 ], [ -126.6329391, 54.2668179 ], [ -126.6330142, 54.2668194 ], [ -126.6331642, 54.2668849 ], [ -126.6332401, 54.2669048 ], [ -126.633378099999987, 54.2669077 ], [ -126.633519799999988, 54.2668379 ], [ -126.6335853, 54.2667766 ], [ -126.6336364, 54.2666869 ], [ -126.6336865, 54.2666071 ], [ -126.633740099999983, 54.2665103 ], [ -126.6337584, 54.2664377 ], [ -126.633763799999983, 54.2663394 ], [ -126.633755600000015, 54.266231200000014 ], [ -126.633763, 54.2660788 ], [ -126.633782699999983, 54.2660161 ], [ -126.6338203, 54.2659093 ], [ -126.633872599999989, 54.2658025 ], [ -126.633906899999985, 54.2657398 ], [ -126.6339242, 54.2656771 ], [ -126.6339149, 54.2655789 ], [ -126.6338264, 54.2655048 ], [ -126.6337375, 54.2654664 ], [ -126.6336307, 54.2654649 ], [ -126.633488899999989, 54.2655077 ], [ -126.6333798, 54.2655404 ], [ -126.633273, 54.265539 ], [ -126.633182299999987, 54.265492 ], [ -126.633126, 54.2654094 ], [ -126.6331309, 54.2653197 ], [ -126.633198, 54.2652399 ], [ -126.6332793, 54.2651616 ], [ -126.633361, 54.2650818 ], [ -126.633440600000014, 54.2650291 ], [ -126.6335513, 54.2649778 ], [ -126.6337088, 54.264891 ], [ -126.6338047, 54.264812600000013 ], [ -126.6338544, 54.2647685 ], [ -126.6339339, 54.2647158 ], [ -126.634015100000013, 54.2646446 ], [ -126.634111, 54.2645663 ], [ -126.6341798, 54.264468 ], [ -126.6342136, 54.2644067 ], [ -126.6342297, 54.2643612 ], [ -126.6342679, 54.2642458 ], [ -126.634289, 54.2641376 ], [ -126.634294399999987, 54.2640393 ], [ -126.6343016, 54.2639496 ], [ -126.6342888, 54.2638684 ], [ -126.6342478, 54.263777200000014 ], [ -126.634118, 54.2636405 ], [ -126.634075599999974, 54.2635949 ], [ -126.6339871, 54.2635209 ], [ -126.6339151, 54.2634483 ], [ -126.6338295, 54.2633386 ], [ -126.6338003, 54.263283 ], [ -126.633791, 54.2631848 ], [ -126.633782699999983, 54.2630495 ], [ -126.633771899999985, 54.2630039 ], [ -126.6337723, 54.2629683 ], [ -126.633837199999988, 54.2629156 ], [ -126.633796799999985, 54.2628159 ], [ -126.633754700000011, 54.2627347 ], [ -126.633730799999981, 54.2626436 ], [ -126.633703499999982, 54.2625894 ], [ -126.6336909, 54.2625353 ], [ -126.6336771, 54.2624983 ], [ -126.633663399999989, 54.2624542 ], [ -126.633642099999989, 54.2623003 ], [ -126.6336301, 54.2622377 ], [ -126.6335902, 54.262129400000013 ], [ -126.633567199999987, 54.2619941 ], [ -126.6335301, 54.2618574 ], [ -126.633503399999981, 54.261794699999989 ], [ -126.633447599999982, 54.2616765 ], [ -126.6333936, 54.2615669 ], [ -126.6333645, 54.2615042 ], [ -126.6333373, 54.2614501 ], [ -126.6332839, 54.2613319 ], [ -126.633284300000014, 54.2612963 ], [ -126.6332457, 54.2612051 ], [ -126.63321830000001, 54.2611239 ], [ -126.6332067, 54.2610598 ], [ -126.6331374, 54.2609245 ], [ -126.6330534, 54.2607964 ], [ -126.632993899999988, 54.2607508 ], [ -126.6329355, 54.2606953 ], [ -126.6328183, 54.2606126 ], [ -126.632716300000013, 54.2605286 ], [ -126.6325826, 54.2604375 ], [ -126.632433100000014, 54.2603705 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17066712, "stream_order": 4, "gnis_name": "Redtop Creek", "downstream_route_measure": 672.62915451318804, "blue_line_key": 360883143, "length_metre": 532.21235982022904, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3052588, 54.5648836 ], [ -126.3051582, 54.565016 ], [ -126.305101900000011, 54.5651414 ], [ -126.305050799999989, 54.5652026 ], [ -126.3048834, 54.5654063 ], [ -126.3047007, 54.5656185 ], [ -126.304533499999977, 54.5657937 ], [ -126.304348299999987, 54.5660059 ], [ -126.304284700000011, 54.56604 ], [ -126.304235100000014, 54.5661113 ], [ -126.3041125, 54.5663064 ], [ -126.3041326, 54.5664588 ], [ -126.3042177, 54.5665869 ], [ -126.3043028, 54.5667151 ], [ -126.30444559999998, 54.5668889 ], [ -126.304513, 54.5670256 ], [ -126.304623100000015, 54.5672435 ], [ -126.3046899, 54.5673888 ], [ -126.3047646, 54.5674628 ], [ -126.3048054, 54.5675355 ], [ -126.3049155, 54.5677534 ], [ -126.30501, 54.5679528 ], [ -126.305104, 54.5681536 ], [ -126.305131099999983, 54.5682162 ], [ -126.305257, 54.5684171 ], [ -126.3053556, 54.5685908 ], [ -126.3054517, 54.5687717 ], [ -126.3054778, 54.5688443 ], [ -126.3054953, 54.5690252 ], [ -126.305492399999977, 54.5690964 ], [ -126.3054728, 54.5691591 ], [ -126.305404599999989, 54.569220299999984 ], [ -126.3052595, 54.5693257 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17067957, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 19170.976099351799, "blue_line_key": 360875378, "length_metre": 183.34116756800401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6569587, 54.5564138 ], [ -126.6569648, 54.556603200000012 ], [ -126.656960499999983, 54.5566659 ], [ -126.6569657, 54.5568368 ], [ -126.656958099999983, 54.5569806 ], [ -126.6569766, 54.5572057 ], [ -126.6569671, 54.5573766 ], [ -126.6570347, 54.5575304 ], [ -126.6571317, 54.5577127 ], [ -126.657246, 54.557895 ], [ -126.657268299999984, 54.5580303 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100212, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 9376.6973813883596, "blue_line_key": 360877225, "length_metre": 66.652971193717207, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1944798, 54.2743719 ], [ -126.19446520000001, 54.2743449 ], [ -126.1944702, 54.2742908 ], [ -126.1944869, 54.2742651 ], [ -126.1944881, 54.2742281 ], [ -126.1945072, 54.2742025 ], [ -126.1945072, 54.2741754 ], [ -126.194578399999983, 54.27406 ], [ -126.194740699999983, 54.2739019 ], [ -126.1948526, 54.2738421 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17093749, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 173458.85708994701, "blue_line_key": 360873822, "length_metre": 133.802759282198, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.677262599999978, 54.391177 ], [ -126.676881099999989, 54.3913807 ], [ -126.6768473, 54.391506 ], [ -126.676893, 54.3918108 ], [ -126.677137699999989, 54.3922537 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17084647, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 5167.4358289822503, "blue_line_key": 360846413, "length_metre": 30.938283938372301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.321914400000011, 54.4726383 ], [ -126.322121199999984, 54.4723883 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17088620, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 188207.164010087, "blue_line_key": 360873822, "length_metre": 224.31253209291299, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.564737099999988, 54.4433658 ], [ -126.562791799999985, 54.4434028 ], [ -126.5625413, 54.4434398 ], [ -126.56234929999998, 54.4435196 ], [ -126.562155, 54.4438728 ], [ -126.5619024, 54.4440423 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17083854, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1151.3317310759301, "blue_line_key": 360875052, "length_metre": 38.2210603841664, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3339408, 54.4771808 ], [ -126.3343272, 54.47744 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17087526, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 6361.6334145715, "blue_line_key": 360846413, "length_metre": 1598.88856275221, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.314876499999983, 54.4639841 ], [ -126.3148324, 54.4639285 ], [ -126.314759599999988, 54.4638644 ], [ -126.31455459999998, 54.4636892 ], [ -126.31448730000001, 54.4635611 ], [ -126.314469300000013, 54.4633631 ], [ -126.3144241, 54.4633175 ], [ -126.3143371, 54.463252 ], [ -126.314155599999978, 54.4631765 ], [ -126.3138415, 54.4630256 ], [ -126.3135309, 54.4628304 ], [ -126.3133982, 54.4627279 ], [ -126.3132103, 54.4625527 ], [ -126.3130669, 54.4623975 ], [ -126.312906199999986, 54.4622494 ], [ -126.312657499999986, 54.4620457 ], [ -126.312437800000012, 54.4618705 ], [ -126.3121685, 54.461711 ], [ -126.3120343, 54.461654 ], [ -126.311779399999978, 54.461523 ], [ -126.311493899999988, 54.4614091 ], [ -126.311288, 54.4612781 ], [ -126.3111372, 54.4612125 ], [ -126.3107925, 54.4610516 ], [ -126.3105394, 54.4609291 ], [ -126.3102209, 54.4608323 ], [ -126.3100839, 54.4608109 ], [ -126.3098089, 54.4607782 ], [ -126.3096996, 54.4607753 ], [ -126.309374600000012, 54.4607867 ], [ -126.3092376, 54.4607653 ], [ -126.308999300000011, 54.4606429 ], [ -126.3088612, 54.4606315 ], [ -126.308691199999984, 54.4606272 ], [ -126.3084741, 54.4606315 ], [ -126.3083207, 54.4606286 ], [ -126.3082281, 54.4606343 ], [ -126.3081194, 54.4606229 ], [ -126.307908699999984, 54.4605745 ], [ -126.3077309, 54.4604264 ], [ -126.3076007, 54.4603238 ], [ -126.307427100000012, 54.4601501 ], [ -126.307192500000014, 54.459955 ], [ -126.307134399999981, 54.4598909 ], [ -126.307079699999989, 54.4597826 ], [ -126.307012199999988, 54.4596274 ], [ -126.3068558, 54.4594536 ], [ -126.3067669, 54.459379600000013 ], [ -126.3066662, 54.4592699 ], [ -126.306553299999976, 54.4591047 ], [ -126.3065359, 54.4588982 ], [ -126.3065611, 54.4587373 ], [ -126.3066484, 54.4585948 ], [ -126.306753199999989, 54.4584168 ], [ -126.306787199999988, 54.4583556 ], [ -126.306908099999987, 54.4581875 ], [ -126.3069623, 54.4580622 ], [ -126.3070192, 54.4578742 ], [ -126.3070013, 54.4576762 ], [ -126.306904499999987, 54.457521 ], [ -126.3068936, 54.4574412 ], [ -126.3068854, 54.457333 ], [ -126.3068789, 54.4572062 ], [ -126.3068714, 54.4570894 ], [ -126.306829099999987, 54.457008300000012 ], [ -126.306683400000011, 54.4568872 ], [ -126.306561699999975, 54.4568573 ], [ -126.306269199999974, 54.4568602 ], [ -126.306161099999983, 54.4568402 ], [ -126.306104300000015, 54.4567932 ], [ -126.306116499999987, 54.4566138 ], [ -126.3061528, 54.4565255 ], [ -126.3062404, 54.4563474 ], [ -126.3063289, 54.456187899999989 ], [ -126.30634, 54.4560256 ], [ -126.306342, 54.4559714 ], [ -126.3062452, 54.4558162 ], [ -126.3062337, 54.455745 ], [ -126.306199299999989, 54.4555727 ], [ -126.306179199999988, 54.4554018 ], [ -126.306144800000013, 54.4552294 ], [ -126.306125699999981, 54.4550414 ], [ -126.305894, 54.4548107 ], [ -126.3057346, 54.4546455 ], [ -126.3055151, 54.4544703 ], [ -126.305430699999988, 54.4543421 ], [ -126.3053044, 54.4541599 ], [ -126.3052626, 54.4540772 ], [ -126.3052596, 54.4539063 ], [ -126.305279399999975, 54.4538437 ], [ -126.3053945, 54.4537126 ], [ -126.3055075, 54.4536429 ], [ -126.305731099999988, 54.4535303 ], [ -126.305987300000012, 54.453402200000014 ], [ -126.3063404, 54.4531942 ], [ -126.3064879, 54.4530618 ], [ -126.3065218, 54.4530005 ], [ -126.306528, 54.4529279 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17064107, "stream_order": 5, "gnis_name": "Richfield Creek", "downstream_route_measure": 12951.475970137601, "blue_line_key": 360788426, "length_metre": 1966.4362436044601, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2663453, 54.578557399999987 ], [ -126.266246399999986, 54.5786358 ], [ -126.26618280000001, 54.5786699 ], [ -126.2660257, 54.5787112 ], [ -126.2657145, 54.5787226 ], [ -126.2653489, 54.5786514 ], [ -126.265024, 54.5786528 ], [ -126.264714499999982, 54.578645699999988 ], [ -126.2646057, 54.5786614 ], [ -126.264414, 54.5787383 ], [ -126.264164099999988, 54.5787782 ], [ -126.263941399999979, 54.5788451 ], [ -126.263668099999975, 54.5790004 ], [ -126.2636353, 54.5790445 ], [ -126.2634516, 54.5792382 ], [ -126.2632526, 54.5794404 ], [ -126.2631335, 54.57959 ], [ -126.2629829, 54.5797666 ], [ -126.262787100000011, 54.5799247 ], [ -126.262655, 54.5800557 ], [ -126.2624087, 54.5802665 ], [ -126.2622298, 54.5803975 ], [ -126.26204030000001, 54.5804474 ], [ -126.2616747, 54.5805641 ], [ -126.2614105, 54.5806026 ], [ -126.2610688, 54.5806311 ], [ -126.260724, 54.5806681 ], [ -126.2604437, 54.5806895 ], [ -126.260257900000013, 54.5806937 ], [ -126.260025899999988, 54.5806895 ], [ -126.2598253, 54.5806937 ], [ -126.2596086, 54.580688 ], [ -126.259376100000011, 54.5806923 ], [ -126.259148, 54.5806425 ], [ -126.2588476, 54.5805186 ], [ -126.258523, 54.5804844 ], [ -126.2582306, 54.5804773 ], [ -126.257939, 54.580426 ], [ -126.2576646, 54.5803747 ], [ -126.2574646, 54.5803704 ], [ -126.257186, 54.5803733 ], [ -126.256922, 54.5803761 ], [ -126.2566124, 54.580369 ], [ -126.2562425, 54.5803519 ], [ -126.256011, 54.5803462 ], [ -126.2557156, 54.5803477 ], [ -126.2556058, 54.5803733 ], [ -126.2555263, 54.5804246 ], [ -126.2554586, 54.5804773 ], [ -126.2554111, 54.5805214 ], [ -126.2553536, 54.5806638 ], [ -126.2552088, 54.5807678 ], [ -126.2550192, 54.5808176 ], [ -126.2549105, 54.5808333 ], [ -126.2546124, 54.580863199999989 ], [ -126.2545047, 54.5808689 ], [ -126.254148500000014, 54.580861800000015 ], [ -126.253792099999984, 54.5808618 ], [ -126.253514, 54.5808561 ], [ -126.2534238, 54.5808262 ], [ -126.2531349, 54.5807393 ], [ -126.2528504, 54.5805983 ], [ -126.252608599999974, 54.580538499999989 ], [ -126.2525001, 54.5805186 ], [ -126.2523768, 54.5805057 ], [ -126.2522834, 54.5805129 ], [ -126.2521908, 54.5805385 ], [ -126.251843, 54.5806467 ], [ -126.2515764, 54.5806852 ], [ -126.251250399999975, 54.5806966 ], [ -126.2511433, 54.5806937 ], [ -126.2508018, 54.5806866 ], [ -126.2504313, 54.5806781 ], [ -126.2501536, 54.5806709 ], [ -126.250074199999986, 54.5807151 ], [ -126.2499862, 54.580839 ], [ -126.2499284, 54.581017 ], [ -126.2498886, 54.5811509 ], [ -126.249813799999984, 54.581356 ], [ -126.2497256, 54.5815155 ], [ -126.249620799999988, 54.5816665 ], [ -126.249489700000012, 54.5817804 ], [ -126.249284800000012, 54.5818388 ], [ -126.2491103, 54.5819157 ], [ -126.249015699999987, 54.5819399 ], [ -126.248654799999983, 54.5820225 ], [ -126.2484969, 54.5820453 ], [ -126.2482622, 54.5820766 ], [ -126.248059, 54.5821165 ], [ -126.2479502, 54.5821322 ], [ -126.247669800000011, 54.5821607 ], [ -126.2473084, 54.5822518 ], [ -126.2471956, 54.582286 ], [ -126.2471172, 54.5823202 ], [ -126.2467481, 54.5825096 ], [ -126.246394399999986, 54.5826905 ], [ -126.2461121, 54.5827731 ], [ -126.245766, 54.5828557 ], [ -126.2455608, 54.582887 ], [ -126.2454384, 54.582892699999988 ], [ -126.2450656, 54.5829112 ], [ -126.2449413, 54.5829084 ], [ -126.2446006, 54.5829269 ], [ -126.2444604, 54.582934 ], [ -126.2441975, 54.5829269 ], [ -126.2438554, 54.5829283 ], [ -126.2434696, 54.5829283 ], [ -126.2431914, 54.5829226 ], [ -126.242880199999988, 54.582934 ], [ -126.2425244, 54.5829255 ], [ -126.2421517, 54.582944 ], [ -126.2419175, 54.5829739 ], [ -126.2415599, 54.5830195 ], [ -126.241324599999984, 54.5830593 ], [ -126.2410115, 54.5831249 ], [ -126.240792099999979, 54.5831548 ], [ -126.2404309, 54.5832103 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17098278, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 0.0, "blue_line_key": 360877225, "length_metre": 2174.7795385208301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1241385, 54.3225601 ], [ -126.1241448, 54.3224618 ], [ -126.1241862, 54.322300899999988 ], [ -126.124288, 54.3221955 ], [ -126.124577800000012, 54.3219961 ], [ -126.124766899999983, 54.3219192 ], [ -126.125103599999974, 54.3217383 ], [ -126.1252342, 54.321634300000014 ], [ -126.125335400000012, 54.3214834 ], [ -126.125379200000012, 54.3213224 ], [ -126.1254652, 54.32118 ], [ -126.1256104, 54.321076 ], [ -126.125644099999988, 54.3210504 ], [ -126.125916599999982, 54.3208852 ], [ -126.1260031, 54.3207613 ], [ -126.1260586, 54.3206018 ], [ -126.1261164, 54.3204494 ], [ -126.1262012, 54.3203169 ], [ -126.1263329, 54.320203 ], [ -126.126448200000013, 54.3200805 ], [ -126.1265665, 54.3199566 ], [ -126.1267117, 54.3198526 ], [ -126.126726299999987, 54.3198526 ], [ -126.1268428, 54.3197472 ], [ -126.1269886, 54.3196347 ], [ -126.1270898, 54.3195108 ], [ -126.127161099999981, 54.3193684 ], [ -126.127291, 54.3192459 ], [ -126.1274081, 54.319132 ], [ -126.1274349, 54.318971 ], [ -126.1273972, 54.3188528 ], [ -126.1272692, 54.3186876 ], [ -126.1271717, 54.3185595 ], [ -126.127105500000013, 54.3184056 ], [ -126.127068600000015, 54.3182518 ], [ -126.1270655, 54.3180724 ], [ -126.1270628, 54.3178915 ], [ -126.1271042, 54.3177306 ], [ -126.1271475, 54.3175711 ], [ -126.1272188, 54.3174286 ], [ -126.1273047, 54.3172862 ], [ -126.1274218, 54.3171723 ], [ -126.127551700000012, 54.3170769 ], [ -126.1277256, 54.3169814 ], [ -126.1279593, 54.316943 ], [ -126.1282203, 54.3169572 ], [ -126.1284387, 54.3169002 ], [ -126.128602199999975, 54.3167863 ], [ -126.1286876, 54.3166453 ], [ -126.128744200000014, 54.3165029 ], [ -126.1287728, 54.3163234 ], [ -126.128769, 54.3161525 ], [ -126.1287505, 54.315981600000015 ], [ -126.128570899999985, 54.3159047 ], [ -126.1282641, 54.3158891 ], [ -126.127909399999979, 54.3158976 ], [ -126.127699299999989, 54.3158307 ], [ -126.1273899, 54.315634100000011 ], [ -126.127337, 54.3154974 ], [ -126.127606399999976, 54.3153877 ], [ -126.127705699999979, 54.3153094 ], [ -126.1276853, 54.3151371 ], [ -126.127618399999974, 54.3149918 ], [ -126.1274891, 54.3148907 ], [ -126.127261800000014, 54.3148309 ], [ -126.12693969999998, 54.3148238 ], [ -126.1268092, 54.3147127 ], [ -126.1268346, 54.3145688 ], [ -126.127168200000014, 54.3143965 ], [ -126.1274458, 54.3143851 ], [ -126.1276935, 54.3143552 ], [ -126.1277757, 54.3142769 ], [ -126.1277502, 54.3142128 ], [ -126.1276185, 54.3141116 ], [ -126.127457299999975, 54.3140177 ], [ -126.1272777, 54.3139407 ], [ -126.126983599999988, 54.313735699999981 ], [ -126.1268684, 54.313616 ], [ -126.1267545, 54.3135064 ], [ -126.1266984, 54.3134052 ], [ -126.1267353, 54.313344 ], [ -126.1269251, 54.3132585 ], [ -126.127187400000011, 54.3132286 ], [ -126.1274821, 54.3132172 ], [ -126.1277725, 54.3132244 ], [ -126.1280475, 54.3132671 ], [ -126.1284002, 54.3132571 ], [ -126.12856, 54.3131802 ], [ -126.1286014, 54.3130193 ], [ -126.1285199, 54.312874 ], [ -126.1284066, 54.3127359 ], [ -126.1283238, 54.3126077 ], [ -126.1282558, 54.3124724 ], [ -126.1281481, 54.3122716 ], [ -126.12819970000001, 54.312183300000015 ], [ -126.1283881, 54.3121149 ], [ -126.1286498, 54.311905499999988 ], [ -126.1288548, 54.3118386 ], [ -126.1291477, 54.311818699999989 ], [ -126.1294551, 54.3118258 ], [ -126.1297633, 54.3118244 ], [ -126.130026199999989, 54.3117859 ], [ -126.130229899999989, 54.3117361 ], [ -126.13041960000001, 54.3116506 ], [ -126.130564799999988, 54.3115467 ], [ -126.1306648, 54.3114327 ], [ -126.1307233, 54.3112718 ], [ -126.130720200000013, 54.3110923 ], [ -126.1306381, 54.3109556 ], [ -126.130417200000011, 54.3108246 ], [ -126.130345800000015, 54.310732 ], [ -126.1302943, 54.3105782 ], [ -126.1302282, 54.3104244 ], [ -126.1300817, 54.3103304 ], [ -126.1299016, 54.3102549 ], [ -126.129757, 54.310142400000011 ], [ -126.1296724, 54.3100057 ], [ -126.129654, 54.3098347 ], [ -126.129711299999983, 54.3096838 ], [ -126.1298125, 54.3095599 ], [ -126.1301748, 54.309416 ], [ -126.1305542, 54.3092722 ], [ -126.1307579, 54.3092223 ], [ -126.1309763, 54.3091654 ], [ -126.131196499999973, 54.3091169 ], [ -126.131385599999987, 54.30904 ], [ -126.131691100000012, 54.3088577 ], [ -126.1319904, 54.3087395 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091786, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 271948.47009647498, "blue_line_key": 360873822, "length_metre": 165.878254992759, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1028651, 54.416142 ], [ -126.1031575, 54.416132 ], [ -126.1035767, 54.4160964 ], [ -126.1039211, 54.4160238 ], [ -126.1042931, 54.4159967 ], [ -126.10461429999998, 54.4160224 ], [ -126.104938499999989, 54.4160124 ], [ -126.105034, 54.4159782 ], [ -126.10533070000001, 54.4159227 ], [ -126.105362, 54.4159241 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17098020, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 29181.8030020109, "blue_line_key": 360880905, "length_metre": 96.823797276475304, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.427206200000015, 54.3132343 ], [ -126.4274412, 54.3134109 ], [ -126.427642, 54.3136217 ], [ -126.427709900000011, 54.313767 ], [ -126.4277302, 54.3139294 ], [ -126.4277397, 54.3140191 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17054036, "stream_order": 4, "gnis_name": "Byman Creek", "downstream_route_measure": 20976.477315969201, "blue_line_key": 360856488, "length_metre": 352.10764107968799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.522366, 54.6333994 ], [ -126.5225949, 54.6334493 ], [ -126.522864299999981, 54.6335889 ], [ -126.5232272, 54.6337498 ], [ -126.52354050000001, 54.633962 ], [ -126.523867, 54.6341856 ], [ -126.52406019999998, 54.6343323 ], [ -126.524118300000012, 54.6344064 ], [ -126.524245, 54.6345887 ], [ -126.524404800000013, 54.6347895 ], [ -126.5244443, 54.6348892 ], [ -126.524546799999982, 54.6349988 ], [ -126.5246926, 54.6351185 ], [ -126.5249311, 54.6352766 ], [ -126.5252897, 54.6355002 ], [ -126.525498, 54.6356383 ], [ -126.525736, 54.635804899999989 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17052687, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1155.57773588599, "blue_line_key": 360851779, "length_metre": 291.99589942916401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5247733, 54.642466 ], [ -126.5248463, 54.6425472 ], [ -126.5248568, 54.6426383 ], [ -126.5248372, 54.6427095 ], [ -126.524752799999987, 54.6428334 ], [ -126.524655, 54.6429032 ], [ -126.524351, 54.6430499 ], [ -126.5240504, 54.643151 ], [ -126.523893, 54.6431937 ], [ -126.52351560000001, 54.6432749 ], [ -126.5234364, 54.6433191 ], [ -126.5233848, 54.6433903 ], [ -126.5233495, 54.6434786 ], [ -126.523275, 54.6436666 ], [ -126.5232354, 54.6438175 ], [ -126.5231992, 54.6439158 ], [ -126.5231242, 54.6441124 ], [ -126.5229862, 54.6443345 ], [ -126.5229657, 54.6444157 ], [ -126.522955700000011, 54.6445952 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17054692, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 28128.399190890301, "blue_line_key": 360856488, "length_metre": 328.69556769689501, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5919104, 54.6284646 ], [ -126.591968200000011, 54.6285472 ], [ -126.591995, 54.6286198 ], [ -126.5920743, 54.6288192 ], [ -126.5921483, 54.6288833 ], [ -126.5923841, 54.6290855 ], [ -126.592451099999977, 54.6292849 ], [ -126.592424, 54.629464399999989 ], [ -126.5924128, 54.6296623 ], [ -126.5923924, 54.6297506 ], [ -126.5923487, 54.6299571 ], [ -126.5923045, 54.6301722 ], [ -126.592307599999984, 54.6303787 ], [ -126.592361099999977, 54.630524 ], [ -126.59243, 54.6306963 ], [ -126.5924544, 54.6308045 ], [ -126.592448800000014, 54.6308857 ], [ -126.5924218, 54.6311008 ], [ -126.592448600000012, 54.6311734 ], [ -126.5925192, 54.6312546 ], [ -126.5925946, 54.631293 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17061195, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 24359.628915871901, "blue_line_key": 360875378, "length_metre": 107.868863972387, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6988706, 54.5913611 ], [ -126.6992021, 54.5915206 ], [ -126.69943, 54.5915875 ], [ -126.6995539, 54.5915989 ], [ -126.69980120000001, 54.5915946 ], [ -126.700172900000013, 54.5915932 ], [ -126.7004077, 54.5915605 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17079865, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 5166.6987197217104, "blue_line_key": 360875052, "length_metre": 242.18057302475199, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3738882, 54.4956586 ], [ -126.37421590000001, 54.4966269 ], [ -126.375221899999985, 54.4976566 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17067084, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1153.04995518646, "blue_line_key": 360881574, "length_metre": 976.73708931108899, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.604101299999982, 54.5615552 ], [ -126.604190300000013, 54.5616464 ], [ -126.6043628, 54.5618657 ], [ -126.6044572, 54.5620836 ], [ -126.604481399999983, 54.5621918 ], [ -126.604533600000011, 54.5623898 ], [ -126.604575399999973, 54.5624539 ], [ -126.6046713, 54.5626533 ], [ -126.604852099999988, 54.5627558 ], [ -126.605135199999978, 54.5629324 ], [ -126.605239399999988, 54.5629794 ], [ -126.6055991, 54.563176 ], [ -126.6058119, 54.5632785 ], [ -126.606158299999976, 54.563420900000011 ], [ -126.606326299999978, 54.5634679 ], [ -126.606645699999987, 54.5635463 ], [ -126.606998499999989, 54.563599 ], [ -126.6072766, 54.5636047 ], [ -126.6076627, 54.5636032 ], [ -126.6078337, 54.5636061 ], [ -126.6081574, 54.5636217 ], [ -126.6085288, 54.5636203 ], [ -126.608900199999979, 54.5636189 ], [ -126.6091793, 54.5636146 ], [ -126.6095507, 54.5636132 ], [ -126.609765399999986, 54.5636175 ], [ -126.6100287, 54.5636232 ], [ -126.6103496, 54.563683 ], [ -126.6105452, 54.5637855 ], [ -126.610660700000011, 54.5639137 ], [ -126.610772899999986, 54.5641231 ], [ -126.610891399999986, 54.5642427 ], [ -126.6110226, 54.5643609 ], [ -126.6111858, 54.564472 ], [ -126.611470399999988, 54.5646586 ], [ -126.6117236, 54.5648152 ], [ -126.611990499999976, 54.5650103 ], [ -126.612287400000014, 54.565204 ], [ -126.612433, 54.5653878 ], [ -126.61248759999998, 54.5655145 ], [ -126.6125684, 54.5657224 ], [ -126.6126206, 54.5658492 ], [ -126.6126895, 54.566013 ], [ -126.6127265, 54.5661839 ], [ -126.6127901, 54.5663918 ], [ -126.612876199999974, 54.56652 ], [ -126.6129761, 54.5666653 ], [ -126.613047900000012, 54.5667564 ], [ -126.613181599999976, 54.5668675 ], [ -126.6134319, 54.5670612 ], [ -126.6135066, 54.5671082 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17076482, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 9897.72585203774, "blue_line_key": 360869846, "length_metre": 212.00227779934201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.601285, 54.5120283 ], [ -126.601389900000015, 54.5120938 ], [ -126.6014846, 54.5120682 ], [ -126.60169329999998, 54.5119471 ], [ -126.602033299999974, 54.5119358 ], [ -126.6021722, 54.5119386 ], [ -126.6022634, 54.5119585 ], [ -126.6022898, 54.5120312 ], [ -126.6022823, 54.5121736 ], [ -126.602372499999987, 54.5122035 ], [ -126.6027464, 54.5121651 ], [ -126.6031321, 54.5121636 ], [ -126.603348, 54.5121779 ], [ -126.603442699999988, 54.5121522 ], [ -126.6035577, 54.5120112 ], [ -126.6036382, 54.5119771 ], [ -126.6038536, 54.5119714 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17078177, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 7525.3322611105395, "blue_line_key": 360869846, "length_metre": 830.38909384986198, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5913953, 54.5034176 ], [ -126.5913871, 54.5035614 ], [ -126.591375, 54.5037594 ], [ -126.5913354, 54.5039018 ], [ -126.5912685, 54.5039815 ], [ -126.5910724, 54.5041938 ], [ -126.591034900000011, 54.5042735 ], [ -126.5909782, 54.5044515 ], [ -126.5909127, 54.5045413 ], [ -126.5906979, 54.5047435 ], [ -126.5905809, 54.5049116 ], [ -126.590469899999988, 54.5049628 ], [ -126.590364, 54.5051765 ], [ -126.590293499999987, 54.5053374 ], [ -126.5901405, 54.5055596 ], [ -126.5900432, 54.5056564 ], [ -126.5898172, 54.5058131 ], [ -126.5897057, 54.5058658 ], [ -126.589321700000013, 54.5060823 ], [ -126.5889765, 54.5062005 ], [ -126.588765299999977, 54.50635 ], [ -126.588632499999989, 54.5064995 ], [ -126.5885317, 54.506642 ], [ -126.5883872, 54.5067474 ], [ -126.5882631, 54.5067801 ], [ -126.58790590000001, 54.5067915 ], [ -126.587768, 54.5067787 ], [ -126.587554200000014, 54.5067303 ], [ -126.5872142, 54.5067417 ], [ -126.587072400000011, 54.506783 ], [ -126.586850399999989, 54.5068784 ], [ -126.586770300000012, 54.5069396 ], [ -126.586673100000013, 54.5070009 ], [ -126.586291499999987, 54.5071817 ], [ -126.5859601, 54.5073099 ], [ -126.585832499999981, 54.5073526 ], [ -126.5855502, 54.5074452 ], [ -126.585246599999977, 54.5076275 ], [ -126.5849568, 54.5078198 ], [ -126.5848569, 54.5079522 ], [ -126.5847368, 54.5081573 ], [ -126.584633, 54.5083083 ], [ -126.584483899999981, 54.508512 ], [ -126.58438, 54.5086985 ], [ -126.5842761, 54.5088851 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17098203, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 28759.920264690802, "blue_line_key": 360880905, "length_metre": 312.04954336649303, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4272208, 54.3100341 ], [ -126.427249, 54.3104073 ], [ -126.427084400000012, 54.3106636 ], [ -126.4264043, 54.3110923 ], [ -126.4259137, 54.3113045 ], [ -126.4257057, 54.3115253 ], [ -126.4262423, 54.3124311 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17106117, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 52663.897439339496, "blue_line_key": 360886221, "length_metre": 304.22509463448398, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4715096, 54.1859513 ], [ -126.47139989999998, 54.1859855 ], [ -126.4713202, 54.1860382 ], [ -126.471302599999987, 54.1861009 ], [ -126.47131349999998, 54.186145 ], [ -126.4713093, 54.1862177 ], [ -126.4713069, 54.1862718 ], [ -126.471316699999988, 54.1863529 ], [ -126.471312399999988, 54.1864056 ], [ -126.471279, 54.1864512 ], [ -126.471232, 54.1864939 ], [ -126.471149899999986, 54.1865737 ], [ -126.4711152, 54.1866364 ], [ -126.4711116, 54.1867076 ], [ -126.4711207, 54.1867973 ], [ -126.4711617, 54.1868799 ], [ -126.4712044, 54.186944 ], [ -126.4712458, 54.1869981 ], [ -126.4712879, 54.1870708 ], [ -126.4713007, 54.1871163 ], [ -126.47131229999998, 54.187179 ], [ -126.4713252, 54.1872246 ], [ -126.47133740000001, 54.1872787 ], [ -126.4713642, 54.1873328 ], [ -126.471390500000012, 54.1873884 ], [ -126.4714028, 54.1874425 ], [ -126.4714144, 54.1875051 ], [ -126.471441200000015, 54.1875592 ], [ -126.471453399999987, 54.187613400000011 ], [ -126.47149610000001, 54.1876775 ], [ -126.4715236, 54.187723 ], [ -126.4715962, 54.1878056 ], [ -126.4716669, 54.1878797 ], [ -126.4717559, 54.187943799999985 ], [ -126.4718431, 54.1880264 ], [ -126.4718706, 54.188072 ], [ -126.4719608, 54.188119 ], [ -126.4720474, 54.1882101 ], [ -126.4720883, 54.1882927 ], [ -126.472098699999975, 54.1883654 ], [ -126.472065199999989, 54.188418 ], [ -126.472017099999974, 54.1884437 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102579, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 26450.625503086401, "blue_line_key": 360886221, "length_metre": 634.77815329258794, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6292633, 54.2393264 ], [ -126.6293118, 54.2392994 ], [ -126.629405699999978, 54.2392751 ], [ -126.6294976, 54.2392495 ], [ -126.629592500000015, 54.2392153 ], [ -126.6296999, 54.2392082 ], [ -126.629823699999989, 54.2392025 ], [ -126.6299616, 54.2392054 ], [ -126.630083, 54.2392068 ], [ -126.630206199999975, 54.2392096 ], [ -126.6303442, 54.2392125 ], [ -126.630421599999977, 54.2392139 ], [ -126.630499699999987, 54.2392068 ], [ -126.6306668, 54.2392096 ], [ -126.6308828, 54.2392054 ], [ -126.6310976, 54.2392182 ], [ -126.631264800000011, 54.239221 ], [ -126.6314027, 54.2392239 ], [ -126.631541199999987, 54.2392182 ], [ -126.6317582, 54.2392039 ], [ -126.6318338, 54.2391968 ], [ -126.631988, 54.2391811 ], [ -126.6321271, 54.2391669 ], [ -126.632267299999981, 54.2391427 ], [ -126.6323768, 54.2391085 ], [ -126.632471, 54.2390558 ], [ -126.632582299999982, 54.238996 ], [ -126.6328318, 54.23891050000001 ], [ -126.6330052, 54.2388336 ], [ -126.6331323, 54.2387639 ], [ -126.633183699999989, 54.2387012 ], [ -126.6332636, 54.2386129 ], [ -126.633299900000011, 54.2385516 ], [ -126.633321099999989, 54.2384434 ], [ -126.6333397, 54.2383907 ], [ -126.633357, 54.238328 ], [ -126.633395799999988, 54.2382113 ], [ -126.633400499999979, 54.2380945 ], [ -126.6333904, 54.23804040000001 ], [ -126.6333914, 54.237996200000012 ], [ -126.6333511, 54.2378965 ], [ -126.633310400000013, 54.2378324 ], [ -126.63317570000001, 54.2377584 ], [ -126.633083899999988, 54.237728499999989 ], [ -126.632977799999978, 54.2377185 ], [ -126.6328545, 54.2377156 ], [ -126.6326422, 54.2377028 ], [ -126.632564699999975, 54.2377014 ], [ -126.6324278, 54.2376886 ], [ -126.6322917, 54.2376601 ], [ -126.6321405, 54.2375846 ], [ -126.632098099999979, 54.237539 ], [ -126.632009200000013, 54.2374735 ], [ -126.63189220000001, 54.2373909 ], [ -126.6317721, 54.2373169 ], [ -126.6317144, 54.2372528 ], [ -126.6317042, 54.2371986 ], [ -126.631706299999976, 54.2371445 ], [ -126.6317084, 54.2370904 ], [ -126.6317129, 54.2370363 ], [ -126.6316993, 54.2369921 ], [ -126.6316878, 54.236928 ], [ -126.631695, 54.2368113 ], [ -126.631713, 54.2367671 ], [ -126.6317494, 54.2366503 ], [ -126.631817, 54.236535 ], [ -126.6318882, 54.2364025 ], [ -126.631875099999988, 54.2363569 ], [ -126.631849399999979, 54.2362572 ], [ -126.6318097, 54.236149 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100672, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1652.3895382176399, "blue_line_key": 360874778, "length_metre": 237.08678275713601, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3478475, 54.267344900000012 ], [ -126.3476083, 54.2674745 ], [ -126.3473457, 54.2675129 ], [ -126.3472498, 54.2675557 ], [ -126.346902500000013, 54.2677009 ], [ -126.3467781, 54.2677351 ], [ -126.346455, 54.2677451 ], [ -126.3463592, 54.2677878 ], [ -126.3462793, 54.2678405 ], [ -126.3460064, 54.2680228 ], [ -126.3459119, 54.2680484 ], [ -126.3458253, 54.268208 ], [ -126.345616600000014, 54.2683475 ], [ -126.3454255, 54.2684515 ], [ -126.3450953, 54.2685968 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17055122, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 26305.587412084598, "blue_line_key": 360856488, "length_metre": 317.15859541137598, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5715257, 54.6255221 ], [ -126.5717417, 54.6255093 ], [ -126.57188, 54.6255293 ], [ -126.572044, 54.6256318 ], [ -126.5721685, 54.6256347 ], [ -126.57225960000001, 54.6256631 ], [ -126.5724776, 54.6256589 ], [ -126.5727231, 54.6256817 ], [ -126.573014599999979, 54.62575 ], [ -126.573396100000011, 54.6258212 ], [ -126.573700300000013, 54.6259167 ], [ -126.57379250000001, 54.6259637 ], [ -126.574057700000012, 54.6261944 ], [ -126.5742513, 54.6262969 ], [ -126.574484, 54.6262927 ], [ -126.574795400000014, 54.6262813 ], [ -126.574963700000012, 54.6262927 ], [ -126.575176499999984, 54.6263966 ], [ -126.5752652, 54.6264607 ], [ -126.5754542, 54.6266629 ], [ -126.5755901, 54.6267185 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17066403, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 5534.2545851454997, "blue_line_key": 360851751, "length_metre": 379.59485631592099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1629716, 54.5665347 ], [ -126.15855569999998, 54.5687826 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17085117, "stream_order": 4, "gnis_name": "Raspberry Creek", "downstream_route_measure": 5177.3520314869802, "blue_line_key": 360817924, "length_metre": 168.29808058081201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6354569, 54.4687879 ], [ -126.635709, 54.4689446 ], [ -126.6358152, 54.4689916 ], [ -126.636043099999981, 54.4690414 ], [ -126.636413, 54.4690841 ], [ -126.6367016, 54.4691354 ], [ -126.636915699999989, 54.4691753 ], [ -126.6372376, 54.4692365 ], [ -126.6373429, 54.469265 ], [ -126.637646099999984, 54.4693519 ], [ -126.637800399999975, 54.4693733 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17076512, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 10270.516025696401, "blue_line_key": 360869846, "length_metre": 39.716430316675002, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6063341, 54.5118503 ], [ -126.6067035, 54.5118389 ], [ -126.606784099999985, 54.5118047 ], [ -126.6068646, 54.5117349 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17063889, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 10923.707929746801, "blue_line_key": 360856488, "length_metre": 159.04334481101299, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4620291, 54.579271 ], [ -126.4623681, 54.5793137 ], [ -126.46269, 54.5793564 ], [ -126.4629656, 54.5793977 ], [ -126.463148800000013, 54.5794646 ], [ -126.463403500000013, 54.5795871 ], [ -126.463688299999987, 54.5797367 ], [ -126.463808, 54.5798022 ], [ -126.464076, 54.5799788 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17067703, "stream_order": 4, "gnis_name": "Redtop Creek", "downstream_route_measure": 0.0, "blue_line_key": 360883143, "length_metre": 125.024323135548, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3056101, 54.5593178 ], [ -126.30585, 54.5594317 ], [ -126.306015, 54.5595072 ], [ -126.306089899999989, 54.5595528 ], [ -126.3061924, 54.5596453 ], [ -126.306219, 54.5597094 ], [ -126.3063443, 54.5599188 ], [ -126.3064696, 54.5601282 ], [ -126.3064956, 54.5602008 ], [ -126.306507899999986, 54.560263500000012 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17068048, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 0.0, "blue_line_key": 360881574, "length_metre": 231.74507441050201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.593403, 54.555931 ], [ -126.5933775, 54.556119 ], [ -126.5933583, 54.5561817 ], [ -126.593227700000014, 54.5563041 ], [ -126.593034599999982, 54.5564081 ], [ -126.5927994, 54.556485 ], [ -126.5924673, 54.5565861 ], [ -126.5923553, 54.556683 ], [ -126.592317, 54.5568083 ], [ -126.5922591, 54.5570049 ], [ -126.5922527, 54.5570946 ], [ -126.5922438, 54.5572555 ], [ -126.5922399, 54.5573096 ], [ -126.592340599999986, 54.5574378 ], [ -126.5924448, 54.5575204 ], [ -126.592685499999988, 54.5576059 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092108, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 14982.562270934201, "blue_line_key": 360862508, "length_metre": 398.66576816332503, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.374914499999988, 54.4127994 ], [ -126.3747454, 54.4128136 ], [ -126.3744969, 54.412845 ], [ -126.374128, 54.412836399999989 ], [ -126.37389850000001, 54.4127866 ], [ -126.373597499999988, 54.4126897 ], [ -126.3732466, 54.412637 ], [ -126.373137, 54.4126356 ], [ -126.3729844, 54.4126313 ], [ -126.3726919, 54.4126071 ], [ -126.372554799999975, 54.4126142 ], [ -126.3721836, 54.4126328 ], [ -126.3719229, 54.4126085 ], [ -126.371645199999989, 54.4125843 ], [ -126.371324, 54.4125516 ], [ -126.3710799, 54.4125359 ], [ -126.370924300000013, 54.4125331 ], [ -126.370586, 54.4125345 ], [ -126.3702932, 54.4125459 ], [ -126.3700439, 54.4125587 ], [ -126.369849300000013, 54.4125003 ], [ -126.369635, 54.4124419 ], [ -126.369287, 54.4123536 ], [ -126.368968400000014, 54.4122653 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092440, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 10821.824955775801, "blue_line_key": 360862508, "length_metre": 496.214704344251, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4277137, 54.408281800000012 ], [ -126.4267254, 54.4084489 ], [ -126.4257851, 54.408823 ], [ -126.422047600000013, 54.4111587 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17094997, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 5781.0323853884602, "blue_line_key": 360886524, "length_metre": 935.58389341364602, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.201915899999989, 54.369937799999988 ], [ -126.202144300000015, 54.369962 ], [ -126.202378700000011, 54.3699221 ], [ -126.202457599999988, 54.3698794 ], [ -126.2027935, 54.3697071 ], [ -126.202925600000015, 54.3695575 ], [ -126.2030424, 54.3694436 ], [ -126.203260799999981, 54.3693938 ], [ -126.203368, 54.3694151 ], [ -126.2036998, 54.3694849 ], [ -126.2037764, 54.3695234 ], [ -126.2039264, 54.3695618 ], [ -126.2041743, 54.369559 ], [ -126.2045422, 54.3695761 ], [ -126.204803700000014, 54.3695832 ], [ -126.205034399999988, 54.3695875 ], [ -126.2054042, 54.3695789 ], [ -126.2057238, 54.3696216 ], [ -126.205920299999974, 54.36968 ], [ -126.2060545, 54.3697555 ], [ -126.2063363, 54.3698965 ], [ -126.206444600000012, 54.3699079 ], [ -126.2067991, 54.3699079 ], [ -126.206974100000011, 54.3698224 ], [ -126.2070229, 54.3697683 ], [ -126.207019699999989, 54.3695803 ], [ -126.2070704, 54.3695276 ], [ -126.2072619, 54.3694237 ], [ -126.207356100000013, 54.3693995 ], [ -126.207648699999979, 54.3693881 ], [ -126.207741099999978, 54.3693895 ], [ -126.208046, 54.3694593 ], [ -126.2083038, 54.3695105 ], [ -126.2084264, 54.3695234 ], [ -126.208687, 54.3695191 ], [ -126.2088437, 54.3695048 ], [ -126.2089551, 54.3694536 ], [ -126.2090787, 54.3694294 ], [ -126.2094062, 54.3693752 ], [ -126.209688899999975, 54.3692827 ], [ -126.2097819, 54.3692756 ], [ -126.2098896, 54.3692684 ], [ -126.2100874, 54.3693097 ], [ -126.2103347, 54.3693154 ], [ -126.210705, 54.3693055 ], [ -126.210781599999976, 54.3692898 ], [ -126.210763499999985, 54.3691089 ], [ -126.210796499999987, 54.3690648 ], [ -126.2109709, 54.3689879 ], [ -126.2110652, 54.3689636 ], [ -126.2111906, 54.368948 ], [ -126.2113289, 54.3689508 ], [ -126.2116828, 54.3689594 ], [ -126.211774, 54.3689708 ], [ -126.2120765, 54.3690406 ], [ -126.2122137, 54.3690534 ], [ -126.212352599999988, 54.3690477 ], [ -126.212508, 54.369023499999983 ], [ -126.2125747, 54.3689537 ], [ -126.212585499999989, 54.3688013 ], [ -126.2126158, 54.3685948 ], [ -126.212629, 54.3683883 ], [ -126.2126715, 54.3682088 ], [ -126.2128655, 54.3680707 ], [ -126.213056899999984, 54.3679938 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17060547, "stream_order": 4, "gnis_name": "Richfield Creek", "downstream_route_measure": 18903.4622369096, "blue_line_key": 360788426, "length_metre": 587.85009253182602, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1895842, 54.5964597 ], [ -126.188599199999985, 54.5964854 ], [ -126.187467199999986, 54.5970308 ], [ -126.1868339, 54.5980919 ], [ -126.1845406, 54.5985149 ], [ -126.1822381, 54.5984159 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17075957, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 212122.00789742, "blue_line_key": 360873822, "length_metre": 382.40620996573102, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.398861599999989, 54.5169945 ], [ -126.3986065, 54.5168265 ], [ -126.398529899999986, 54.5165274 ], [ -126.398775199999989, 54.515821 ], [ -126.3986456, 54.5156729 ], [ -126.398394, 54.5155789 ], [ -126.3976996, 54.515586 ], [ -126.3972468, 54.5157227 ], [ -126.39671509999998, 54.5163081 ], [ -126.396345399999987, 54.5163408 ], [ -126.3959042, 54.5162696 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17079899, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 6638.6359357504998, "blue_line_key": 360875052, "length_metre": 120.482000342714, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.391770799999989, 54.4958849 ], [ -126.392020800000012, 54.4958365 ], [ -126.392114299999989, 54.4957938 ], [ -126.392355799999976, 54.4956371 ], [ -126.3925943, 54.4955517 ], [ -126.39282679999998, 54.4955388 ], [ -126.3930248, 54.4955616 ], [ -126.39324160000001, 54.4955659 ], [ -126.3933697, 54.4954876 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17089178, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 9334.7917950966494, "blue_line_key": 360846413, "length_metre": 382.73972699689102, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.307963300000011, 54.4423332 ], [ -126.3077836, 54.4422392 ], [ -126.307710199999974, 54.4421837 ], [ -126.3075261, 54.4419643 ], [ -126.3073646, 54.4418262 ], [ -126.3071279, 54.4416581 ], [ -126.306801599999986, 54.4414531 ], [ -126.306471500000015, 54.4413206 ], [ -126.30639930000001, 54.4412551 ], [ -126.306286, 54.4410913 ], [ -126.3062375, 54.4408834 ], [ -126.3062339, 54.440721 ], [ -126.3062012, 54.440496 ], [ -126.306089300000011, 54.4403493 ], [ -126.30595790000001, 54.4402297 ], [ -126.3057225, 54.4400445 ], [ -126.305609299999986, 54.4398807 ], [ -126.305099399999975, 54.439454899999987 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076717, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 205974.74575364101, "blue_line_key": 360873822, "length_metre": 260.42108710228302, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.46536540000001, 54.511292 ], [ -126.4648744, 54.5119671 ], [ -126.4645112, 54.5122904 ], [ -126.4629314, 54.5130908 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17078735, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 221211.09141591701, "blue_line_key": 360873822, "length_metre": 705.98116623351495, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3126037, 54.5044601 ], [ -126.3095467, 54.5041012 ], [ -126.3090033, 54.5039246 ], [ -126.308415, 54.5036041 ], [ -126.308354799999989, 54.5034346 ], [ -126.308411799999988, 54.5032039 ], [ -126.308222199999989, 54.5030117 ], [ -126.3079009, 54.5029561 ], [ -126.3074868, 54.5031284 ], [ -126.307256599999988, 54.5031413 ], [ -126.3068532, 54.5030544 ], [ -126.3066413, 54.502939 ], [ -126.3065162, 54.5027795 ], [ -126.3064561, 54.5019919 ], [ -126.306266, 54.5018566 ], [ -126.3057565, 54.5017299 ], [ -126.3057, 54.5016401 ], [ -126.305679200000014, 54.5011716 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100277, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 21113.5616206913, "blue_line_key": 360880905, "length_metre": 918.96142016754902, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.380043199999989, 54.2723909 ], [ -126.38019, 54.272484899999988 ], [ -126.3802938, 54.272549 ], [ -126.3803789, 54.2726586 ], [ -126.3804072, 54.2727227 ], [ -126.380386499999986, 54.272793899999989 ], [ -126.3802784, 54.2728096 ], [ -126.380227799999986, 54.2728623 ], [ -126.380254299999976, 54.2729178 ], [ -126.3805126, 54.2729591 ], [ -126.380895, 54.2729947 ], [ -126.381042900000011, 54.2730788 ], [ -126.3809894, 54.2731941 ], [ -126.38091129999998, 54.2732283 ], [ -126.380803199999988, 54.273244 ], [ -126.3807685, 54.2733066 ], [ -126.380749, 54.2733679 ], [ -126.3807519, 54.2735573 ], [ -126.380717199999978, 54.27362 ], [ -126.380638499999989, 54.2736627 ], [ -126.3806049, 54.2737154 ], [ -126.380629, 54.273825 ], [ -126.380702899999989, 54.2738706 ], [ -126.380808, 54.2738906 ], [ -126.3811311, 54.2738806 ], [ -126.381253199999989, 54.2739005 ], [ -126.381280800000013, 54.2739461 ], [ -126.381257799999986, 54.2740714 ], [ -126.381348199999977, 54.2740914 ], [ -126.381441599999988, 54.2740757 ], [ -126.381587400000015, 54.2739618 ], [ -126.3816814, 54.2739375 ], [ -126.381895199999988, 54.2739603 ], [ -126.3819527, 54.2740244 ], [ -126.3820272, 54.2740615 ], [ -126.3820548, 54.274107 ], [ -126.38205640000001, 54.2743135 ], [ -126.3819905, 54.2743748 ], [ -126.3818009, 54.2744617 ], [ -126.381811899999988, 54.2745329 ], [ -126.3818707, 54.2745799 ], [ -126.3821772, 54.274568500000015 ], [ -126.382501499999975, 54.2745485 ], [ -126.382729900000015, 54.2745984 ], [ -126.3829149, 54.2745927 ], [ -126.3829731, 54.2746482 ], [ -126.3829531, 54.2747109 ], [ -126.382926, 54.2749089 ], [ -126.38289, 54.2749616 ], [ -126.382796, 54.2750128 ], [ -126.3824883, 54.2750071 ], [ -126.382356699999988, 54.2751567 ], [ -126.3822921, 54.2752008 ], [ -126.382061799999988, 54.2752037 ], [ -126.381936700000011, 54.2752464 ], [ -126.381931900000012, 54.2753005 ], [ -126.3819759, 54.2753546 ], [ -126.382280099999988, 54.2753703 ], [ -126.3823718, 54.2754002 ], [ -126.382430500000012, 54.2754543 ], [ -126.3825209, 54.2754743 ], [ -126.3826595, 54.2754686 ], [ -126.382832799999989, 54.2754002 ], [ -126.382898099999977, 54.2753475 ], [ -126.383017400000014, 54.2751439 ], [ -126.383256499999987, 54.2750143 ], [ -126.3834352, 54.2748562 ], [ -126.3835286, 54.2748405 ], [ -126.383728799999986, 54.2748263 ], [ -126.383818100000013, 54.2748562 ], [ -126.3838768, 54.2749103 ], [ -126.383887899999976, 54.2749744 ], [ -126.3838703, 54.275037 ], [ -126.383769199999989, 54.2751424 ], [ -126.383728, 54.2753119 ], [ -126.383693900000011, 54.275366 ], [ -126.3836152, 54.2754088 ], [ -126.383317299999987, 54.2755184 ], [ -126.3832503, 54.2755896 ], [ -126.383131, 54.2757662 ], [ -126.383158599999987, 54.2758389 ], [ -126.3832631, 54.2758602 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17104873, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 7239.5698785860204, "blue_line_key": 360882583, "length_metre": 65.578782958106999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.9751963, 54.2075067 ], [ -125.975198, 54.2073444 ], [ -125.9751649, 54.2073088 ], [ -125.9751127, 54.2071934 ], [ -125.975107099999988, 54.2071493 ], [ -125.9750903, 54.2071222 ], [ -125.9749256, 54.2069556 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093493, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 488.58755960801898, "blue_line_key": 360802599, "length_metre": 415.95905233235402, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.517701199999976, 54.3947475 ], [ -126.51734470000001, 54.3947945 ], [ -126.517098, 54.3948074 ], [ -126.51674, 54.3948444 ], [ -126.5164765, 54.3948843 ], [ -126.516194699999986, 54.3949412 ], [ -126.5158365, 54.395006699999989 ], [ -126.5155243, 54.3950808 ], [ -126.5152926, 54.3951207 ], [ -126.5149479, 54.3952033 ], [ -126.5146645, 54.3952788 ], [ -126.5144159, 54.3953457 ], [ -126.5141774, 54.3954397 ], [ -126.513913299999984, 54.3954881 ], [ -126.5136797, 54.3955195 ], [ -126.5133359, 54.3956206 ], [ -126.5130647, 54.3957587 ], [ -126.5129512, 54.3958727 ], [ -126.51285390000001, 54.3959339 ], [ -126.512613699999974, 54.396109100000011 ], [ -126.5124374, 54.396186 ], [ -126.512343299999984, 54.3962102 ], [ -126.5120471, 54.3962942 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17093587, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 170329.96813820899, "blue_line_key": 360873822, "length_metre": 289.52691275125699, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.7080777, 54.3927921 ], [ -126.7073824, 54.393104 ], [ -126.7055607, 54.3935953 ], [ -126.7042956, 54.3941465 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093891, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 16847.595433310002, "blue_line_key": 360846413, "length_metre": 58.714997498770003, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.262620200000015, 54.3916206 ], [ -126.2631544, 54.3911957 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17097861, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 17480.186227662802, "blue_line_key": 360881038, "length_metre": 386.56567603799402, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1014277, 54.3193869 ], [ -126.09864, 54.3163263 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091989, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 15805.514006025, "blue_line_key": 360862508, "length_metre": 751.97330137297001, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.363327399999989, 54.4132309 ], [ -126.3580641, 54.4148488 ], [ -126.354124700000014, 54.4172045 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17077790, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1435.55471124979, "blue_line_key": 360237077, "length_metre": 386.52147409374197, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3158465, 54.507599 ], [ -126.3159001, 54.5074751 ], [ -126.3159806, 54.5074139 ], [ -126.3163464, 54.5072601 ], [ -126.3164733, 54.5072273 ], [ -126.3167223, 54.507196 ], [ -126.316832, 54.5071632 ], [ -126.3169141, 54.5070835 ], [ -126.31691069999998, 54.5069126 ], [ -126.3168143, 54.5067132 ], [ -126.3167401, 54.5066662 ], [ -126.3164011, 54.5066676 ], [ -126.3162015, 54.5066633 ], [ -126.3159966, 54.5066947 ], [ -126.3158525, 54.5067901 ], [ -126.3157518, 54.5069225 ], [ -126.315698, 54.5070123 ], [ -126.3156494, 54.5070735 ], [ -126.315584199999989, 54.5071262 ], [ -126.3154898, 54.5071504 ], [ -126.315165, 54.5071533 ], [ -126.314933400000015, 54.5071561 ], [ -126.314643600000011, 54.5070877 ], [ -126.3144061, 54.5069197 ], [ -126.3143381, 54.5067929 ], [ -126.3143324, 54.5066491 ], [ -126.314368, 54.5065693 ], [ -126.314389800000015, 54.5064796 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17079714, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 203748.339286667, "blue_line_key": 360873822, "length_metre": 215.681484923082, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.481167899999988, 54.4958977 ], [ -126.481229500000012, 54.4961427 ], [ -126.4811185, 54.4963692 ], [ -126.4799452, 54.4976495 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076361, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 206235.16684074301, "blue_line_key": 360873822, "length_metre": 160.22415841162001, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4629314, 54.5130908 ], [ -126.4624827, 54.5133215 ], [ -126.461739699999981, 54.513559400000013 ], [ -126.4611394, 54.5137117 ], [ -126.4607646, 54.5136961 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17082195, "stream_order": 4, "gnis_name": "Ailport Creek", "downstream_route_measure": 12211.443871739901, "blue_line_key": 360878058, "length_metre": 35.520112609852802, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.135052399999978, 54.4857089 ], [ -126.1348777, 54.4857858 ], [ -126.1345512, 54.4858143 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17087776, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 278267.88186048, "blue_line_key": 360873822, "length_metre": 179.93033321127999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.142833599999989, 54.451216 ], [ -126.1428719, 54.4513072 ], [ -126.143037100000015, 54.4515977 ], [ -126.1431581, 54.4518612 ], [ -126.1432666, 54.4520705 ], [ -126.1434213, 54.4522813 ], [ -126.1436083, 54.4524836 ], [ -126.1437954, 54.4526858 ], [ -126.143824400000014, 54.4527143 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17075560, "stream_order": 4, "gnis_name": "Cesford Creek", "downstream_route_measure": 2301.1782237051698, "blue_line_key": 360765936, "length_metre": 405.44190348245201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.289879099999979, 54.5182493 ], [ -126.289797400000012, 54.5183276 ], [ -126.289568899999978, 54.5185298 ], [ -126.2894937, 54.5187079 ], [ -126.289425399999985, 54.5188318 ], [ -126.2894063, 54.5188859 ], [ -126.289300200000014, 54.519054 ], [ -126.2891359, 54.5192206 ], [ -126.2889548, 54.5193787 ], [ -126.288633, 54.519588 ], [ -126.2882967, 54.5197689 ], [ -126.288166, 54.5198472 ], [ -126.28786, 54.5200466 ], [ -126.287588899999989, 54.5201748 ], [ -126.2872207, 54.5203557 ], [ -126.2870744, 54.5204782 ], [ -126.2869092, 54.5206192 ], [ -126.286761700000014, 54.5207587 ], [ -126.2865835, 54.5208812 ], [ -126.2863455, 54.5209923 ], [ -126.286138600000015, 54.5210778 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092546, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 18133.193525436, "blue_line_key": 360862508, "length_metre": 93.597911565133103, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.346025, 54.407870200000012 ], [ -126.3461538, 54.4077833 ], [ -126.3463653, 54.4076081 ], [ -126.3463902, 54.4074828 ], [ -126.34634579999998, 54.4074287 ], [ -126.3462567, 54.407390199999988 ], [ -126.346041599999978, 54.407376 ], [ -126.3460353, 54.4072421 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093920, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 16933.072397107298, "blue_line_key": 360846413, "length_metre": 106.440146254165, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.263518800000014, 54.3910827 ], [ -126.2651059, 54.3908359 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17106915, "stream_order": 4, "gnis_name": "Buck Creek", "downstream_route_measure": 64996.135897369502, "blue_line_key": 360886221, "length_metre": 245.84094181885601, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3448859, 54.170973 ], [ -126.34134250000001, 54.1702138 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099249, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 6570.1677484300999, "blue_line_key": 360877225, "length_metre": 114.079760636139, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.18308, 54.2912517 ], [ -126.183603100000013, 54.2912559 ], [ -126.1839079, 54.2912901 ], [ -126.1839531, 54.2913001 ], [ -126.1840453, 54.2913015 ], [ -126.184180799999979, 54.2913314 ], [ -126.1844494, 54.2914454 ], [ -126.1845417, 54.2914667 ], [ -126.184588100000013, 54.2914667 ], [ -126.1847427, 54.2914439 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100590, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 19827.508512947101, "blue_line_key": 360880905, "length_metre": 720.55951902813604, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.370276, 54.2682493 ], [ -126.3704385, 54.2683603 ], [ -126.370545400000012, 54.2683546 ], [ -126.370565500000012, 54.268292 ], [ -126.3705732, 54.2681752 ], [ -126.370652, 54.2681325 ], [ -126.3708681, 54.2681282 ], [ -126.3710055, 54.2681396 ], [ -126.3712186, 54.2681439 ], [ -126.371495200000012, 54.268141 ], [ -126.37158620000001, 54.2681795 ], [ -126.371645500000014, 54.2682251 ], [ -126.371816099999975, 54.2684088 ], [ -126.371856, 54.2685355 ], [ -126.3718281, 54.268715 ], [ -126.3718509, 54.2688417 ], [ -126.37201589999998, 54.268898699999987 ], [ -126.372291899999979, 54.2689315 ], [ -126.3723958, 54.2689614 ], [ -126.3724556, 54.2689984 ], [ -126.372499100000013, 54.2690539 ], [ -126.372490700000014, 54.2691793 ], [ -126.3725329, 54.2692248 ], [ -126.372638, 54.2692718 ], [ -126.3727706, 54.2693644 ], [ -126.3728556, 54.2694741 ], [ -126.3730347, 54.2695595 ], [ -126.3731233, 54.269598 ], [ -126.3734257, 54.2696934 ], [ -126.373737299999988, 54.2698444 ], [ -126.3738583, 54.2698743 ], [ -126.3741137, 54.2699782 ], [ -126.3741864, 54.2700338 ], [ -126.3741987, 54.2700879 ], [ -126.3741195, 54.2701321 ], [ -126.373797599999989, 54.2701249 ], [ -126.3737189, 54.2701406 ], [ -126.373684200000014, 54.2702033 ], [ -126.373710499999973, 54.2702659 ], [ -126.373891299999983, 54.2703329 ], [ -126.3740898, 54.2703371 ], [ -126.3743817, 54.2703528 ], [ -126.3745632, 54.2704112 ], [ -126.3745578, 54.2704739 ], [ -126.3744473, 54.2705166 ], [ -126.374341, 54.2705138 ], [ -126.3742476, 54.270529400000015 ], [ -126.374183, 54.2705736 ], [ -126.3741171, 54.270634799999989 ], [ -126.374094699999986, 54.2707516 ], [ -126.374119900000011, 54.2708242 ], [ -126.3742689, 54.2708983 ], [ -126.374457299999989, 54.2710735 ], [ -126.3744862, 54.271129 ], [ -126.374493, 54.2712458 ], [ -126.3743943, 54.2713512 ], [ -126.3743913, 54.2714139 ], [ -126.3744317, 54.271477900000015 ], [ -126.374552099999988, 54.2715164 ], [ -126.3749056, 54.2715235 ], [ -126.3749637, 54.2715791 ], [ -126.374974900000012, 54.2716432 ], [ -126.3750324, 54.2717072 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17098880, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 4262.1881294602699, "blue_line_key": 360877225, "length_metre": 92.367653833724304, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.154318499999974, 54.298686 ], [ -126.1543509, 54.2986775 ], [ -126.1545298, 54.2985208 ], [ -126.1545024, 54.2984753 ], [ -126.1544146, 54.2984012 ], [ -126.1542586, 54.298226 ], [ -126.154261099999985, 54.298199 ], [ -126.154424800000015, 54.2980238 ], [ -126.1544611, 54.2979711 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17076817, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 8622.4442913725798, "blue_line_key": 360869846, "length_metre": 44.250670394908198, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5833547, 54.5103406 ], [ -126.5836496, 54.5103463 ], [ -126.5840145, 54.5104261 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17082055, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 228124.421140372, "blue_line_key": 360873822, "length_metre": 141.79637377718799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.266180099999985, 54.4859966 ], [ -126.2659059, 54.4861889 ], [ -126.2658093, 54.4862402 ], [ -126.2657946, 54.4862402 ], [ -126.2657793, 54.4862487 ], [ -126.2657302, 54.4862558 ], [ -126.26566769999998, 54.4862729 ], [ -126.265614500000012, 54.4863883 ], [ -126.265564499999982, 54.4864324 ], [ -126.265470099999987, 54.4864566 ], [ -126.265238099999976, 54.4864609 ], [ -126.2651655, 54.4864239 ], [ -126.2647914, 54.4862345 ], [ -126.2646751, 54.4861063 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17072454, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1068.7132159550399, "blue_line_key": 360881632, "length_metre": 31.270699314277199, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.645234500000015, 54.53431 ], [ -126.645548, 54.5340965 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099134, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 5393.2078393832799, "blue_line_key": 360877225, "length_metre": 106.03783398425399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.166973, 54.2937241 ], [ -126.1670857, 54.2936557 ], [ -126.167352900000012, 54.2935717 ], [ -126.1676495, 54.2934806 ], [ -126.1679186, 54.293378 ], [ -126.168186499999976, 54.2932854 ], [ -126.1683455, 54.2932171 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17096486, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 11489.5984538953, "blue_line_key": 360881038, "length_metre": 763.26078764469605, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1550221, 54.33704 ], [ -126.154762199999979, 54.3370158 ], [ -126.1544558, 54.3370186 ], [ -126.154206699999989, 54.3370656 ], [ -126.153840100000011, 54.337228 ], [ -126.153618599999987, 54.3373134 ], [ -126.1533562, 54.3373434 ], [ -126.1530632, 54.3373362 ], [ -126.1527841, 54.3373647 ], [ -126.1525645, 54.3374316 ], [ -126.1525105, 54.337547 ], [ -126.1526401, 54.3376681 ], [ -126.152646, 54.3378205 ], [ -126.152484399999977, 54.3379159 ], [ -126.1522219, 54.3379458 ], [ -126.1519161, 54.3379202 ], [ -126.151705100000015, 54.3378618 ], [ -126.151525400000011, 54.3377849 ], [ -126.1513309, 54.3377079 ], [ -126.1511206, 54.337641 ], [ -126.1509231, 54.3375727 ], [ -126.1506975, 54.3375143 ], [ -126.1505024, 54.3374459 ], [ -126.1503399, 54.3373619 ], [ -126.150177899999989, 54.3372494 ], [ -126.1499163, 54.3370272 ], [ -126.1496717, 54.3369944 ], [ -126.149334699999983, 54.3369873 ], [ -126.149042400000013, 54.3369716 ], [ -126.1487939, 54.3370101 ], [ -126.1486189, 54.3370955 ], [ -126.148503800000015, 54.3372109 ], [ -126.1483715, 54.3373334 ], [ -126.1481608, 54.33749 ], [ -126.148051199999983, 54.3375228 ], [ -126.1477864, 54.3375527 ], [ -126.147590699999981, 54.3374858 ], [ -126.1474294, 54.3373918 ], [ -126.1472986, 54.3372807 ], [ -126.147198499999988, 54.3371525 ], [ -126.147164499999988, 54.3369901 ], [ -126.1472496, 54.3368563 ], [ -126.1473819, 54.336733800000012 ], [ -126.147557699999979, 54.3366398 ], [ -126.147801699999988, 54.3366811 ], [ -126.1478316, 54.3366725 ], [ -126.147988899999973, 54.336622700000014 ], [ -126.148007299999989, 54.3366056 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17065475, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 9129.2211480921796, "blue_line_key": 360856488, "length_metre": 108.73961528791899, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.449924, 54.5706459 ], [ -126.450031, 54.5706844 ], [ -126.450090299999985, 54.5707399 ], [ -126.4502485, 54.5709137 ], [ -126.450337800000014, 54.5709607 ], [ -126.4504748, 54.5709906 ], [ -126.4506002, 54.5709835 ], [ -126.4509946, 54.570866699999989 ], [ -126.4511189, 54.5708695 ], [ -126.4512559, 54.5708994 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17088518, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 277582.97364454, "blue_line_key": 360873822, "length_metre": 350.331584661715, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.140949599999985, 54.4452557 ], [ -126.140983100000014, 54.4454352 ], [ -126.141031500000011, 54.4456345 ], [ -126.1411778, 54.4459706 ], [ -126.141256199999987, 54.4461615 ], [ -126.141306300000011, 54.4463424 ], [ -126.1414384, 54.4466429 ], [ -126.14158110000001, 54.4468252 ], [ -126.1416743, 54.447016 ], [ -126.141737299999988, 54.4472154 ], [ -126.141764, 54.447496 ], [ -126.141779799999981, 54.447711 ], [ -126.1417982, 54.447919 ], [ -126.1418324, 54.4483149 ], [ -126.1418306, 54.4483334 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101827, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 27700.369848589002, "blue_line_key": 360881038, "length_metre": 42.360513866688699, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0694066, 54.2488715 ], [ -126.06939340000001, 54.2488544 ], [ -126.0694125, 54.2488088 ], [ -126.0694599, 54.2487661 ], [ -126.069524699999974, 54.248749 ], [ -126.0698471, 54.2487205 ], [ -126.0698943, 54.2487048 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17095554, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 7580.1443366553403, "blue_line_key": 360886221, "length_metre": 228.41027871004999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.618016, 54.3560774 ], [ -126.6179668, 54.355841 ], [ -126.617756299999982, 54.3555419 ], [ -126.6176008, 54.3553511 ], [ -126.6174172, 54.3552542 ], [ -126.6165187, 54.355126 ], [ -126.6159458, 54.3552685 ], [ -126.6155512, 54.3552927 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17104952, "stream_order": 4, "gnis_name": "Maxan Creek", "downstream_route_measure": 34680.7351883499, "blue_line_key": 360881038, "length_metre": 32.147971261610301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0537311, 54.2056011 ], [ -126.0537153, 54.2055912 ], [ -126.0534811, 54.2054601 ], [ -126.053450899999987, 54.2054231 ], [ -126.053455, 54.205379 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093289, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 15786.518239458301, "blue_line_key": 360846413, "length_metre": 137.44876679493899, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.270597599999988, 54.3983579 ], [ -126.2705216, 54.398365 ], [ -126.270428599999988, 54.3983721 ], [ -126.2702895, 54.3983778 ], [ -126.270058, 54.3983821 ], [ -126.2697374, 54.3983209 ], [ -126.269464, 54.3982781 ], [ -126.2692519, 54.3982283 ], [ -126.26905859999998, 54.3981258 ], [ -126.268999499999978, 54.398078800000015 ], [ -126.2688108, 54.397895 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104499, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 2770.1396187473802, "blue_line_key": 360882583, "length_metre": 330.15746137804098, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.019721300000015, 54.2131267 ], [ -126.019670499999975, 54.213205 ], [ -126.0195481, 54.2133916 ], [ -126.0195167, 54.2134172 ], [ -126.0194213, 54.2134514 ], [ -126.0193748, 54.2134585 ], [ -126.0192073, 54.2134371 ], [ -126.01889, 54.213393 ], [ -126.0188264, 54.2134001 ], [ -126.0185307, 54.2134557 ], [ -126.0182632, 54.2135667 ], [ -126.0182287, 54.2136009 ], [ -126.018182200000012, 54.213628 ], [ -126.0181476, 54.2136622 ], [ -126.0181016, 54.2136878 ], [ -126.017903800000013, 54.2138544 ], [ -126.0178704, 54.2138986 ], [ -126.0176319, 54.2140367 ], [ -126.017317699999978, 54.2141094 ], [ -126.0171809, 54.214123600000015 ], [ -126.0168389, 54.2141791 ], [ -126.0165551, 54.2142618 ], [ -126.0162704, 54.21438 ], [ -126.016032599999988, 54.2145096 ], [ -126.0158233, 54.2146477 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17088306, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 237874.30246266199, "blue_line_key": 360873822, "length_metre": 348.81824174291398, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2168346, 54.4486382 ], [ -126.216869800000012, 54.448567 ], [ -126.2172057, 54.4483947 ], [ -126.2173071, 54.4482893 ], [ -126.217289, 54.4480998 ], [ -126.2172299, 54.4480528 ], [ -126.2171413, 54.4480058 ], [ -126.216799699999981, 54.4480158 ], [ -126.216567399999988, 54.4480286 ], [ -126.2164618, 54.4480087 ], [ -126.2163702, 54.4479702 ], [ -126.216343, 54.4479161 ], [ -126.216338099999987, 54.4477723 ], [ -126.216423400000011, 54.4476569 ], [ -126.2164563, 54.4476128 ], [ -126.2164769, 54.4475416 ], [ -126.216456, 54.4474148 ], [ -126.2163385, 54.4473051 ], [ -126.216236299999977, 54.4472482 ], [ -126.216085299999989, 54.4471912 ], [ -126.215735199999983, 54.4471015 ], [ -126.2156048, 54.4470004 ], [ -126.215548, 54.4469263 ], [ -126.2154362, 54.4467525 ], [ -126.2153606, 54.4467241 ], [ -126.214989, 54.4467426 ], [ -126.214788, 54.446756799999989 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080338, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 225289.58244976201, "blue_line_key": 360873822, "length_metre": 395.89575103621502, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2878715, 54.4935991 ], [ -126.288133699999989, 54.4938768 ], [ -126.2881126, 54.4940263 ], [ -126.287852, 54.4941873 ], [ -126.286690799999974, 54.4946202 ], [ -126.2864533, 54.4947854 ], [ -126.286237199999988, 54.4951116 ], [ -126.2859516, 54.4951771 ], [ -126.2849936, 54.4951472 ], [ -126.2843537, 54.4952298 ], [ -126.283771699999988, 54.4954121 ] ] } }, @@ -40,145 +103,301 @@ { "type": "Feature", "properties": { "linear_feature_id": 17062712, "stream_order": 5, "gnis_name": "Richfield Creek", "downstream_route_measure": 15500.144741678399, "blue_line_key": 360788426, "length_metre": 678.092008981101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2332433, 54.5855902 ], [ -126.232874399999986, 54.5855631 ], [ -126.2325191, 54.585546 ], [ -126.2323003, 54.5855603 ], [ -126.232112300000011, 54.5855916 ], [ -126.232003, 54.5856158 ], [ -126.2316887, 54.5856984 ], [ -126.231578399999975, 54.5857326 ], [ -126.2312595, 54.5858423 ], [ -126.231164899999982, 54.5858665 ], [ -126.230865400000013, 54.5859491 ], [ -126.230488599999987, 54.5860488 ], [ -126.2303132, 54.5861072 ], [ -126.2302017, 54.5861584 ], [ -126.2301359, 54.5862197 ], [ -126.230033400000011, 54.5863706 ], [ -126.2298654, 54.5865472 ], [ -126.22978590000001, 54.5865985 ], [ -126.229626599999989, 54.5866669 ], [ -126.229296800000014, 54.586731 ], [ -126.228998099999984, 54.5867694 ], [ -126.228640399999989, 54.586815 ], [ -126.2284057, 54.5868463 ], [ -126.2282171, 54.5868862 ], [ -126.2278985, 54.5870229 ], [ -126.227706700000013, 54.5870998 ], [ -126.2276126, 54.5871155 ], [ -126.227395099999981, 54.5871468 ], [ -126.2270522, 54.5871924 ], [ -126.226782199999974, 54.5872679 ], [ -126.2265002, 54.5873149 ], [ -126.226219, 54.5873804 ], [ -126.2260012, 54.5873847 ], [ -126.2258153, 54.5873889 ], [ -126.225597, 54.5874018 ], [ -126.225472599999975, 54.5873989 ], [ -126.225321, 54.587369 ], [ -126.2250772, 54.5873006 ], [ -126.2249876, 54.5872622 ], [ -126.224676499999987, 54.5870571 ], [ -126.224510900000013, 54.5869902 ], [ -126.2241269, 54.586936 ], [ -126.2240026, 54.5869332 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101880, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 14274.677306232599, "blue_line_key": 360880905, "length_metre": 658.59054671654098, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4139843, 54.2472322 ], [ -126.4139984, 54.2472678 ], [ -126.4139942, 54.2473134 ], [ -126.413911399999989, 54.2474287 ], [ -126.4138121, 54.2475427 ], [ -126.4136993, 54.2476395 ], [ -126.413568899999987, 54.2477449 ], [ -126.413470800000013, 54.2478418 ], [ -126.413419, 54.2479116 ], [ -126.4133239, 54.2479728 ], [ -126.4132124, 54.2480597 ], [ -126.4131613, 54.2481138 ], [ -126.4131736, 54.2481679 ], [ -126.413232799999989, 54.2482135 ], [ -126.413303699999986, 54.2482875 ], [ -126.413342899999989, 54.2483958 ], [ -126.413352299999985, 54.2485126 ], [ -126.4133329, 54.2485667 ], [ -126.41325, 54.248655 ], [ -126.4131214, 54.2487419 ], [ -126.4130298, 54.2487661 ], [ -126.4129371, 54.2487732 ], [ -126.412798, 54.2487803 ], [ -126.4126887, 54.248786 ], [ -126.412598399999979, 54.248793100000015 ], [ -126.4123776, 54.2488515 ], [ -126.412280099999975, 54.2489398 ], [ -126.412350499999988, 54.2490495 ], [ -126.41248490000001, 54.2491236 ], [ -126.412602799999988, 54.2491891 ], [ -126.412690799999979, 54.2492631 ], [ -126.4127629, 54.2493272 ], [ -126.4127881, 54.2494269 ], [ -126.412781, 54.2495351 ], [ -126.412697600000016, 54.2496591 ], [ -126.4126135, 54.2497644 ], [ -126.4125599, 54.2498798 ], [ -126.4124319, 54.2499581 ], [ -126.412291, 54.250018 ], [ -126.4121184, 54.2500507 ], [ -126.4119811, 54.2500664 ], [ -126.4118889, 54.2500721 ], [ -126.411704, 54.2500778 ], [ -126.4115485, 54.2501105 ], [ -126.4113923, 54.2501518 ], [ -126.411293500000014, 54.2502302 ], [ -126.411214300000012, 54.2503014 ], [ -126.4111163, 54.2503982 ], [ -126.4110974, 54.2504509 ], [ -126.4110896, 54.2505406 ], [ -126.411177, 54.2506232 ], [ -126.4112809, 54.2507073 ], [ -126.411383599999979, 54.2507813 ], [ -126.4114703, 54.2508454 ], [ -126.4114802, 54.2509266 ], [ -126.411463900000015, 54.2509722 ], [ -126.4114409, 54.2510704 ], [ -126.411391, 54.2511417 ], [ -126.4113069, 54.2512471 ], [ -126.4112094, 54.2513353 ], [ -126.4110825, 54.2514037 ], [ -126.41095510000001, 54.2514735 ], [ -126.4108594, 54.2515433 ], [ -126.410791800000013, 54.251623 ], [ -126.410744299999976, 54.2516672 ], [ -126.4107107, 54.2516928 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17097573, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 12861.904274748, "blue_line_key": 360886221, "length_metre": 1.5148988118015401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6258817, 54.3190095 ], [ -126.625898699999979, 54.3190002 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099691, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 7485.6799343880002, "blue_line_key": 360877225, "length_metre": 487.07351197135398, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1938248, 54.2876014 ], [ -126.193842499999974, 54.2875929 ], [ -126.1938597, 54.2875658 ], [ -126.193993800000015, 54.2873707 ], [ -126.194205, 54.2872325 ], [ -126.1943754, 54.2871998 ], [ -126.194421299999988, 54.2872012 ], [ -126.194468299999983, 54.2871927 ], [ -126.19456, 54.2871955 ], [ -126.194607, 54.287187 ], [ -126.1946528, 54.2871884 ], [ -126.194699299999982, 54.2871813 ], [ -126.194745700000013, 54.2871813 ], [ -126.194993899999986, 54.2871428 ], [ -126.1953183, 54.2871229 ], [ -126.195441699999989, 54.2870987 ], [ -126.195553, 54.2870474 ], [ -126.195658, 54.2868523 ], [ -126.195619099999988, 54.2867711 ], [ -126.1955605, 54.2867241 ], [ -126.1954886, 54.28666 ], [ -126.195314099999976, 54.2865019 ], [ -126.1952734, 54.2864122 ], [ -126.1952778, 54.2863396 ], [ -126.1952923, 54.2861516 ], [ -126.1953094, 54.2861245 ], [ -126.195328, 54.2860533 ], [ -126.1953464, 54.2860092 ], [ -126.195451299999988, 54.2858411 ], [ -126.195483, 54.285814 ], [ -126.1955008, 54.2857784 ], [ -126.195606399999988, 54.2856018 ], [ -126.1956413, 54.2855121 ], [ -126.1956438, 54.285485 ], [ -126.1956604, 54.2854594 ], [ -126.1956686, 54.2853697 ], [ -126.195654499999989, 54.2853412 ], [ -126.195659, 54.2852885 ], [ -126.1956932, 54.2852344 ], [ -126.195694, 54.2851988 ], [ -126.195781, 54.2850663 ], [ -126.1958184, 54.2849766 ], [ -126.1958497, 54.284951 ], [ -126.1958668, 54.2849239 ], [ -126.1959323, 54.2848712 ], [ -126.1959489, 54.2848456 ], [ -126.1959807, 54.2848185 ], [ -126.195999699999973, 54.2847929 ], [ -126.1961288, 54.284706 ], [ -126.1963362, 54.2845579 ], [ -126.196563899999987, 54.2843742 ], [ -126.196647099999979, 54.2842859 ], [ -126.1966821, 54.2842232 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091039, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 274066.53094003699, "blue_line_key": 360873822, "length_metre": 150.32857247390501, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.124555099999981, 54.4236205 ], [ -126.124739, 54.4236334 ], [ -126.1247856, 54.4236262 ], [ -126.1251417, 54.4236163 ], [ -126.1254507, 54.4236148 ], [ -126.125835, 54.4236148 ], [ -126.1262194, 54.4236419 ], [ -126.1265247, 54.4236846 ], [ -126.126844800000015, 54.4237473 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17090741, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 2845.8978433336902, "blue_line_key": 360841027, "length_metre": 1794.2924362164099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0595065, 54.4261528 ], [ -126.059407199999981, 54.4262582 ], [ -126.0593012, 54.4264362 ], [ -126.059348300000011, 54.4266441 ], [ -126.059405899999987, 54.4267082 ], [ -126.059416399999989, 54.4267538 ], [ -126.0594329, 54.4269518 ], [ -126.0594648, 54.4271682 ], [ -126.059496, 54.4273662 ], [ -126.0595089, 54.4274118 ], [ -126.0595303, 54.4275556 ], [ -126.059573199999988, 54.4278091 ], [ -126.0596026, 54.4280256 ], [ -126.0595714, 54.4282407 ], [ -126.059451200000012, 54.4284173 ], [ -126.0593917, 54.428622399999988 ], [ -126.0593464, 54.4288289 ], [ -126.0593322, 54.4290169 ], [ -126.0592574, 54.4292034 ], [ -126.059240300000013, 54.429230499999989 ], [ -126.059241500000013, 54.4294099 ], [ -126.0592501, 54.4295011 ], [ -126.05928440000001, 54.4296635 ], [ -126.059209599999988, 54.42985 ], [ -126.0591526, 54.430028099999987 ], [ -126.05912189999998, 54.4302346 ], [ -126.0591538, 54.430424 ], [ -126.059103, 54.4307202 ], [ -126.0590257, 54.4309338 ], [ -126.058979799999989, 54.4311218 ], [ -126.0589252, 54.4314622 ], [ -126.0589216, 54.4317229 ], [ -126.058953499999987, 54.4319393 ], [ -126.059060699999975, 54.4321572 ], [ -126.059228699999977, 54.4323766 ], [ -126.0594876, 54.4326628 ], [ -126.059619399999988, 54.4329619 ], [ -126.059661800000015, 54.433224 ], [ -126.059633600000012, 54.4334305 ], [ -126.0595864, 54.4336356 ], [ -126.0596104, 54.4339688 ], [ -126.059640500000015, 54.4341768 ], [ -126.059664500000011, 54.434483 ], [ -126.0596836, 54.4348704 ], [ -126.05971310000001, 54.4351139 ], [ -126.0597634, 54.4354828 ], [ -126.0597273, 54.435752 ], [ -126.059705799999989, 54.4358588 ], [ -126.0596268, 54.4360909 ], [ -126.0594987, 54.4363572 ], [ -126.059377399999988, 54.4365438 ], [ -126.059219899999988, 54.4368101 ], [ -126.0590697, 54.4369953 ], [ -126.058871099999976, 54.437179 ], [ -126.058654, 54.4374069 ], [ -126.0583671, 54.437733 ], [ -126.0582783, 54.4379111 ], [ -126.0584439, 54.4381845 ], [ -126.058786699999985, 54.438354 ], [ -126.0590199, 54.438522 ], [ -126.059061, 54.4386046 ], [ -126.0591831, 54.4388496 ], [ -126.0593818, 54.4390789 ], [ -126.059554299999988, 54.4392455 ], [ -126.059791, 54.4394036 ], [ -126.060102, 54.4395731 ], [ -126.060441900000015, 54.4397711 ], [ -126.0607376, 54.4399762 ], [ -126.0609081, 54.4401684 ], [ -126.0610639, 54.4403607 ], [ -126.0612616, 54.440627 ], [ -126.0614174, 54.4408193 ], [ -126.0615678, 54.4410742 ], [ -126.061585, 54.4412636 ], [ -126.0615833, 54.4412821 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17066258, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 4323.1434779173396, "blue_line_key": 360851751, "length_metre": 22.88570681737, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1807418, 54.5671524 ], [ -126.1804899, 54.5671908 ], [ -126.180396499999986, 54.5671979 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17074258, "stream_order": 4, "gnis_name": "Johnny David Creek", "downstream_route_measure": 1347.3535650061499, "blue_line_key": 360866287, "length_metre": 2058.57930266945, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3718012, 54.5242295 ], [ -126.3718441, 54.5242751 ], [ -126.371879600000014, 54.5244745 ], [ -126.37179350000001, 54.5245799 ], [ -126.371806400000011, 54.524634 ], [ -126.3719499, 54.5248263 ], [ -126.372170900000015, 54.5249658 ], [ -126.3724734, 54.5250898 ], [ -126.372650299999989, 54.5252008 ], [ -126.372769100000014, 54.5252749 ], [ -126.372874200000012, 54.5253319 ], [ -126.372982, 54.5253604 ], [ -126.3731807, 54.5253746 ], [ -126.3732269, 54.525376 ], [ -126.37327350000001, 54.525376 ], [ -126.373469799999981, 54.5254529 ], [ -126.37357440000001, 54.5255184 ], [ -126.373871199999982, 54.5256865 ], [ -126.374182600000012, 54.5258902 ], [ -126.374322299999989, 54.5259115 ], [ -126.3744293, 54.5259144 ], [ -126.3748079, 54.5258147 ], [ -126.374946199999982, 54.5258261 ], [ -126.375050500000015, 54.5258645 ], [ -126.375148699999983, 54.5260112 ], [ -126.375239900000011, 54.5260312 ], [ -126.375350399999974, 54.526024 ], [ -126.375471, 54.526044 ], [ -126.375545300000013, 54.526091 ], [ -126.3756488, 54.5261736 ], [ -126.3756748, 54.5262462 ], [ -126.3757339, 54.5263018 ], [ -126.3759162, 54.5263416 ], [ -126.376023499999988, 54.5263715 ], [ -126.3763568, 54.5264499 ], [ -126.3764482, 54.5264969 ], [ -126.376522, 54.5265524 ], [ -126.3767417, 54.5267376 ], [ -126.377054699999988, 54.5269156 ], [ -126.3772033, 54.5270167 ], [ -126.3774533, 54.5272204 ], [ -126.377643099999986, 54.5273856 ], [ -126.377819899999977, 54.5275252 ], [ -126.377906299999978, 54.5276078 ], [ -126.378066199999978, 54.5277815 ], [ -126.378133, 54.5279268 ], [ -126.378154599999988, 54.5280891 ], [ -126.378143099999988, 54.528268600000011 ], [ -126.378115600000015, 54.5284309 ], [ -126.378060199999979, 54.5285819 ], [ -126.378056199999989, 54.5286631 ], [ -126.378057899999988, 54.5288611 ], [ -126.3780465, 54.5290405 ], [ -126.3780339, 54.5292371 ], [ -126.3780394, 54.5293823 ], [ -126.37808, 54.5294906 ], [ -126.3782053, 54.5296999 ], [ -126.37828660000001, 54.5298808 ], [ -126.378353499999989, 54.5300261 ], [ -126.37846519999998, 54.5302183 ], [ -126.378523099999981, 54.530291 ], [ -126.378597499999984, 54.530338 ], [ -126.3789231, 54.530543099999988 ], [ -126.3791514, 54.53062 ], [ -126.379530599999981, 54.5307353 ], [ -126.3796197, 54.5307823 ], [ -126.379767199999989, 54.530893399999989 ], [ -126.37983890000001, 54.530976 ], [ -126.3800302, 54.5311512 ], [ -126.3802186, 54.5313349 ], [ -126.3803423, 54.5315628 ], [ -126.3803907, 54.5317608 ], [ -126.3804026, 54.5318248 ], [ -126.3803612, 54.5320128 ], [ -126.380393799999979, 54.5322279 ], [ -126.380448199999989, 54.5323105 ], [ -126.380521500000015, 54.5323746 ], [ -126.380757399999979, 54.5325697 ], [ -126.3808546, 54.5327335 ], [ -126.380905399999989, 54.5329314 ], [ -126.38091249999998, 54.5330582 ], [ -126.3808834, 54.5332462 ], [ -126.38088759999998, 54.5334442 ], [ -126.3809436, 54.5335083 ], [ -126.381137199999984, 54.5336564 ], [ -126.3812209, 54.5337746 ], [ -126.381258300000013, 54.533919900000015 ], [ -126.381307599999985, 54.5341363 ], [ -126.3814374, 54.534256 ], [ -126.3816744, 54.5344411 ], [ -126.381881799999988, 54.5345707 ], [ -126.3821907, 54.5348029 ], [ -126.3822661, 54.5348399 ], [ -126.382625299999987, 54.5350193 ], [ -126.3827295, 54.5350934 ], [ -126.382946600000011, 54.5353142 ], [ -126.3830215, 54.5353597 ], [ -126.38324129999998, 54.5355449 ], [ -126.3834915, 54.5357485 ], [ -126.3836863, 54.5358511 ], [ -126.38400390000001, 54.5359394 ], [ -126.384244299999978, 54.5360519 ], [ -126.3843159, 54.5361345 ], [ -126.3844303, 54.536298299999984 ], [ -126.3846177, 54.536492 ], [ -126.3848542, 54.5366857 ], [ -126.3849976, 54.5368509 ], [ -126.385201099999975, 54.5370617 ], [ -126.3853445, 54.5372269 ], [ -126.3854135, 54.5373451 ], [ -126.3854629, 54.5375616 ], [ -126.3854998, 54.5377154 ], [ -126.385580899999979, 54.5378692 ], [ -126.385638899999989, 54.5379347 ], [ -126.3858446, 54.538118399999988 ], [ -126.3858859, 54.5381825 ], [ -126.3860444, 54.5383748 ], [ -126.386129, 54.5385115 ], [ -126.3861567, 54.5385656 ], [ -126.3862215, 54.5387379 ], [ -126.386289299999973, 54.5389017 ], [ -126.3864034, 54.5390385 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17064996, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 2886.7582287487498, "blue_line_key": 360851751, "length_metre": 64.816605281178596, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.194985699999989, 54.5742677 ], [ -126.194232, 54.5738836 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093899, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 16906.310430808699, "blue_line_key": 360846413, "length_metre": 26.761966298584301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2631544, 54.3911957 ], [ -126.263518800000014, 54.3910827 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093302, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 19444.2613930359, "blue_line_key": 360862508, "length_metre": 60.373287685402197, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3389631, 54.397915 ], [ -126.33891890000001, 54.3978879 ], [ -126.3388599, 54.397868 ], [ -126.338754299999977, 54.397821 ], [ -126.338698099999988, 54.3977384 ], [ -126.338637799999987, 54.3977013 ], [ -126.3384256, 54.3976515 ], [ -126.3382758, 54.3975774 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17106340, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 54355.275956576399, "blue_line_key": 360886221, "length_metre": 2143.8292147417001, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.461428599999977, 54.187367 ], [ -126.4613829, 54.1873656 ], [ -126.461311, 54.1873015 ], [ -126.4612696, 54.187220300000014 ], [ -126.461289, 54.1871391 ], [ -126.4613554, 54.1870693 ], [ -126.461465, 54.1870081 ], [ -126.461590500000014, 54.186956800000011 ], [ -126.4616417, 54.1868956 ], [ -126.461630700000015, 54.186831500000011 ], [ -126.4616039, 54.1867774 ], [ -126.4615295, 54.1867133 ], [ -126.461441099999988, 54.1866748 ], [ -126.461319300000014, 54.1866549 ], [ -126.4611816, 54.186652 ], [ -126.4611042, 54.1866506 ], [ -126.461027300000012, 54.1866478 ], [ -126.460953, 54.1866378 ], [ -126.4608007, 54.1866079 ], [ -126.4607245, 54.1865965 ], [ -126.460603299999988, 54.1865951 ], [ -126.4605271, 54.1865837 ], [ -126.4604497, 54.1865822 ], [ -126.460357699999989, 54.1865808 ], [ -126.4601725, 54.1865951 ], [ -126.4600792, 54.1866107 ], [ -126.4598635, 54.1866421 ], [ -126.4596783, 54.1866563 ], [ -126.4595857, 54.1866634 ], [ -126.4594504, 54.1866335 ], [ -126.4593321, 54.1865765 ], [ -126.459227299999981, 54.1865296 ], [ -126.459124300000013, 54.186464 ], [ -126.459017, 54.1864441 ], [ -126.4589116, 54.1864327 ], [ -126.4588196, 54.1864042 ], [ -126.458792800000012, 54.1863501 ], [ -126.458797600000011, 54.186296 ], [ -126.4588293, 54.1862419 ], [ -126.4589249, 54.1861991 ], [ -126.4591406, 54.1861678 ], [ -126.4592644, 54.1861621 ], [ -126.4593893, 54.1861464 ], [ -126.4594965, 54.1861123 ], [ -126.4595927, 54.186061 ], [ -126.459627399999988, 54.1859983 ], [ -126.459646399999983, 54.1859186 ], [ -126.4596353, 54.1858545 ], [ -126.459593200000015, 54.1857818 ], [ -126.459491500000013, 54.1857263 ], [ -126.4593525, 54.1857135 ], [ -126.4592599, 54.1857206 ], [ -126.459184900000011, 54.1857192 ], [ -126.4591069, 54.1857263 ], [ -126.459014299999978, 54.1857334 ], [ -126.4588766, 54.1857306 ], [ -126.4587389, 54.1857277 ], [ -126.458616400000011, 54.1857163 ], [ -126.4584958, 54.1856864 ], [ -126.4583909, 54.185639400000014 ], [ -126.458334900000011, 54.1855853 ], [ -126.4583232, 54.1855298 ], [ -126.4582471, 54.1855112 ], [ -126.458141700000013, 54.1854728 ], [ -126.4580058, 54.1854244 ], [ -126.4578711, 54.1853859 ], [ -126.4577042, 54.185356 ], [ -126.4575665, 54.1853532 ], [ -126.457460399999988, 54.1853503 ], [ -126.4573057, 54.1853475 ], [ -126.457185, 54.1853175 ], [ -126.4571271, 54.185262 ], [ -126.4571478, 54.1851908 ], [ -126.457227599999982, 54.1851381 ], [ -126.4572934, 54.1850769 ], [ -126.457311, 54.1850142 ], [ -126.4572995, 54.1849515 ], [ -126.457258, 54.1848703 ], [ -126.4571721, 54.1848048 ], [ -126.4570673, 54.1847578 ], [ -126.456947899999989, 54.1847108 ], [ -126.456872300000015, 54.1846909 ], [ -126.4567346, 54.184661 ], [ -126.4566291, 54.1846496 ], [ -126.4565383, 54.1846382 ], [ -126.456447, 54.1846282 ], [ -126.4563543, 54.1846083 ], [ -126.4562641, 54.184588399999988 ], [ -126.45617510000001, 54.1845584 ], [ -126.4560856, 54.18453 ], [ -126.456010600000013, 54.184501499999982 ], [ -126.4558607, 54.1844445 ], [ -126.4557858, 54.184416 ], [ -126.4556949, 54.1843776 ], [ -126.45562, 54.1843491 ], [ -126.455545, 54.1843206 ], [ -126.4554555, 54.1842921 ], [ -126.4553799, 54.1842722 ], [ -126.45530380000001, 54.1842537 ], [ -126.455227599999986, 54.1842423 ], [ -126.4550746, 54.184248 ], [ -126.4549838, 54.1842366 ], [ -126.454891800000013, 54.1842352 ], [ -126.4548151, 54.1842252 ], [ -126.4546951, 54.1841867 ], [ -126.4546073, 54.1841397 ], [ -126.4545335, 54.1840742 ], [ -126.4545226, 54.184003 ], [ -126.454587099999983, 54.1839318 ], [ -126.4546547, 54.183852 ], [ -126.4547218, 54.1837737 ], [ -126.4547724, 54.1836939 ], [ -126.454788799999974, 54.183648399999988 ], [ -126.4548564, 54.1835686 ], [ -126.454936800000013, 54.1835074 ], [ -126.4550178, 54.1834376 ], [ -126.455141599999976, 54.1834048 ], [ -126.455293899999987, 54.1834077 ], [ -126.455431600000011, 54.1834376 ], [ -126.4555662, 54.183476 ], [ -126.455656399999981, 54.183496 ], [ -126.4557649, 54.1834988 ], [ -126.455888, 54.1835017 ], [ -126.4559952, 54.1834675 ], [ -126.456060400000013, 54.1834148 ], [ -126.4560665, 54.1833436 ], [ -126.456039, 54.183271 ], [ -126.455981799999989, 54.1832069 ], [ -126.455926299999987, 54.1831243 ], [ -126.4558361, 54.1830773 ], [ -126.455716699999982, 54.1830303 ], [ -126.4555966, 54.1829918 ], [ -126.455476, 54.1829619 ], [ -126.455351099999987, 54.1829776 ], [ -126.4551957, 54.1830103 ], [ -126.455075099999988, 54.1830075 ], [ -126.4549842, 54.182969 ], [ -126.4549123, 54.1829049 ], [ -126.4548557, 54.1828323 ], [ -126.4547825, 54.1827582 ], [ -126.454694799999984, 54.1826842 ], [ -126.4546235, 54.1826115 ], [ -126.454551, 54.182556 ], [ -126.454445, 54.1825261 ], [ -126.4543853, 54.1825161 ], [ -126.454262799999981, 54.1825047 ], [ -126.454155, 54.1824933 ], [ -126.454063, 54.1824919 ], [ -126.453970399999989, 54.182499 ], [ -126.453862499999985, 54.1825418 ], [ -126.453812, 54.1825945 ], [ -126.4537778, 54.1826557 ], [ -126.453803399999984, 54.1827198 ], [ -126.453860099999986, 54.1827924 ], [ -126.453888799999987, 54.182848 ], [ -126.4539131, 54.1829291 ], [ -126.4539253, 54.1830103 ], [ -126.453936200000015, 54.1830815 ], [ -126.453855800000014, 54.1831428 ], [ -126.4537621, 54.1831599 ], [ -126.4536244, 54.183157 ], [ -126.4534867, 54.1831542 ], [ -126.453347699999981, 54.1831684 ], [ -126.4532557, 54.183167 ], [ -126.4531777, 54.1831741 ], [ -126.453085699999988, 54.1831727 ], [ -126.45301019999998, 54.1831798 ], [ -126.452932199999978, 54.1831869 ], [ -126.452856, 54.1832026 ], [ -126.4527019, 54.1832183 ], [ -126.452623199999977, 54.1832339 ], [ -126.452469099999988, 54.1832496 ], [ -126.452392300000014, 54.1832467 ], [ -126.452240599999982, 54.1832354 ], [ -126.4521632, 54.1832339 ], [ -126.4520731, 54.183214 ], [ -126.451965799999982, 54.1831941 ], [ -126.4518768, 54.1831641 ], [ -126.4517866, 54.1831442 ], [ -126.45162040000001, 54.1831058 ], [ -126.4514838, 54.1830659 ], [ -126.4513626, 54.1830374 ], [ -126.451228500000013, 54.1829975 ], [ -126.45107680000001, 54.1829591 ], [ -126.4509555, 54.1829377 ], [ -126.450831900000011, 54.1829363 ], [ -126.45072279999998, 54.182969 ], [ -126.450672900000015, 54.1830402 ], [ -126.4506716, 54.1830844 ], [ -126.4506667, 54.1831385 ], [ -126.4506643, 54.1831926 ], [ -126.4506759, 54.1832553 ], [ -126.450671, 54.1833094 ], [ -126.4506832, 54.1833906 ], [ -126.4506644, 54.1834362 ], [ -126.4506607, 54.1834803 ], [ -126.450658899999979, 54.1835259 ], [ -126.450655200000014, 54.18357 ], [ -126.4506357, 54.1836512 ], [ -126.4506004, 54.1837224 ], [ -126.4505492, 54.1838107 ], [ -126.4504834, 54.183899 ], [ -126.4504651, 54.1839432 ], [ -126.4503975, 54.1840229 ], [ -126.4503031, 54.1840756 ], [ -126.4501964, 54.1840813 ], [ -126.450104399999987, 54.1840529 ], [ -126.4500166, 54.1840059 ], [ -126.4499253, 54.1839688 ], [ -126.449821700000015, 54.183938899999987 ], [ -126.4497016, 54.1839005 ], [ -126.449626, 54.1838535 ], [ -126.4495846, 54.1837993 ], [ -126.449587099999988, 54.1837452 ], [ -126.449621799999989, 54.1836826 ], [ -126.4497022, 54.1836213 ], [ -126.4498144, 54.183553 ], [ -126.4499101, 54.1834832 ], [ -126.44996, 54.183412 ], [ -126.4499502, 54.1833308 ], [ -126.4498618, 54.1832653 ], [ -126.4497407, 54.1832368 ], [ -126.449664399999989, 54.1832254 ], [ -126.449589499999988, 54.183224 ], [ -126.4494816, 54.1832126 ], [ -126.449344, 54.1832097 ], [ -126.449191700000014, 54.1832069 ], [ -126.4491143, 54.1832054 ], [ -126.448977700000015, 54.1831926 ], [ -126.448901, 54.1832097 ], [ -126.448760900000011, 54.1832339 ], [ -126.4486195, 54.1832752 ], [ -126.448568899999984, 54.183355 ], [ -126.4485945, 54.1834461 ], [ -126.4486664, 54.1835373 ], [ -126.4487084, 54.1835829 ], [ -126.448718199999988, 54.183664 ], [ -126.4486987, 54.1837452 ], [ -126.448586599999985, 54.1838136 ], [ -126.448506099999989, 54.1838748 ], [ -126.4484714, 54.1839375 ], [ -126.448453099999981, 54.1840087 ], [ -126.4484642, 54.1840728 ], [ -126.4485513, 54.1841283 ], [ -126.448656700000015, 54.1841668 ], [ -126.4487938, 54.1842052 ], [ -126.4488979, 54.1842337 ], [ -126.448987, 54.1842907 ], [ -126.449013799999989, 54.1843448 ], [ -126.4490089, 54.184426 ], [ -126.4489747, 54.1844872 ], [ -126.4489266, 54.1845399 ], [ -126.448891199999977, 54.1846111 ], [ -126.4488572, 54.1846653 ], [ -126.4487896, 54.184745 ], [ -126.448695, 54.1848048 ], [ -126.4486, 54.1848661 ], [ -126.4484891, 54.184917299999988 ], [ -126.448347799999979, 54.1849515 ], [ -126.4481949, 54.1849572 ], [ -126.4480583, 54.1849444 ], [ -126.4479219, 54.1849245 ], [ -126.447784200000015, 54.1848946 ], [ -126.447678700000012, 54.1848561 ], [ -126.4475928, 54.1847906 ], [ -126.447535500000015, 54.1847265 ], [ -126.4475087, 54.1846453 ], [ -126.4474532, 54.1845627 ], [ -126.447397200000012, 54.1844815 ], [ -126.4473563, 54.1843989 ], [ -126.447358799999989, 54.1843448 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17098738, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 27249.0807851069, "blue_line_key": 360880905, "length_metre": 12.2878312020186, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.425629300000011, 54.2990848 ], [ -126.4254472, 54.2990549 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104038, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 4882.5756109411604, "blue_line_key": 360882583, "length_metre": 138.97310688298501, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.9928261, 54.2192622 ], [ -125.992628899999985, 54.219275 ], [ -125.992292, 54.2192835 ], [ -125.9922435, 54.2192764 ], [ -125.9920283, 54.2192721 ], [ -125.9919822, 54.219265 ], [ -125.99187640000001, 54.2192678 ], [ -125.991522, 54.2192579 ], [ -125.991476, 54.2192508 ], [ -125.9913829, 54.2192522 ], [ -125.9910787, 54.2192778 ], [ -125.9907639, 54.2193846 ], [ -125.9907493, 54.2193846 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17065166, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 9638.8046317344197, "blue_line_key": 360856488, "length_metre": 1284.9032980124, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4552045, 54.5723393 ], [ -126.4554225, 54.5725601 ], [ -126.455450399999989, 54.5726142 ], [ -126.4554675, 54.5728122 ], [ -126.4554709, 54.5730286 ], [ -126.455463099999989, 54.5731639 ], [ -126.4554499, 54.5733434 ], [ -126.455492, 54.5734061 ], [ -126.45564109999998, 54.5735001 ], [ -126.4557329, 54.5735471 ], [ -126.4560526, 54.5736168 ], [ -126.456232699999987, 54.5736923 ], [ -126.4563808, 54.57380340000001 ], [ -126.456449799999987, 54.5739302 ], [ -126.456462899999977, 54.5739843 ], [ -126.4564963, 54.5741922 ], [ -126.4565074, 54.5742734 ], [ -126.456513899999976, 54.5744172 ], [ -126.456517299999987, 54.5746052 ], [ -126.4565081, 54.5747591 ], [ -126.4565187, 54.5748132 ], [ -126.4565059, 54.5750197 ], [ -126.456425099999976, 54.5750895 ], [ -126.4563292, 54.5751322 ], [ -126.4560927, 54.5751906 ], [ -126.4560287, 54.5752333 ], [ -126.456027100000014, 54.5752874 ], [ -126.4560682, 54.5753601 ], [ -126.456142199999974, 54.5754156 ], [ -126.456306599999976, 54.5755011 ], [ -126.4564563, 54.5755936 ], [ -126.4565293, 54.5756663 ], [ -126.4565689, 54.5757574 ], [ -126.456587, 54.5759739 ], [ -126.4565677, 54.5760366 ], [ -126.456452899999988, 54.5761334 ], [ -126.456343199999978, 54.5761662 ], [ -126.456277699999987, 54.5762274 ], [ -126.4562737, 54.5762815 ], [ -126.4563132, 54.5763727 ], [ -126.4564303, 54.5765094 ], [ -126.456678, 54.5767302 ], [ -126.4569438, 54.5769338 ], [ -126.457002599999981, 54.5769979 ], [ -126.457040600000013, 54.5771432 ], [ -126.4569832, 54.5772941 ], [ -126.4569237, 54.5775007 ], [ -126.456930199999988, 54.5776445 ], [ -126.456943400000014, 54.5776986 ], [ -126.457141299999989, 54.5777656 ], [ -126.4572494, 54.5777584 ], [ -126.457358, 54.5777428 ], [ -126.457453499999986, 54.5777086 ], [ -126.4578358, 54.5775277 ], [ -126.4579764, 54.5775049 ], [ -126.4581292, 54.5775249 ], [ -126.458402100000015, 54.5776303 ], [ -126.4584767, 54.5776773 ], [ -126.458638, 54.5778425 ], [ -126.4587878, 54.5778994 ], [ -126.4589111, 54.5779194 ], [ -126.4590329, 54.5779578 ], [ -126.4590583, 54.578012 ], [ -126.4589592, 54.5781273 ], [ -126.458894699999988, 54.5781715 ], [ -126.458512500000012, 54.5783523 ], [ -126.4581291, 54.5785503 ], [ -126.45799959999998, 54.5786471 ], [ -126.457895099999988, 54.5788067 ], [ -126.4579082, 54.5788608 ], [ -126.4579184, 54.5789234 ], [ -126.4579919, 54.5789875 ], [ -126.4580995, 54.5790174 ], [ -126.4582061, 54.5790288 ], [ -126.4584401, 54.579006 ], [ -126.458739099999988, 54.5789234 ], [ -126.4590401, 54.5788209 ], [ -126.4591818, 54.5787881 ], [ -126.4594325, 54.5787312 ], [ -126.459685799999974, 54.578645699999988 ], [ -126.459793, 54.5786486 ], [ -126.460038599999976, 54.5786984 ], [ -126.46034, 54.5788209 ], [ -126.4606913, 54.5788921 ], [ -126.4609649, 54.5789605 ], [ -126.4612825, 54.5790929 ], [ -126.4615094, 54.5791613 ], [ -126.461769300000014, 54.5792197 ], [ -126.4620291, 54.579271 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17061709, "stream_order": 4, "gnis_name": "Richfield Creek", "downstream_route_measure": 17642.530623831601, "blue_line_key": 360788426, "length_metre": 138.39668798211301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.203872, 54.5906504 ], [ -126.203748, 54.5906746 ], [ -126.2034667, 54.5906774 ], [ -126.203188, 54.5906803 ], [ -126.2028343, 54.5906447 ], [ -126.20249840000001, 54.5906005 ], [ -126.202405, 54.5906077 ], [ -126.202324, 54.5906418 ], [ -126.2023101, 54.5908483 ], [ -126.2022904, 54.590911 ], [ -126.2022125, 54.5909367 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17054134, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 28770.098080689801, "blue_line_key": 360856488, "length_metre": 563.00695946692304, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5964593, 54.6325022 ], [ -126.59651, 54.6326916 ], [ -126.5966738, 54.6328027 ], [ -126.5968136, 54.6328326 ], [ -126.5970823, 54.6329822 ], [ -126.5973395, 54.6330861 ], [ -126.5976125, 54.6332086 ], [ -126.597959, 54.6333681 ], [ -126.5981837, 54.6334806 ], [ -126.5984386, 54.6336202 ], [ -126.598701, 54.6336515 ], [ -126.5987774, 54.63368 ], [ -126.598864699999979, 54.6337626 ], [ -126.599184, 54.6338865 ], [ -126.599291799999989, 54.633888 ], [ -126.599662, 54.6339136 ], [ -126.5998456, 54.6339449 ], [ -126.5999998, 54.6339834 ], [ -126.6001372, 54.6340133 ], [ -126.600497499999989, 54.6341828 ], [ -126.6008259, 54.634395 ], [ -126.6009319, 54.6344519 ], [ -126.6012779, 54.63462 ], [ -126.601399599999979, 54.634667 ], [ -126.601688400000015, 54.6347724 ], [ -126.602009, 54.6348422 ], [ -126.602179799999988, 54.6348536 ], [ -126.6025056, 54.6348507 ], [ -126.6027383, 54.6348464 ], [ -126.6029859, 54.6348422 ], [ -126.603203899999983, 54.6348379 ], [ -126.6033718, 54.6348507 ], [ -126.6036036, 54.6348635 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17055109, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 19407.1472439715, "blue_line_key": 360856488, "length_metre": 89.532443221079504, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5104612, 54.6258554 ], [ -126.5105489, 54.6259295 ], [ -126.5105922, 54.6259751 ], [ -126.510767, 54.6261673 ], [ -126.5107907, 54.6262841 ], [ -126.510676600000011, 54.626372400000015 ], [ -126.510593, 54.6264507 ], [ -126.5105906, 54.6265148 ], [ -126.5106335, 54.6265689 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17085340, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 198358.892620333, "blue_line_key": 360873822, "length_metre": 315.594647284291, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5054897, 54.4703716 ], [ -126.5052334, 54.4701865 ], [ -126.5051123, 54.4699088 ], [ -126.505134399999974, 54.4695513 ], [ -126.505289, 54.4692351 ], [ -126.505335699999975, 54.4689403 ], [ -126.505228799999983, 54.4686085 ], [ -126.5047491, 54.4682282 ], [ -126.5040504, 54.467913400000015 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092059, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 15605.371291682201, "blue_line_key": 360862508, "length_metre": 173.56551357488999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.366117499999987, 54.4127339 ], [ -126.3657145, 54.4127937 ], [ -126.3650322, 54.4127025 ], [ -126.3648157, 54.4127125 ], [ -126.3644509, 54.4127752 ], [ -126.36362530000001, 54.4130671 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092182, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 9388.3346657340007, "blue_line_key": 360862508, "length_metre": 8.2801604176174699, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.445499099999978, 54.4114649 ], [ -126.4454877, 54.4114279 ], [ -126.4454734, 54.4113923 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102758, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 29770.9475863156, "blue_line_key": 360881038, "length_metre": 109.370497443977, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.068984500000013, 54.2364267 ], [ -126.069069399999989, 54.236321300000014 ], [ -126.069072100000014, 54.2362943 ], [ -126.0690579, 54.2360607 ], [ -126.069044, 54.2360322 ], [ -126.0690528, 54.2359154 ], [ -126.0690383, 54.2358884 ], [ -126.0690062, 54.2356904 ], [ -126.068977699999976, 54.2356619 ], [ -126.068822199999985, 54.2354882 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17106993, "stream_order": 4, "gnis_name": "Buck Creek", "downstream_route_measure": 65241.976839188297, "blue_line_key": 360886221, "length_metre": 377.688129971161, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.34134250000001, 54.1702138 ], [ -126.3365696, 54.1692896 ], [ -126.336116300000015, 54.16892630000001 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091731, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 271557.35319719103, "blue_line_key": 360873822, "length_metre": 351.62828740788802, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0982274, 54.4174153 ], [ -126.0984817, 54.4172871 ], [ -126.0985933, 54.4172629 ], [ -126.098732399999989, 54.4172572 ], [ -126.0990205, 54.417327 ], [ -126.099359599999985, 54.4175335 ], [ -126.099481, 54.4175634 ], [ -126.0995888, 54.4175562 ], [ -126.0996838, 54.4175235 ], [ -126.1000024, 54.4173868 ], [ -126.1003823, 54.4172429 ], [ -126.1005232, 54.4172187 ], [ -126.100861, 54.4172187 ], [ -126.1012018, 54.4172173 ], [ -126.1015462, 54.4171447 ], [ -126.101814499999975, 54.4170521 ], [ -126.102104399999988, 54.416879699999988 ], [ -126.1023323, 54.416696 ], [ -126.1024823, 54.4165379 ], [ -126.102550900000011, 54.4164226 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091972, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 13419.778944051201, "blue_line_key": 360862508, "length_metre": 575.235690848226, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.393418900000015, 54.4134075 ], [ -126.3931425, 54.4133933 ], [ -126.392769, 54.4134389 ], [ -126.3924451, 54.4134759 ], [ -126.3920579, 54.4134773 ], [ -126.3917202, 54.4134702 ], [ -126.3915795, 54.4134944 ], [ -126.3912526, 54.41354 ], [ -126.3909747, 54.4135713 ], [ -126.39061430000001, 54.4136354 ], [ -126.3905355, 54.4136781 ], [ -126.390208, 54.4137251 ], [ -126.3898819, 54.4137892 ], [ -126.389757, 54.4137963 ], [ -126.3894153, 54.4138419 ], [ -126.389058499999976, 54.4138889 ], [ -126.3887178, 54.4138903 ], [ -126.3883669, 54.4138376 ], [ -126.3881102, 54.4137607 ], [ -126.3879557, 54.4137479 ], [ -126.387665699999985, 54.4137237 ], [ -126.3874051, 54.4136995 ], [ -126.387112799999983, 54.4137023 ], [ -126.386771599999989, 54.4137052 ], [ -126.3864328, 54.4137152 ], [ -126.3863261, 54.4137123 ], [ -126.3861552, 54.413718 ], [ -126.385909, 54.4137223 ], [ -126.3856148, 54.4137237 ], [ -126.3854785, 54.4136938 ], [ -126.3854205, 54.4136297 ], [ -126.3853624, 54.4135656 ], [ -126.3852521, 54.4133933 ], [ -126.3852415, 54.413285 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17054374, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 23443.689161857601, "blue_line_key": 360856488, "length_metre": 13.452832653994999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.544052899999983, 54.6312546 ], [ -126.5440276, 54.631135 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17064676, "stream_order": 4, "gnis_name": "Johnny David Creek", "downstream_route_measure": 9577.0504641029693, "blue_line_key": 360866287, "length_metre": 144.61881628984901, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.43347679999998, 54.575306 ], [ -126.4337507, 54.5754014 ], [ -126.4340598, 54.575417 ], [ -126.4343658, 54.5754769 ], [ -126.434486, 54.5755338 ], [ -126.4346057, 54.5755993 ], [ -126.4347345, 54.5757375 ], [ -126.434892599999984, 54.5759468 ], [ -126.4350523, 54.576095 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17074292, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 1352.0623644971499, "blue_line_key": 360875378, "length_metre": 396.29449300792697, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4686766, 54.5237353 ], [ -126.4686808, 54.5239062 ], [ -126.468734700000013, 54.524033 ], [ -126.4688599, 54.5242509 ], [ -126.4689012, 54.5243506 ], [ -126.4689536, 54.5244959 ], [ -126.46902750000001, 54.5245514 ], [ -126.469405899999984, 54.5246767 ], [ -126.4696516, 54.524718 ], [ -126.4698009, 54.5248106 ], [ -126.4700887, 54.524879 ], [ -126.4701631, 54.524926 ], [ -126.4702804, 54.5250541 ], [ -126.47035480000001, 54.5251011 ], [ -126.470503699999981, 54.5251667 ], [ -126.4706121, 54.525186600000012 ], [ -126.47088140000001, 54.5253361 ], [ -126.471031399999987, 54.5253846 ], [ -126.471074399999978, 54.5254301 ], [ -126.4713892, 54.5256253 ], [ -126.4716455, 54.5257207 ], [ -126.471777, 54.5258503 ], [ -126.4718766, 54.525987 ], [ -126.4719028, 54.5260596 ], [ -126.4719521, 54.5262491 ], [ -126.4719273, 54.5264185 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17063815, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 22378.437785906601, "blue_line_key": 360875378, "length_metre": 44.634862590677898, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.681340299999988, 54.5786081 ], [ -126.681795799999989, 54.578909200000012 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17094164, "stream_order": 5, "gnis_name": "Bulkley River", "downstream_route_measure": 262016.89491602001, "blue_line_key": 360873822, "length_metre": 161.74932356169001, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0742122, 54.3860043 ], [ -126.071967099999981, 54.3866381 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100562, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1889.47632097478, "blue_line_key": 360874778, "length_metre": 54.998992123302003, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3450953, 54.2685968 ], [ -126.344986600000013, 54.2685939 ], [ -126.3446831, 54.2685426 ], [ -126.3445774, 54.2685313 ], [ -126.344378299999974, 54.2685085 ], [ -126.344333100000014, 54.2684985 ], [ -126.3442703, 54.2684971 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093571, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 0.0, "blue_line_key": 360802599, "length_metre": 218.72343393344499, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5248841, 54.393901 ], [ -126.5218499, 54.3939995 ], [ -126.521525200000013, 54.3939457 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17084707, "stream_order": 5, "gnis_name": "Ailport Creek", "downstream_route_measure": 3526.5036532480699, "blue_line_key": 360878058, "length_metre": 218.37833296689101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2205238, 54.4725122 ], [ -126.2204482, 54.4724837 ], [ -126.220221400000014, 54.4724325 ], [ -126.2201264, 54.4724581 ], [ -126.219905299999979, 54.4725421 ], [ -126.2198383, 54.4726133 ], [ -126.2197665, 54.4727458 ], [ -126.2197615, 54.4728355 ], [ -126.2197519, 54.4729794 ], [ -126.2196858, 54.4730135 ], [ -126.219407799999985, 54.4730164 ], [ -126.2191635, 54.4729936 ], [ -126.2189174, 54.4729964 ], [ -126.218638200000015, 54.4730164 ], [ -126.2182953, 54.4730363 ], [ -126.2180009, 54.4730648 ], [ -126.2178941, 54.473062 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17089331, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 185640.27540193399, "blue_line_key": 360873822, "length_metre": 949.51739244701901, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5869406, 54.4366777 ], [ -126.5866136, 54.4369483 ], [ -126.5862579, 54.4374069 ], [ -126.5859584, 54.4379709 ], [ -126.585959300000013, 54.4382073 ], [ -126.586321500000011, 54.4384608 ], [ -126.5869778, 54.4386716 ], [ -126.587221, 54.4387186 ], [ -126.587836599999989, 54.4387228 ], [ -126.588371899999984, 54.4388311 ], [ -126.5885328, 54.4391145 ], [ -126.588389, 54.4393723 ], [ -126.588163, 54.439529 ], [ -126.587815600000013, 54.4396685 ], [ -126.587392799999989, 54.4397924 ], [ -126.587015, 54.4398437 ], [ -126.586501500000011, 54.4397853 ], [ -126.5856959, 54.4394407 ], [ -126.585052, 54.4393908 ], [ -126.5843321, 54.4394819 ], [ -126.5828921, 54.4397981 ], [ -126.582544500000012, 54.4399733 ], [ -126.5824905, 54.4401143 ], [ -126.582773199999977, 54.440835 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17074913, "stream_order": 4, "gnis_name": "Cesford Creek", "downstream_route_measure": 2706.6201271876198, "blue_line_key": 360765936, "length_metre": 2510.2447070875701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.286138600000015, 54.5210778 ], [ -126.2858209, 54.5212059 ], [ -126.2856871, 54.5213555 ], [ -126.2855697, 54.5214794 ], [ -126.2854896, 54.5215392 ], [ -126.2853283, 54.5216346 ], [ -126.2851165, 54.5217827 ], [ -126.2847644, 54.5219736 ], [ -126.2845739, 54.522040499999989 ], [ -126.284223399999973, 54.5222129 ], [ -126.2841126, 54.5222556 ], [ -126.283810699999989, 54.5223738 ], [ -126.283474899999987, 54.5225461 ], [ -126.283316399999975, 54.5226059 ], [ -126.2829498, 54.522768299999989 ], [ -126.282648499999979, 54.522878 ], [ -126.2824752, 54.5229378 ], [ -126.2821008, 54.5229834 ], [ -126.281788599999985, 54.5230474 ], [ -126.2814434, 54.5231215 ], [ -126.2811798, 54.5231243 ], [ -126.2808166, 54.5232426 ], [ -126.2805471, 54.5233522 ], [ -126.2802797, 54.5234006 ], [ -126.2801866, 54.5234348 ], [ -126.2798656, 54.5236072 ], [ -126.279532, 54.5237524 ], [ -126.2791932, 54.5239333 ], [ -126.2790008, 54.5240544 ], [ -126.27894160000001, 54.5242423 ], [ -126.2789381, 54.524315 ], [ -126.278905599999987, 54.5245386 ], [ -126.278924, 54.52473650000001 ], [ -126.2788401, 54.5248419 ], [ -126.278728199999989, 54.5248946 ], [ -126.278411, 54.5250214 ], [ -126.27822, 54.5250898 ], [ -126.27788529999998, 54.5252521 ], [ -126.2776609, 54.5253732 ], [ -126.27750180000001, 54.5254415 ], [ -126.2772926, 54.525554 ], [ -126.277097900000015, 54.5257022 ], [ -126.277019, 54.5257449 ], [ -126.2766655, 54.5259258 ], [ -126.276406099999988, 54.526118 ], [ -126.2760862, 54.5262733 ], [ -126.275763499999982, 54.5264641 ], [ -126.2756532, 54.5265054 ], [ -126.2753399, 54.5265795 ], [ -126.2751188, 54.5266564 ], [ -126.2747541, 54.5267646 ], [ -126.2746889, 54.5268173 ], [ -126.2745155, 54.5268843 ], [ -126.274353099999985, 54.5269896 ], [ -126.274145, 54.5270922 ], [ -126.274034799999981, 54.5271264 ], [ -126.2736956, 54.5271278 ], [ -126.2734331, 54.5271207 ], [ -126.273215600000015, 54.5271249 ], [ -126.272983400000015, 54.5271292 ], [ -126.2726442, 54.5271306 ], [ -126.2723956, 54.5271606 ], [ -126.2721303, 54.5271819 ], [ -126.27174, 54.5272446 ], [ -126.271596699999989, 54.5272958 ], [ -126.2713125, 54.5274055 ], [ -126.271091199999987, 54.5274554 ], [ -126.270903099999984, 54.5275223 ], [ -126.2707262, 54.5275992 ], [ -126.27061590000001, 54.5276334 ], [ -126.270314, 54.5277516 ], [ -126.2702204, 54.5277943 ], [ -126.2698821, 54.5279667 ], [ -126.2694979, 54.5281646 ], [ -126.2691693, 54.5282472 ], [ -126.2688235, 54.5283298 ], [ -126.268715399999977, 54.528337 ], [ -126.2683888, 54.5283654 ], [ -126.2680116, 54.5284466 ], [ -126.2679002, 54.5284979 ], [ -126.2676879, 54.5286816 ], [ -126.267526, 54.5287856 ], [ -126.2674321, 54.5288012 ], [ -126.267229300000011, 54.528805500000011 ], [ -126.266936799999982, 54.5287998 ], [ -126.2668457, 54.5287799 ], [ -126.266739099999981, 54.5287414 ], [ -126.266540400000011, 54.5287272 ], [ -126.266446500000015, 54.5287429 ], [ -126.266191799999987, 54.5288454 ], [ -126.265974300000011, 54.5288497 ], [ -126.265753100000012, 54.5287186 ], [ -126.2656218, 54.5285905 ], [ -126.2655323, 54.528552 ], [ -126.265142899999987, 54.5285705 ], [ -126.2650492, 54.5286132 ], [ -126.2647131, 54.5287585 ], [ -126.264373399999982, 54.5287685 ], [ -126.264235, 54.5287571 ], [ -126.2641147, 54.5287087 ], [ -126.2639764, 54.5286973 ], [ -126.2638842, 54.5286944 ], [ -126.263542500000014, 54.5286959 ], [ -126.2632075, 54.5286161 ], [ -126.2630864, 54.5286047 ], [ -126.2629781, 54.5285848 ], [ -126.262675499999986, 54.5284965 ], [ -126.26243, 54.5284552 ], [ -126.2623099, 54.5284338 ], [ -126.2619683, 54.5284352 ], [ -126.261813499999988, 54.5284495 ], [ -126.261528, 54.528542 ], [ -126.261194299999985, 54.5286873 ], [ -126.2610477, 54.5287827 ], [ -126.2608229, 54.5289394 ], [ -126.260679, 54.5289992 ], [ -126.260411800000014, 54.5290747 ], [ -126.260234299999979, 54.5291601 ], [ -126.259951199999989, 54.5292527 ], [ -126.2595801, 54.5294692 ], [ -126.2594387, 54.529529 ], [ -126.2593139, 54.5295347 ], [ -126.258957599999988, 54.5295361 ], [ -126.2586803, 54.529529 ], [ -126.25842, 54.5294877 ], [ -126.2581306, 54.5294179 ], [ -126.25799, 54.5294336 ], [ -126.2577288, 54.5296515 ], [ -126.2574186, 54.5296543 ], [ -126.257250700000014, 54.5296501 ], [ -126.2570655, 54.5296187 ], [ -126.2567113, 54.5295931 ], [ -126.2566202, 54.5295732 ], [ -126.2564418, 54.5294877 ], [ -126.256228799999988, 54.5294379 ], [ -126.2561193, 54.529435 ], [ -126.2557493, 54.5294265 ], [ -126.2554243, 54.5294293 ], [ -126.2550856, 54.5294293 ], [ -126.2548559, 54.5293709 ], [ -126.2545326, 54.5293553 ], [ -126.254346399999989, 54.529368100000013 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17105079, "stream_order": 4, "gnis_name": "Maxan Creek", "downstream_route_measure": 34762.700257103999, "blue_line_key": 360881038, "length_metre": 362.03537182123, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0534641, 54.2050372 ], [ -126.0532655, 54.2050144 ], [ -126.0531103, 54.2050457 ], [ -126.0527691, 54.2050927 ], [ -126.0527107, 54.2050728 ], [ -126.0526652, 54.205044300000012 ], [ -126.052625499999976, 54.2049802 ], [ -126.052614, 54.204899 ], [ -126.052585, 54.2048719 ], [ -126.0523669, 54.2047039 ], [ -126.052263, 54.2046754 ], [ -126.052202600000015, 54.204674 ], [ -126.0518503, 54.204665399999989 ], [ -126.0517597, 54.204627 ], [ -126.0514573, 54.2045558 ], [ -126.051385, 54.2045273 ], [ -126.0511019, 54.2044034 ], [ -126.0508368, 54.2042439 ], [ -126.050647900000016, 54.2040957 ], [ -126.0505011, 54.2040117 ], [ -126.050396, 54.2039733 ], [ -126.0501626, 54.2038138 ], [ -126.0500508, 54.2036414 ], [ -126.050037, 54.2036129 ], [ -126.0500403, 54.2035773 ], [ -126.050039, 54.2033893 ], [ -126.0500252, 54.2033609 ], [ -126.0500293, 54.2033167 ], [ -126.0500149, 54.2032896 ], [ -126.0499711, 54.2032697 ], [ -126.0497572, 54.2032555 ], [ -126.0497122, 54.2032455 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17066406, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 5079.4009450550802, "blue_line_key": 360851751, "length_metre": 352.95047975775901, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1698856, 54.5671994 ], [ -126.164550100000014, 54.5664982 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102045, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 28038.782212133901, "blue_line_key": 360881038, "length_metre": 137.14859572803999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.06971630000001, 54.2464788 ], [ -126.0693638, 54.2464432 ], [ -126.069318700000011, 54.2464332 ], [ -126.0692616, 54.2463962 ], [ -126.0692327, 54.2463421 ], [ -126.0693215, 54.2461996 ], [ -126.0693821, 54.2459946 ], [ -126.0693405, 54.2459219 ], [ -126.069252400000011, 54.2458564 ], [ -126.069257799999988, 54.2457752 ], [ -126.069277, 54.245749600000011 ], [ -126.069279099999989, 54.245704 ], [ -126.0692647, 54.245677 ], [ -126.0693104, 54.2456784 ], [ -126.069358799999989, 54.2456528 ], [ -126.0693768, 54.2456171 ], [ -126.0693676, 54.245536 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17099149, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 19427.4412490992, "blue_line_key": 360881038, "length_metre": 1154.9220700594001, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.093322199999989, 54.3028102 ], [ -126.0915386, 54.2989979 ], [ -126.0881823, 54.2929069 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17055328, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 25509.084665583501, "blue_line_key": 360856488, "length_metre": 334.86512663046102, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5601201, 54.6242418 ], [ -126.5602708, 54.6243258 ], [ -126.5605122, 54.6244469 ], [ -126.5607987, 54.6245793 ], [ -126.5611292, 54.6247203 ], [ -126.5614081, 54.6247175 ], [ -126.561733800000013, 54.6247146 ], [ -126.562091, 54.6247132 ], [ -126.5624148, 54.6247374 ], [ -126.562601299999983, 54.6247317 ], [ -126.5628945, 54.6247374 ], [ -126.5630343, 54.6247317 ], [ -126.5633767, 54.6247303 ], [ -126.5636389, 54.624726 ], [ -126.5637649, 54.6247104 ], [ -126.564075699999975, 54.6246719 ], [ -126.5642341, 54.6246477 ], [ -126.564327, 54.6246135 ], [ -126.5647076, 54.6244868 ], [ -126.5649251, 54.624491 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17084212, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 230130.34543652201, "blue_line_key": 360873822, "length_metre": 321.23925041697902, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.259244599999988, 54.4774941 ], [ -126.2596689, 54.4773417 ], [ -126.2598011, 54.4772249 ], [ -126.2598872, 54.4769344 ], [ -126.2599802, 54.4768589 ], [ -126.260538700000012, 54.4766738 ], [ -126.2608411, 54.4763676 ], [ -126.2608304, 54.4762735 ], [ -126.260181100000011, 54.4758178 ], [ -126.2601698, 54.4754632 ], [ -126.2605086, 54.475241 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17094287, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 258247.399096774, "blue_line_key": 360873822, "length_metre": 323.61566949784498, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1274893, 54.3845858 ], [ -126.1256201, 54.38371750000001 ], [ -126.1233209, 54.383012 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100340, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 9443.3503525820797, "blue_line_key": 360877225, "length_metre": 253.75996127382001, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1948526, 54.2738421 ], [ -126.1949658, 54.2737723 ], [ -126.195176299999986, 54.2736157 ], [ -126.1951941, 54.2735801 ], [ -126.1952259, 54.273553 ], [ -126.195325799999978, 54.2734391 ], [ -126.1953429, 54.273412 ], [ -126.195409, 54.2733508 ], [ -126.1955286, 54.2731827 ], [ -126.19554, 54.2730033 ], [ -126.195525499999988, 54.2729762 ], [ -126.195528, 54.2729491 ], [ -126.1955013, 54.272895 ], [ -126.1955038, 54.272868 ], [ -126.195489200000011, 54.2728409 ], [ -126.195494900000014, 54.2727782 ], [ -126.195480899999978, 54.2727498 ], [ -126.195497499999988, 54.2727241 ], [ -126.1955007, 54.2726885 ], [ -126.1955178, 54.2726615 ], [ -126.1955916, 54.2724649 ], [ -126.1956056, 54.2722584 ], [ -126.1955274, 54.2720505 ], [ -126.195494900000014, 54.2718511 ], [ -126.19556489999998, 54.2717457 ], [ -126.195596699999982, 54.2717186 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17057014, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 17653.086332217401, "blue_line_key": 360856488, "length_metre": 329.55561531556998, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.50539, 54.6152864 ], [ -126.5053541, 54.6153761 ], [ -126.5053625, 54.6154658 ], [ -126.5056154, 54.6156595 ], [ -126.5056095, 54.6157407 ], [ -126.5055082, 54.6158916 ], [ -126.505332099999976, 54.6159956 ], [ -126.5052805, 54.6160668 ], [ -126.5052756, 54.616138 ], [ -126.505294799999987, 54.616346 ], [ -126.505298799999977, 54.616534 ], [ -126.505383900000012, 54.6166436 ], [ -126.505458699999977, 54.6166906 ], [ -126.5056722, 54.616749 ], [ -126.5058247, 54.6167704 ], [ -126.50599, 54.6168544 ], [ -126.5060638, 54.6169185 ], [ -126.50610660000001, 54.6170011 ], [ -126.506217799999973, 54.617192 ], [ -126.5062129, 54.6172632 ], [ -126.5062169, 54.6174796 ], [ -126.506179, 54.6175679 ], [ -126.505980799999989, 54.6177716 ], [ -126.5059755, 54.6178514 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17083166, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 201107.49735778599, "blue_line_key": 360873822, "length_metre": 644.28447347363999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4808924, 54.4800036 ], [ -126.4816631, 54.480512 ], [ -126.4820932, 54.4806772 ], [ -126.482728199999983, 54.480831 ], [ -126.483060099999975, 54.4810945 ], [ -126.4830907, 54.4813295 ], [ -126.4830239, 54.4815203 ], [ -126.4827504, 54.4816927 ], [ -126.4823987, 54.481808 ], [ -126.4810646, 54.4819077 ], [ -126.480868, 54.4822453 ], [ -126.480863899999974, 54.4824603 ], [ -126.4809645, 54.4827053 ], [ -126.4816889, 54.4833818 ], [ -126.482122499999974, 54.4838803 ], [ -126.482396799999989, 54.4840284 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17087588, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 235206.84657491499, "blue_line_key": 360873822, "length_metre": 262.353541866721, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2362186, 54.4540459 ], [ -126.236360099999985, 54.4540132 ], [ -126.2366117, 54.4539192 ], [ -126.236806699999988, 54.4537981 ], [ -126.2370169, 54.4536414 ], [ -126.237099300000011, 54.4535617 ], [ -126.2371505, 54.4535004 ], [ -126.237173799999979, 54.4533666 ], [ -126.2372335, 54.4531786 ], [ -126.2372012, 54.4529806 ], [ -126.2371579, 54.4529165 ], [ -126.236904, 54.4528111 ], [ -126.236659, 54.4527698 ], [ -126.2362886, 54.4527712 ], [ -126.2360772, 54.4527114 ], [ -126.2358375, 54.4526075 ], [ -126.235736399999979, 54.4525063 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17093457, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 252958.08725977599, "blue_line_key": 360873822, "length_metre": 1741.12009180887, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.173918, 54.4044849 ], [ -126.1738396, 54.404492 ], [ -126.1737942, 54.404482 ], [ -126.1733977, 54.4044279 ], [ -126.1730649, 54.4043396 ], [ -126.1727969, 54.4042071 ], [ -126.1727692, 54.4041616 ], [ -126.1727646, 54.4039907 ], [ -126.1727502, 54.4037656 ], [ -126.1727344, 54.4035306 ], [ -126.1727067, 54.4034851 ], [ -126.1726491, 54.403448 ], [ -126.17252830000001, 54.4034096 ], [ -126.1723463, 54.4033512 ], [ -126.1720146, 54.403252900000012 ], [ -126.1718774, 54.403233 ], [ -126.1715563, 54.4031803 ], [ -126.17112849999998, 54.4031247 ], [ -126.170890599999979, 54.4030108 ], [ -126.170802900000012, 54.4029553 ], [ -126.1706245, 54.4028527 ], [ -126.170245099999988, 54.4027715 ], [ -126.1699416, 54.4026832 ], [ -126.169881599999982, 54.4026733 ], [ -126.16965350000001, 54.4026134 ], [ -126.169197599999976, 54.4025138 ], [ -126.168878899999982, 54.402461 ], [ -126.168574299999989, 54.4024169 ], [ -126.1682268, 54.4023015 ], [ -126.1682175, 54.4022118 ], [ -126.168317699999989, 54.4020965 ], [ -126.168394600000013, 54.4018828 ], [ -126.1683522, 54.4018102 ], [ -126.1682793, 54.4017817 ], [ -126.168202, 54.4017789 ], [ -126.167893799999987, 54.4017717 ], [ -126.1675202, 54.4018173 ], [ -126.167116, 54.40188 ], [ -126.166788899999986, 54.4019256 ], [ -126.166397499999974, 54.4020067 ], [ -126.166038599999979, 54.4020794 ], [ -126.165741, 54.4021449 ], [ -126.165431, 54.4021634 ], [ -126.165115899999989, 54.4020395 ], [ -126.1650883, 54.4019939 ], [ -126.16516390000001, 54.4017974 ], [ -126.1651829, 54.4017447 ], [ -126.1652489, 54.4016834 ], [ -126.165415900000013, 54.4014983 ], [ -126.1654285, 54.4013274 ], [ -126.1654993, 54.401185 ], [ -126.165804200000011, 54.4010041 ], [ -126.1661409, 54.4008232 ], [ -126.1661834, 54.4006438 ], [ -126.1660852, 54.4005156 ], [ -126.165969899999979, 54.4003874 ], [ -126.1659954, 54.400235 ], [ -126.166023299999978, 54.4000556 ], [ -126.1660134, 54.4000014 ], [ -126.16598879999998, 54.399893200000015 ], [ -126.1659765, 54.3998661 ], [ -126.165921200000014, 54.3997479 ], [ -126.165789899999979, 54.399636799999989 ], [ -126.165595599999989, 54.3995514 ], [ -126.165400600000012, 54.3994745 ], [ -126.1651892, 54.399416099999989 ], [ -126.165035499999988, 54.3994218 ], [ -126.1649111, 54.3994275 ], [ -126.1647213, 54.3995129 ], [ -126.1644855, 54.3995699 ], [ -126.1643924, 54.399577 ], [ -126.164289399999987, 54.399503 ], [ -126.1642702, 54.3993321 ], [ -126.1642515, 54.3991597 ], [ -126.1642654, 54.3989717 ], [ -126.164267199999983, 54.3989532 ], [ -126.1642922, 54.3988023 ], [ -126.164319400000011, 54.3986314 ], [ -126.1642206, 54.3985117 ], [ -126.1640099, 54.3984448 ], [ -126.1638425, 54.3984134 ], [ -126.1637659, 54.3984021 ], [ -126.163489, 54.3983693 ], [ -126.1631986, 54.3983536 ], [ -126.1631827, 54.3983437 ], [ -126.1631169, 54.3982069 ], [ -126.1631872, 54.3980659 ], [ -126.163288099999988, 54.397942 ], [ -126.1633903, 54.397801 ], [ -126.163461099999978, 54.3976586 ], [ -126.1634897, 54.3974977 ], [ -126.163404899999989, 54.3973595 ], [ -126.1632579, 54.3972584 ], [ -126.163032299999983, 54.3971986 ], [ -126.1627879, 54.3971573 ], [ -126.1625599, 54.3970975 ], [ -126.1622731, 54.3970106 ], [ -126.162096, 54.3969252 ], [ -126.161932299999989, 54.3968226 ], [ -126.161752, 54.396745699999983 ], [ -126.1614578, 54.3965506 ], [ -126.16134430000001, 54.396431 ], [ -126.1612608, 54.3963028 ], [ -126.161081200000012, 54.3962173 ], [ -126.160869199999979, 54.3961675 ], [ -126.160592400000013, 54.3961618 ], [ -126.1603277, 54.3961903 ], [ -126.1602812, 54.3961903 ], [ -126.1602028, 54.3961974 ], [ -126.1601569, 54.396223 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17101960, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 12999.626402751301, "blue_line_key": 360877225, "length_metre": 620.62282147055805, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.205860499999986, 54.2508177 ], [ -126.2058024, 54.2507642 ], [ -126.2055401, 54.2505335 ], [ -126.2053793, 54.2504125 ], [ -126.2052383, 54.2502572 ], [ -126.205229499999987, 54.2501404 ], [ -126.2052517, 54.2500593 ], [ -126.2053161, 54.2499895 ], [ -126.2055526, 54.2498955 ], [ -126.205634599999982, 54.2498442 ], [ -126.2057274, 54.24981 ], [ -126.205914299999975, 54.2497787 ], [ -126.206087899999986, 54.2497103 ], [ -126.206121, 54.2496662 ], [ -126.206146499999974, 54.2495223 ], [ -126.2061351, 54.2494597 ], [ -126.206039800000013, 54.2492859 ], [ -126.2058697, 54.2490765 ], [ -126.2056956, 54.248918499999988 ], [ -126.2056536, 54.2488729 ], [ -126.2054994, 54.2486536 ], [ -126.20546, 54.2485539 ], [ -126.205362199999982, 54.2484072 ], [ -126.2051609, 54.2482235 ], [ -126.2049424, 54.2480198 ], [ -126.2047677, 54.2478902 ], [ -126.2047265, 54.247809 ], [ -126.204707499999984, 54.2476466 ], [ -126.2047, 54.2475199 ], [ -126.2047508, 54.2474672 ], [ -126.2048919, 54.247434399999989 ], [ -126.2051519, 54.247450099999988 ], [ -126.2055205, 54.2474487 ], [ -126.2056452, 54.2474074 ], [ -126.2057253, 54.2473547 ], [ -126.2057656, 54.2472037 ], [ -126.205760500000011, 54.247077 ], [ -126.2056825, 54.246869 ], [ -126.205521100000013, 54.2467565 ], [ -126.2051831, 54.2465329 ], [ -126.2051401, 54.2464702 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17085035, "stream_order": 4, "gnis_name": "Raspberry Creek", "downstream_route_measure": 5345.6501120678004, "blue_line_key": 360817924, "length_metre": 142.405859045559, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.637800399999975, 54.4693733 ], [ -126.6380136, 54.4693946 ], [ -126.638136, 54.4694516 ], [ -126.638209899999978, 54.4695071 ], [ -126.6383299, 54.4695712 ], [ -126.638496499999988, 54.4695926 ], [ -126.6388665, 54.4695997 ], [ -126.6392223, 54.4695983 ], [ -126.6395463, 54.469604 ], [ -126.6398703, 54.4696026 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17089882, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 241541.687591405, "blue_line_key": 360873822, "length_metre": 97.583388093232799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2033701, 54.4350028 ], [ -126.2034355, 54.4349501 ], [ -126.203677700000014, 54.4347935 ], [ -126.2037731, 54.4347593 ], [ -126.2038533, 54.4346995 ], [ -126.203915599999988, 54.4344844 ], [ -126.2040122, 54.4344061 ], [ -126.20425920000001, 54.434393299999989 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17082562, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 201751.781831259, "blue_line_key": 360873822, "length_metre": 909.45654506267397, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.482396799999989, 54.4840284 ], [ -126.48272369999998, 54.484054 ], [ -126.483046499999986, 54.4840141 ], [ -126.483275299999988, 54.4838788 ], [ -126.4834664, 54.4836339 ], [ -126.48374, 54.4834402 ], [ -126.483983099999989, 54.4833761 ], [ -126.484291, 54.4833718 ], [ -126.484857, 54.4835199 ], [ -126.4859794, 54.4842506 ], [ -126.486684200000013, 54.4845767 ], [ -126.487631, 54.4846593 ], [ -126.4879016, 54.4847832 ], [ -126.487869300000014, 54.4851279 ], [ -126.487621, 54.4855366 ], [ -126.4874722, 54.4860465 ], [ -126.486962099999985, 54.4869095 ], [ -126.4856297, 54.487586 ], [ -126.4847761, 54.4883095 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17068289, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 12519.3423146885, "blue_line_key": 360875378, "length_metre": 264.69865201772598, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5905724, 54.5543544 ], [ -126.5906967, 54.5543573 ], [ -126.5908337, 54.5543872 ], [ -126.591026700000015, 54.554525299999987 ], [ -126.591232, 54.5547276 ], [ -126.5914393, 54.5549027 ], [ -126.591658900000013, 54.5550779 ], [ -126.59193, 54.5552175 ], [ -126.5921937, 54.5552146 ], [ -126.592285099999984, 54.5552346 ], [ -126.5924054, 54.5552987 ], [ -126.592596, 54.5554653 ], [ -126.592685399999979, 54.5555123 ], [ -126.5930287, 54.5557345 ], [ -126.5932822, 54.5558826 ], [ -126.593403, 54.555931 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17090267, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 275713.96883352502, "blue_line_key": 360873822, "length_metre": 77.042610927358993, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1417212, 54.4306276 ], [ -126.1417283, 54.4307715 ], [ -126.1417151, 54.4309509 ], [ -126.141684900000016, 54.4311575 ], [ -126.141596400000012, 54.4313084 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076277, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 213487.388327931, "blue_line_key": 360873822, "length_metre": 107.66697174519, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3900546, 54.513706 ], [ -126.3898152, 54.5137659 ], [ -126.389693899999983, 54.513929600000012 ], [ -126.3892623, 54.5142786 ], [ -126.38894470000001, 54.5143726 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17069142, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 18403.023981964801, "blue_line_key": 360875378, "length_metre": 71.344158503923197, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6527843, 54.5502199 ], [ -126.6530884, 54.5503068 ], [ -126.6534211, 54.5504393 ], [ -126.653659, 54.5505973 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080026, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 223779.910324928, "blue_line_key": 360873822, "length_metre": 120.671504367249, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.296156400000015, 54.495902 ], [ -126.295745599999989, 54.4958294 ], [ -126.2954837, 54.4956827 ], [ -126.2951613, 54.4952355 ], [ -126.2951969, 54.4951002 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17078830, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 6959.0583358854201, "blue_line_key": 360869846, "length_metre": 412.17940035882702, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5861531, 54.4995637 ], [ -126.586319100000011, 54.4996576 ], [ -126.5865577, 54.499797199999989 ], [ -126.58666, 54.4998983 ], [ -126.586715700000013, 54.499971 ], [ -126.5867309, 54.499998 ], [ -126.586732399999988, 54.500000500000013 ], [ -126.5868442, 54.5001803 ], [ -126.586901399999988, 54.5002629 ], [ -126.5870301, 54.5004082 ], [ -126.587194200000013, 54.5005293 ], [ -126.587374, 54.5006047 ], [ -126.5874738, 54.5007415 ], [ -126.5875005, 54.5008412 ], [ -126.5875983, 54.501005 ], [ -126.5877106, 54.5012043 ], [ -126.5878707, 54.501351 ], [ -126.5880338, 54.5014536 ], [ -126.5881827, 54.5015832 ], [ -126.588404, 54.5017584 ], [ -126.588598499999975, 54.5018694 ], [ -126.5888488, 54.502046 ], [ -126.5890311, 54.5021215 ], [ -126.58927319999998, 54.5022155 ], [ -126.589407, 54.5022896 ], [ -126.5897641, 54.5025046 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17096024, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 5114.9022859274501, "blue_line_key": 360881038, "length_metre": 3986.82454346639, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.161459799999989, 54.3682102 ], [ -126.161537, 54.3682131 ], [ -126.1618118, 54.3682373 ], [ -126.1619703, 54.3681504 ], [ -126.1620266, 54.368008 ], [ -126.1621135, 54.3678756 ], [ -126.1621699, 54.3677331 ], [ -126.1622408, 54.3675907 ], [ -126.162327800000014, 54.3674583 ], [ -126.1624422, 54.3673443 ], [ -126.1627476, 54.367162 ], [ -126.1627966, 54.3671278 ], [ -126.162878, 54.3670581 ], [ -126.162993, 54.3669427 ], [ -126.1630506, 54.3667832 ], [ -126.1630628, 54.3666208 ], [ -126.162945899999983, 54.3665112 ], [ -126.162871199999984, 54.3664813 ], [ -126.16255649999998, 54.3663573 ], [ -126.16248920000001, 54.3662121 ], [ -126.1625326, 54.3660511 ], [ -126.1625896, 54.3659002 ], [ -126.16263, 54.3657478 ], [ -126.1626434, 54.3655683 ], [ -126.1626838, 54.3654159 ], [ -126.1628319, 54.3652764 ], [ -126.163064600000013, 54.365255 ], [ -126.163291, 54.3653049 ], [ -126.1636509, 54.3654658 ], [ -126.163936799999988, 54.3655541 ], [ -126.1643831, 54.3657805 ], [ -126.1644608, 54.3657549 ], [ -126.1647974, 54.365574 ], [ -126.164971900000012, 54.3654971 ], [ -126.165307899999988, 54.36532480000001 ], [ -126.165496499999975, 54.3652493 ], [ -126.165685599999989, 54.3651995 ], [ -126.165835, 54.3652664 ], [ -126.1660969, 54.3652721 ], [ -126.166302, 54.3652052 ], [ -126.166507, 54.3651382 ], [ -126.16668150000001, 54.3650613 ], [ -126.166810599999977, 54.3649474 ], [ -126.1668687, 54.3647864 ], [ -126.166849700000014, 54.3646155 ], [ -126.166782399999974, 54.3644703 ], [ -126.1667934, 54.3643179 ], [ -126.1669696, 54.3642225 ], [ -126.1671294, 54.3641456 ], [ -126.167287800000011, 54.3640587 ], [ -126.1674929, 54.3639917 ], [ -126.167741400000011, 54.3639533 ], [ -126.1679894, 54.3639234 ], [ -126.168166199999987, 54.3638465 ], [ -126.1682212, 54.3636941 ], [ -126.168219400000012, 54.363523199999989 ], [ -126.168150900000015, 54.3633879 ], [ -126.1679715, 54.3633024 ], [ -126.1676648, 54.3632853 ], [ -126.1674384, 54.3632355 ], [ -126.167257799999987, 54.36316 ], [ -126.1671127, 54.3630475 ], [ -126.167108399999989, 54.3628766 ], [ -126.1672235, 54.3627541 ], [ -126.1675289, 54.3625718 ], [ -126.167851500000012, 54.3623824 ], [ -126.168099399999988, 54.3623525 ], [ -126.1683626, 54.362314 ], [ -126.168581599999982, 54.3622556 ], [ -126.168786700000013, 54.3621887 ], [ -126.1691362, 54.3620263 ], [ -126.1692831, 54.3619309 ], [ -126.169398699999988, 54.361807 ], [ -126.1694862, 54.361666 ], [ -126.169511300000011, 54.3614951 ], [ -126.169493499999987, 54.3613142 ], [ -126.1693944, 54.361196 ], [ -126.1692334, 54.3610935 ], [ -126.1690357, 54.3610251 ], [ -126.168794599999984, 54.3609753 ], [ -126.1684983, 54.3610037 ], [ -126.1682388, 54.360971 ], [ -126.1680295, 54.3608941 ], [ -126.168084499999978, 54.3607688 ], [ -126.1682755, 54.3606933 ], [ -126.16847749999998, 54.3606349 ], [ -126.168697900000012, 54.3605864 ], [ -126.1689329, 54.360538 ], [ -126.169181899999984, 54.3604981 ], [ -126.1694445, 54.3604682 ], [ -126.169723, 54.3604483 ], [ -126.1700315, 54.3604469 ], [ -126.170279399999984, 54.360417 ], [ -126.1704856, 54.360340099999988 ], [ -126.1706746, 54.3602632 ], [ -126.1709396, 54.3602332 ], [ -126.171139200000013, 54.360229 ], [ -126.171245700000014, 54.3602318 ], [ -126.1714189, 54.3601919 ], [ -126.1714513, 54.3601563 ], [ -126.1714795, 54.3599769 ], [ -126.1713962, 54.3598487 ], [ -126.1712983, 54.3597205 ], [ -126.1711826, 54.3596009 ], [ -126.1711673, 54.3595824 ], [ -126.17108349999998, 54.3594827 ], [ -126.1709512, 54.3593616 ], [ -126.1708056, 54.3592505 ], [ -126.1704965, 54.359064 ], [ -126.170284199999983, 54.3589956 ], [ -126.1700247, 54.3589628 ], [ -126.169762100000014, 54.3589928 ], [ -126.1695027, 54.35896 ], [ -126.169446299999976, 54.3588859 ], [ -126.169566899999978, 54.3586737 ], [ -126.1695804, 54.3584943 ], [ -126.1696514, 54.3583519 ], [ -126.169797, 54.3582465 ], [ -126.1700455, 54.3582351 ], [ -126.1703178, 54.3582864 ], [ -126.1705528, 54.3582379 ], [ -126.170757900000012, 54.358171 ], [ -126.170947, 54.3580941 ], [ -126.171107400000011, 54.3580086 ], [ -126.17126709999998, 54.3579047 ], [ -126.171385199999989, 54.3577808 ], [ -126.17148610000001, 54.3576569 ], [ -126.171586599999983, 54.3575344 ], [ -126.1716882, 54.3574019 ], [ -126.171789100000012, 54.357278 ], [ -126.1719054, 54.3571456 ], [ -126.171976399999977, 54.3570031 ], [ -126.1719887, 54.356833699999989 ], [ -126.171937199999988, 54.3566784 ], [ -126.171790399999978, 54.3565773 ], [ -126.1716111, 54.3564919 ], [ -126.171495399999984, 54.356372199999988 ], [ -126.1713492, 54.3562697 ], [ -126.1710395, 54.3560916 ], [ -126.1709092, 54.355972 ], [ -126.1708253, 54.3558253 ], [ -126.1708235, 54.3556544 ], [ -126.1708205, 54.3554664 ], [ -126.1708922, 54.3553155 ], [ -126.1713302, 54.3551987 ], [ -126.171446, 54.3550947 ], [ -126.1714258, 54.3549409 ], [ -126.171262399999989, 54.3548383 ], [ -126.171020700000014, 54.354797 ], [ -126.1707771, 54.3547543 ], [ -126.170566, 54.3546959 ], [ -126.170402, 54.3546019 ], [ -126.1703463, 54.3545193 ], [ -126.170350700000014, 54.3544396 ], [ -126.1705276, 54.3543627 ], [ -126.1707894, 54.3543413 ], [ -126.1710251, 54.354284299999989 ], [ -126.1712013, 54.3541889 ], [ -126.171132199999988, 54.3540621 ], [ -126.1709216, 54.3540023 ], [ -126.170629799999986, 54.3539781 ], [ -126.170337299999986, 54.3539625 ], [ -126.170208800000012, 54.3538514 ], [ -126.1701722, 54.353689 ], [ -126.170215, 54.3535366 ], [ -126.170144600000015, 54.353427 ], [ -126.1699642, 54.3533515 ], [ -126.1698969, 54.3532062 ], [ -126.1698951, 54.3530353 ], [ -126.1697795, 54.3529157 ], [ -126.1695995, 54.3528388 ], [ -126.1694522, 54.3527462 ], [ -126.1694338, 54.3525738 ], [ -126.1694907, 54.3524229 ], [ -126.1695624, 54.3522719 ], [ -126.169646899999989, 54.3521395 ], [ -126.169719699999987, 54.3520056 ], [ -126.1696365, 54.3518774 ], [ -126.1694714, 54.3517934 ], [ -126.1693258, 54.3516823 ], [ -126.16913120000001, 54.3516054 ], [ -126.168884, 54.3516267 ], [ -126.168661899999989, 54.3516937 ], [ -126.1683834, 54.3517407 ], [ -126.1682035, 54.3516638 ], [ -126.168087899999989, 54.3515441 ], [ -126.168037200000015, 54.3514003 ], [ -126.1680354, 54.3512023 ], [ -126.168166399999976, 54.3510969 ], [ -126.1684424, 54.3508876 ], [ -126.1686603, 54.3508392 ], [ -126.1688194, 54.3507437 ], [ -126.1688298, 54.3505999 ], [ -126.168773, 54.3505273 ], [ -126.1687932, 54.3504646 ], [ -126.1689541, 54.3503777 ], [ -126.1690539, 54.3502638 ], [ -126.1691849, 54.3501313 ], [ -126.1693612, 54.3500558 ], [ -126.1693557, 54.349902 ], [ -126.169125200000011, 54.3496813 ], [ -126.1690249, 54.349553099999987 ], [ -126.1690371, 54.3493907 ], [ -126.1691669, 54.3492953 ], [ -126.169355899999985, 54.3492184 ], [ -126.1696038, 54.3491885 ], [ -126.1698694, 54.34915 ], [ -126.1700163, 54.3490276 ], [ -126.170027399999981, 54.3488481 ], [ -126.1700844, 54.3486971 ], [ -126.1701547, 54.3485633 ], [ -126.170257, 54.3484223 ], [ -126.170343299999985, 54.3482984 ], [ -126.1704461, 54.348156 ], [ -126.170486, 54.348005 ], [ -126.1703697, 54.3478939 ], [ -126.1702799, 54.3478654 ], [ -126.1700957, 54.3478611 ], [ -126.1698222, 54.347827 ], [ -126.1696276, 54.3477501 ], [ -126.1695879, 54.3476504 ], [ -126.169621, 54.3476062 ], [ -126.1699129, 54.3474068 ], [ -126.170116100000016, 54.3473313 ], [ -126.170337600000011, 54.3472729 ], [ -126.170528, 54.3471789 ], [ -126.1704925, 54.3470337 ], [ -126.1704082, 54.3468884 ], [ -126.1706425, 54.3468485 ], [ -126.1709815, 54.3468571 ], [ -126.1712012, 54.3467901 ], [ -126.1711326, 54.346662 ], [ -126.17097, 54.3465779 ], [ -126.170757, 54.3465181 ], [ -126.1706996, 54.3464811 ], [ -126.1707051, 54.3463914 ], [ -126.1708502, 54.3462874 ], [ -126.171011100000015, 54.3462005 ], [ -126.1712168, 54.346125 ], [ -126.171337200000011, 54.3461364 ], [ -126.1714284, 54.3461749 ], [ -126.1716725, 54.3462162 ], [ -126.1719778, 54.3462233 ], [ -126.17221210000001, 54.3461834 ], [ -126.1723425, 54.3460795 ], [ -126.1723596, 54.3460524 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17094282, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 0.0, "blue_line_key": 360886524, "length_metre": 697.39010479349599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1453276, 54.3874399 ], [ -126.145467699999983, 54.3874243 ], [ -126.1457599, 54.3874143 ], [ -126.145950899999988, 54.3873189 ], [ -126.1459943, 54.3871579 ], [ -126.146006500000013, 54.3869884 ], [ -126.1460144, 54.3868446 ], [ -126.1460175, 54.386809 ], [ -126.1460878, 54.3866751 ], [ -126.1461894, 54.3865427 ], [ -126.1462763, 54.3864102 ], [ -126.1463338, 54.3862578 ], [ -126.146360699999988, 54.3860883 ], [ -126.146373399999987, 54.3859174 ], [ -126.1464879, 54.3858035 ], [ -126.1465889, 54.3856796 ], [ -126.146584600000011, 54.385535700000013 ], [ -126.1465852, 54.3855272 ], [ -126.1467597, 54.3854503 ], [ -126.14677, 54.3853064 ], [ -126.1468539, 54.3851825 ], [ -126.147158800000014, 54.3850017 ], [ -126.1472457, 54.3848692 ], [ -126.147362, 54.3847638 ], [ -126.1475512, 54.3846869 ], [ -126.1477717, 54.3846385 ], [ -126.1480142, 54.3846713 ], [ -126.1481465, 54.384772399999989 ], [ -126.148374299999986, 54.3848322 ], [ -126.1486015, 54.3848735 ], [ -126.148818299999988, 54.3848422 ], [ -126.1489358, 54.3847197 ], [ -126.148932099999982, 54.3845402 ], [ -126.1489289, 54.384386400000011 ], [ -126.149043399999982, 54.3842725 ], [ -126.14922030000001, 54.3841685 ], [ -126.1492766, 54.3840261 ], [ -126.1491615, 54.3838979 ], [ -126.1490774, 54.3837783 ], [ -126.1491337, 54.3836359 ], [ -126.1493555, 54.3835703 ], [ -126.1496175, 54.383549 ], [ -126.1498526, 54.3835006 ], [ -126.149983600000013, 54.3833952 ], [ -126.1500871, 54.38321 ], [ -126.150120699999988, 54.3831915 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104647, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 32596.216511045601, "blue_line_key": 360886221, "length_metre": 3958.3246325289001, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.600859700000015, 54.2204784 ], [ -126.600768699999975, 54.220467 ], [ -126.6006753, 54.2204556 ], [ -126.6004929, 54.2204343 ], [ -126.6003427, 54.2204044 ], [ -126.6002059, 54.2203574 ], [ -126.6000708, 54.2202919 ], [ -126.5999974, 54.2202449 ], [ -126.5999534, 54.2202178 ], [ -126.5998506, 54.220143699999987 ], [ -126.5997166, 54.2200683 ], [ -126.5995827, 54.2199856 ], [ -126.5994658, 54.2199102 ], [ -126.5993635, 54.2198276 ], [ -126.599334, 54.2197734 ], [ -126.599306299999981, 54.2197279 ], [ -126.599282, 54.2196111 ], [ -126.5992752, 54.2194929 ], [ -126.5992944, 54.2194046 ], [ -126.599328799999981, 54.2193419 ], [ -126.599384199999989, 54.2191995 ], [ -126.5994834, 54.2190571 ], [ -126.5995331, 54.2189859 ], [ -126.599584, 54.2189246 ], [ -126.5996681, 54.2187907 ], [ -126.599705199999988, 54.2186654 ], [ -126.5997103, 54.2185757 ], [ -126.5996374, 54.218520100000013 ], [ -126.5995646, 54.2184646 ], [ -126.59952, 54.2184461 ], [ -126.599446, 54.2184005 ], [ -126.599279200000012, 54.2183421 ], [ -126.599129499999989, 54.2182766 ], [ -126.599012699999989, 54.218194 ], [ -126.5989679, 54.2181484 ], [ -126.5989894, 54.218067200000014 ], [ -126.5990064, 54.2180402 ], [ -126.599022199999979, 54.2180231 ], [ -126.599089299999989, 54.2179163 ], [ -126.599187, 54.2178194 ], [ -126.5992374, 54.2177667 ], [ -126.5992701, 54.2177226 ], [ -126.5993237, 54.2176058 ], [ -126.5993286, 54.217489 ], [ -126.5992439, 54.2173708 ], [ -126.599126500000011, 54.2172967 ], [ -126.598989100000011, 54.2172583 ], [ -126.598836100000014, 54.217264 ], [ -126.598741299999986, 54.2173252 ], [ -126.598071399999981, 54.2177439 ], [ -126.5979308, 54.217803800000013 ], [ -126.5978376, 54.2178194 ], [ -126.597745499999988, 54.217818 ], [ -126.5975602, 54.2178322 ], [ -126.5973299, 54.2178636 ], [ -126.597205, 54.2178792 ], [ -126.5970977, 54.2178864 ], [ -126.596864900000014, 54.2179177 ], [ -126.596633900000015, 54.2179305 ], [ -126.596528299999989, 54.2179191 ], [ -126.5964525, 54.2178992 ], [ -126.596256, 54.2178422 ], [ -126.5960922, 54.2177753 ], [ -126.596000600000011, 54.2177382 ], [ -126.595910800000013, 54.2177098 ], [ -126.595699599999989, 54.2176599 ], [ -126.5954543, 54.2176371 ], [ -126.595334200000011, 54.2176257 ], [ -126.595212100000012, 54.2176058 ], [ -126.5950003, 54.2175645 ], [ -126.5948816, 54.2174733 ], [ -126.594855700000011, 54.2174093 ], [ -126.594857799999986, 54.2173551 ], [ -126.5949115, 54.2172312 ], [ -126.5950386, 54.2171614 ], [ -126.5951735, 54.2171999 ], [ -126.595308, 54.217274 ], [ -126.595442, 54.2173494 ], [ -126.5956069, 54.2174064 ], [ -126.595697199999989, 54.2174263 ], [ -126.5957747, 54.2174278 ], [ -126.5959417, 54.2174306 ], [ -126.596098399999988, 54.2174078 ], [ -126.596224299999989, 54.2173551 ], [ -126.596288, 54.2172854 ], [ -126.5962925, 54.2172042 ], [ -126.5963152, 54.2171059 ], [ -126.596288, 54.2170247 ], [ -126.5962005, 54.2169692 ], [ -126.596032600000015, 54.2169208 ], [ -126.595837300000014, 54.2168809 ], [ -126.5956395, 54.216841 ], [ -126.595458199999982, 54.2168097 ], [ -126.5953537, 54.2167541 ], [ -126.5953442, 54.2166644 ], [ -126.5953463, 54.2166103 ], [ -126.5953491, 54.216547600000013 ], [ -126.595343500000013, 54.2164123 ], [ -126.5953338, 54.2162955 ], [ -126.595337699999988, 54.2162229 ], [ -126.5953558, 54.2161787 ], [ -126.5953309, 54.2160705 ], [ -126.595243900000014, 54.2159793 ], [ -126.595094800000012, 54.2159124 ], [ -126.594944599999977, 54.2158825 ], [ -126.594835499999988, 54.2158811 ], [ -126.5947897, 54.2158797 ], [ -126.594634399999975, 54.2159124 ], [ -126.5945402, 54.2159651 ], [ -126.594349799999989, 54.2160691 ], [ -126.5942098, 54.2161203 ], [ -126.594086, 54.216126 ], [ -126.5939787, 54.2161061 ], [ -126.5939081, 54.2160235 ], [ -126.593852799999979, 54.2159324 ], [ -126.5937658, 54.2158412 ], [ -126.593660699999987, 54.2157942 ], [ -126.593555599999988, 54.2157472 ], [ -126.593387799999974, 54.2157258 ], [ -126.593204899999989, 54.215713 ], [ -126.5930976, 54.2157201 ], [ -126.5930032, 54.2157458 ], [ -126.592955300000014, 54.2157985 ], [ -126.592904300000015, 54.2158597 ], [ -126.5928716, 54.2159039 ], [ -126.592898299999987, 54.2159865 ], [ -126.5929552, 54.216032 ], [ -126.5930744, 54.2161146 ], [ -126.593102099999982, 54.2161602 ], [ -126.5931603, 54.2162158 ], [ -126.5932485, 54.2162898 ], [ -126.5932732, 54.216371 ], [ -126.593284, 54.2164436 ], [ -126.5932666, 54.2165063 ], [ -126.593172200000012, 54.2165391 ], [ -126.593048599999989, 54.2165647 ], [ -126.5928942, 54.2165604 ], [ -126.5927582, 54.2165319 ], [ -126.5925775, 54.2164921 ], [ -126.592409, 54.2164522 ], [ -126.592255900000012, 54.2164579 ], [ -126.5921136, 54.2165362 ], [ -126.5919861, 54.2166416 ], [ -126.5918715, 54.2167655 ], [ -126.59174320000001, 54.216852400000015 ], [ -126.59164939999998, 54.2168695 ], [ -126.5915116, 54.2168666 ], [ -126.591358399999976, 54.2168453 ], [ -126.5911953, 54.2167698 ], [ -126.5909467, 54.2165576 ], [ -126.590829899999989, 54.216475 ], [ -126.590709, 54.2164451 ], [ -126.590584, 54.2164607 ], [ -126.5904886, 54.2165305 ], [ -126.5904367, 54.2166288 ], [ -126.590401599999979, 54.2167 ], [ -126.5903689, 54.2167442 ], [ -126.5902541, 54.216841 ], [ -126.590100600000014, 54.2168823 ], [ -126.5899616, 54.2168624 ], [ -126.5898588, 54.2167883 ], [ -126.5898363, 54.2166801 ], [ -126.5898882, 54.2165547 ], [ -126.5899215, 54.216502 ], [ -126.5899413, 54.2164394 ], [ -126.589965, 54.2163041 ], [ -126.5899413, 54.2161787 ], [ -126.589840199999983, 54.2160862 ], [ -126.5897046, 54.2160292 ], [ -126.589564400000015, 54.2160534 ], [ -126.589451, 54.2161602 ], [ -126.5893848, 54.21623 ], [ -126.589335800000015, 54.2162927 ], [ -126.5892376, 54.2164251 ], [ -126.589091599999989, 54.2165206 ], [ -126.5889364, 54.2165804 ], [ -126.5887823, 54.216596 ], [ -126.588633699999988, 54.2165206 ], [ -126.588563099999973, 54.2164109 ], [ -126.5885658, 54.2163482 ], [ -126.5885846, 54.2162955 ], [ -126.5886382, 54.2161787 ], [ -126.588689500000015, 54.2160548 ], [ -126.5887111, 54.2159737 ], [ -126.588713200000015, 54.2159195 ], [ -126.5887212, 54.2157942 ], [ -126.5886535, 54.2156489 ], [ -126.588578200000015, 54.2155934 ], [ -126.588503699999976, 54.2155564 ], [ -126.588308399999988, 54.2155165 ], [ -126.5881513, 54.215567799999988 ], [ -126.5880711, 54.215629 ], [ -126.588022, 54.2156988 ], [ -126.5879502, 54.215859699999989 ], [ -126.5879429, 54.2160036 ], [ -126.5879523, 54.2160662 ], [ -126.5879807, 54.2161303 ], [ -126.587988599999989, 54.2162386 ], [ -126.587937700000012, 54.2163269 ], [ -126.587827699999977, 54.2163966 ], [ -126.5876847, 54.2164565 ], [ -126.587529300000014, 54.2164892 ], [ -126.5873769, 54.2164864 ], [ -126.587255499999983, 54.2164579 ], [ -126.58712220000001, 54.2164009 ], [ -126.58700349999998, 54.2163169 ], [ -126.586884900000015, 54.2162257 ], [ -126.586769199999978, 54.2161332 ], [ -126.586681, 54.2160591 ], [ -126.5866088, 54.215995 ], [ -126.5865341, 54.2159309 ], [ -126.586432499999987, 54.2158469 ], [ -126.586282199999985, 54.2157899 ], [ -126.5861308, 54.2157429 ], [ -126.5859807, 54.215713 ], [ -126.5858898, 54.2157016 ], [ -126.5858129, 54.2156917 ], [ -126.5855665, 54.215686 ], [ -126.5853074, 54.2156817 ], [ -126.5851842, 54.2156788 ], [ -126.585047, 54.2156675 ], [ -126.5847731, 54.2156432 ], [ -126.584515599999989, 54.2155934 ], [ -126.584392799999989, 54.2155549 ], [ -126.5842731, 54.2155079 ], [ -126.5840794, 54.2154225 ], [ -126.5838852, 54.2153385 ], [ -126.583688599999974, 54.2152886 ], [ -126.5835383, 54.2152316 ], [ -126.5834209, 54.2151576 ], [ -126.583348, 54.215075 ], [ -126.583322599999988, 54.2150023 ], [ -126.5832944, 54.2149311 ], [ -126.583315299999981, 54.2148585 ], [ -126.5833644, 54.2147887 ], [ -126.583398300000013, 54.2147346 ], [ -126.583402899999982, 54.2146805 ], [ -126.583361599999989, 54.2145637 ], [ -126.5832002, 54.2144697 ], [ -126.58309509999998, 54.2144227 ], [ -126.5829883, 54.2143942 ], [ -126.5827478, 54.2143444 ], [ -126.5824873, 54.2143031 ], [ -126.5823677, 54.2142831 ], [ -126.582276099999973, 54.2142532 ], [ -126.582095900000013, 54.2141777 ], [ -126.5818882, 54.2140837 ], [ -126.5818136, 54.2140467 ], [ -126.581532299999978, 54.2138516 ], [ -126.5814634, 54.2137163 ], [ -126.5814839, 54.2136451 ], [ -126.5815324, 54.213591 ], [ -126.581705199999988, 54.2135226 ], [ -126.581938, 54.2134913 ], [ -126.5821222, 54.213487 ], [ -126.5822588, 54.2135069 ], [ -126.5823768, 54.2135724 ], [ -126.5824942, 54.2136736 ], [ -126.5825665, 54.2137376 ], [ -126.5826106, 54.2137846 ], [ -126.582743400000012, 54.2138772 ], [ -126.5828778, 54.2139513 ], [ -126.5829535, 54.2139712 ], [ -126.5830273, 54.2139897 ], [ -126.5831963, 54.213994 ], [ -126.5833352, 54.2139869 ], [ -126.583443099999982, 54.2139712 ], [ -126.583567800000012, 54.2139285 ], [ -126.583649400000013, 54.2138772 ], [ -126.583696699999976, 54.2138331 ], [ -126.5837471, 54.2137804 ], [ -126.583766199999985, 54.2136992 ], [ -126.583786499999988, 54.2136009 ], [ -126.583808, 54.2134927 ], [ -126.583799, 54.2133944 ], [ -126.5837584, 54.2133033 ], [ -126.5836708, 54.2132207 ], [ -126.583567, 54.2131566 ], [ -126.5834788, 54.2130825 ], [ -126.583407699999981, 54.2130085 ], [ -126.58332009999998, 54.2129258 ], [ -126.583187400000014, 54.2128333 ], [ -126.5831728, 54.2128333 ], [ -126.583098299999989, 54.2127962 ], [ -126.5830232, 54.2127678 ], [ -126.582854799999978, 54.2127549 ], [ -126.5826826, 54.2128148 ], [ -126.5825403, 54.2128931 ], [ -126.582414300000011, 54.2129529 ], [ -126.5822595, 54.2129771 ], [ -126.582106499999981, 54.2129828 ], [ -126.581968, 54.2129614 ], [ -126.5818477, 54.212923 ], [ -126.5817592, 54.2128774 ], [ -126.5816704, 54.2128119 ], [ -126.58154, 54.2126923 ], [ -126.5814807, 54.2126467 ], [ -126.581380900000013, 54.212537 ], [ -126.581310899999977, 54.2124188 ], [ -126.581267899999986, 54.2123547 ], [ -126.581240899999983, 54.2123006 ], [ -126.581169, 54.212208 ], [ -126.5810974, 54.2121354 ], [ -126.5810222, 54.2120799 ], [ -126.58095, 54.2120158 ], [ -126.5808771, 54.2119332 ], [ -126.5807292, 54.2118491 ], [ -126.580639399999981, 54.2118207 ], [ -126.5805643, 54.2117922 ], [ -126.5803972, 54.2117623 ], [ -126.58024420000001, 54.211768 ], [ -126.580087599999985, 54.2118178 ], [ -126.579928899999985, 54.2118876 ], [ -126.579758399999989, 54.211956 ], [ -126.5796037, 54.2119802 ], [ -126.5795142, 54.2118961 ], [ -126.579488499999982, 54.211852 ], [ -126.579431899999989, 54.2117509 ], [ -126.579359, 54.2116683 ], [ -126.579302, 54.2115956 ], [ -126.5793079, 54.2115244 ], [ -126.5793722, 54.2114532 ], [ -126.579482899999988, 54.2114019 ], [ -126.5796077, 54.2113592 ], [ -126.579717300000013, 54.211325 ], [ -126.5798422, 54.2113094 ], [ -126.579979899999984, 54.2112852 ], [ -126.5801183, 54.2112795 ], [ -126.5802567, 54.2112738 ], [ -126.5804244, 54.2112951 ], [ -126.580589899999978, 54.2113435 ], [ -126.5807412, 54.2113905 ], [ -126.5808604, 54.211439 ], [ -126.580935, 54.2115031 ], [ -126.580975599999988, 54.2115672 ], [ -126.581002699999985, 54.2116483 ], [ -126.581012800000011, 54.2117295 ], [ -126.58104, 54.2118107 ], [ -126.58114040000001, 54.2119118 ], [ -126.5812155, 54.2119403 ], [ -126.581307, 54.2119503 ], [ -126.581398499999978, 54.2119531 ], [ -126.5814759, 54.2119545 ], [ -126.581553199999988, 54.2119289 ], [ -126.5816465, 54.2119132 ], [ -126.581754800000013, 54.2118961 ], [ -126.5818487, 54.2118719 ], [ -126.581959499999982, 54.2118207 ], [ -126.5820904, 54.2116782 ], [ -126.5820916, 54.2116611 ], [ -126.582077899999987, 54.2115971 ], [ -126.5820667, 54.2115258 ], [ -126.5820742, 54.2114361 ], [ -126.582049399999988, 54.2113279 ], [ -126.581990600000012, 54.2112809 ], [ -126.5818861, 54.2112253 ], [ -126.5817517, 54.2111513 ], [ -126.5816178, 54.211075799999989 ], [ -126.5816184, 54.2110673 ], [ -126.5814688, 54.2110017 ], [ -126.5813174, 54.2109619 ], [ -126.5811966, 54.210959 ], [ -126.5810102, 54.2109832 ], [ -126.5808712, 54.2109975 ], [ -126.5807486, 54.2109861 ], [ -126.580629, 54.2109391 ], [ -126.580556800000011, 54.210875 ], [ -126.5805144, 54.2108024 ], [ -126.580503099999987, 54.2107383 ], [ -126.580523500000012, 54.2106671 ], [ -126.580540899999988, 54.2106044 ], [ -126.580591899999988, 54.2105431 ], [ -126.5806258, 54.210489 ], [ -126.580672600000014, 54.2104463 ], [ -126.580694200000011, 54.2103651 ], [ -126.580696399999979, 54.210311 ], [ -126.5807016, 54.2102483 ], [ -126.5806433, 54.2101657 ], [ -126.5805564, 54.2100746 ], [ -126.580454899999978, 54.2099834 ], [ -126.5803538, 54.2098909 ], [ -126.5802646, 54.2098268 ], [ -126.5801912, 54.2097798 ], [ -126.5801026, 54.2097413 ], [ -126.5799805, 54.209694299999988 ], [ -126.579879099999985, 54.2096302 ], [ -126.579775200000014, 54.2095733 ], [ -126.57967, 54.2094992 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101088, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 24577.677760352199, "blue_line_key": 360881038, "length_metre": 647.47306545405502, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0709198, 54.2645719 ], [ -126.070937, 54.2645449 ], [ -126.071003300000015, 54.2644837 ], [ -126.071311299999977, 54.2644552 ], [ -126.0714553, 54.2643683 ], [ -126.0716956, 54.2642316 ], [ -126.0720205, 54.2642031 ], [ -126.072070200000013, 54.2641675 ], [ -126.072088099999974, 54.2641319 ], [ -126.072002700000013, 54.2640322 ], [ -126.0719629, 54.263941 ], [ -126.0719452, 54.2637431 ], [ -126.071944500000015, 54.2635451 ], [ -126.0720076, 54.263313 ], [ -126.07178949999998, 54.2631363 ], [ -126.0717285, 54.2631164 ], [ -126.0716848, 54.2630893 ], [ -126.0716602, 54.2630167 ], [ -126.0717132, 54.2629184 ], [ -126.071966100000012, 54.2628074 ], [ -126.0720968, 54.2627034 ], [ -126.0721346, 54.2626137 ], [ -126.0721061, 54.2625781 ], [ -126.0720459, 54.2625496 ], [ -126.071835399999983, 54.2624983 ], [ -126.0716207, 54.2624855 ], [ -126.0713055, 54.2625937 ], [ -126.071245, 54.2625923 ], [ -126.0711257, 54.2625453 ], [ -126.0710715, 54.2624271 ], [ -126.071037800000013, 54.2622462 ], [ -126.0709945, 54.2622177 ], [ -126.0709494, 54.2622078 ], [ -126.070871900000014, 54.2622063 ], [ -126.070519100000013, 54.2621978 ], [ -126.070472599999988, 54.2622049 ], [ -126.070426700000013, 54.2622035 ], [ -126.070100899999986, 54.2622676 ], [ -126.069916499999977, 54.2622719 ], [ -126.069868899999989, 54.2622619 ], [ -126.06981110000001, 54.2622334 ], [ -126.06976610000001, 54.2621964 ], [ -126.0697548, 54.2621608 ], [ -126.0699346, 54.2620027 ], [ -126.0699513, 54.261977 ], [ -126.070141099999987, 54.2618916 ], [ -126.07022, 54.2618759 ], [ -126.0705589, 54.261856 ], [ -126.070656500000013, 54.2617962 ], [ -126.070674399999973, 54.2617606 ], [ -126.0705001, 54.2616039 ], [ -126.0702175, 54.26147 ], [ -126.0699171, 54.2613917 ], [ -126.0698442, 54.2613176 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17095363, "stream_order": 4, "gnis_name": "Dungate Creek", "downstream_route_measure": 2301.56738925114, "blue_line_key": 360760898, "length_metre": 1145.5749527569999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5944985, 54.3587435 ], [ -126.594113199999981, 54.358762 ], [ -126.5937573, 54.3587734 ], [ -126.5935684, 54.3588589 ], [ -126.5932565, 54.3589258 ], [ -126.5931323, 54.3589315 ], [ -126.5928258, 54.3589344 ], [ -126.5925628, 54.3589386 ], [ -126.592319, 54.3589159 ], [ -126.592089699999988, 54.358866 ], [ -126.5919666, 54.3588546 ], [ -126.5916927, 54.3588133 ], [ -126.5913421, 54.3587606 ], [ -126.5909777, 54.3586638 ], [ -126.590826799999974, 54.3586339 ], [ -126.5905785, 54.3586381 ], [ -126.5904092, 54.3586609 ], [ -126.59014, 54.3587734 ], [ -126.590028499999988, 54.3588332 ], [ -126.5899639, 54.358913 ], [ -126.589771499999983, 54.3590084 ], [ -126.5895224, 54.3590569 ], [ -126.5891849, 54.3590782 ], [ -126.5890738, 54.3591024 ], [ -126.5888083, 54.3591694 ], [ -126.5886667, 54.3592107 ], [ -126.588417299999975, 54.3592876 ], [ -126.588119, 54.3593716 ], [ -126.587785, 54.359571 ], [ -126.5876231, 54.359712 ], [ -126.587553899999989, 54.3598188 ], [ -126.587500599999984, 54.3599427 ], [ -126.587436, 54.3600225 ], [ -126.587371, 54.3600752 ], [ -126.5871355, 54.3601336 ], [ -126.5869042, 54.3601378 ], [ -126.586812900000012, 54.360126400000013 ], [ -126.5866746, 54.3601236 ], [ -126.586367700000011, 54.3600994 ], [ -126.5860898, 54.3601392 ], [ -126.585980600000013, 54.3601649 ], [ -126.585598199999978, 54.3603628 ], [ -126.5854396, 54.3604597 ], [ -126.5853595, 54.3605209 ], [ -126.5852491, 54.3605637 ], [ -126.584937400000015, 54.3606021 ], [ -126.5846915, 54.3606064 ], [ -126.584351, 54.3606434 ], [ -126.584104, 54.3606577 ], [ -126.5837945, 54.3606691 ], [ -126.5836393, 54.3606933 ], [ -126.583342299999984, 54.3607944 ], [ -126.5831228, 54.3608627 ], [ -126.582822799999988, 54.3609724 ], [ -126.582728199999977, 54.360998 ], [ -126.582572, 54.3610393 ], [ -126.58241790000001, 54.3610465 ], [ -126.5821261, 54.3610493 ], [ -126.5819095, 54.3610536 ], [ -126.5818024, 54.3610522 ], [ -126.5816489, 54.361057900000013 ], [ -126.581402099999977, 54.3610436 ], [ -126.581263799999974, 54.3610408 ], [ -126.581003200000012, 54.361045 ], [ -126.5806613, 54.361065 ], [ -126.580385, 54.3610863 ], [ -126.5802744, 54.361102 ], [ -126.580168399999977, 54.3610906 ], [ -126.5799404, 54.3610507 ], [ -126.5796827, 54.3609909 ], [ -126.579527899999988, 54.3609795 ], [ -126.5792659, 54.3609738 ], [ -126.5791281, 54.3609624 ], [ -126.5788229, 54.3609197 ], [ -126.5786419, 54.3608713 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17097900, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 14024.0633475225, "blue_line_key": 360886221, "length_metre": 206.530653101529, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6331219, 54.3143766 ], [ -126.633573399999989, 54.3145232 ], [ -126.633916, 54.3147155 ], [ -126.63454560000001, 54.3152311 ], [ -126.634957199999988, 54.3154077 ], [ -126.635497199999989, 54.3155458 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17066380, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 4209.5389649199997, "blue_line_key": 360851751, "length_metre": 113.60451299733499, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1821817, 54.5666112 ], [ -126.1817574, 54.5666923 ], [ -126.1812828, 54.5669985 ], [ -126.1807418, 54.5671524 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17082877, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1943.1703411083299, "blue_line_key": 360875052, "length_metre": 670.35655332819999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.337875399999987, 54.4819519 ], [ -126.337966699999981, 54.4819989 ], [ -126.3380241, 54.4820445 ], [ -126.338245, 54.4822381 ], [ -126.338336, 54.4822581 ], [ -126.3386376, 54.4823549 ], [ -126.3387436, 54.4824019 ], [ -126.339027699999988, 54.4825344 ], [ -126.33910130000001, 54.4825899 ], [ -126.3394296, 54.4827779 ], [ -126.3395913, 54.482889 ], [ -126.3397861, 54.482983 ], [ -126.3400994, 54.4831511 ], [ -126.340229, 54.483297799999988 ], [ -126.340306500000011, 54.4835157 ], [ -126.3403808, 54.4835897 ], [ -126.340527900000012, 54.4837008 ], [ -126.3406633, 54.4837478 ], [ -126.3407396, 54.4837677 ], [ -126.3411204, 54.4838489 ], [ -126.3413621, 54.4839073 ], [ -126.3415618, 54.4839387 ], [ -126.3419293, 54.4839743 ], [ -126.3420611, 54.4840939 ], [ -126.3422964, 54.4842605 ], [ -126.34264109999998, 54.48443 ], [ -126.3427482, 54.4844599 ], [ -126.34287, 54.4844898 ], [ -126.343144199999983, 54.4845397 ], [ -126.3433884, 54.4845909 ], [ -126.3436659, 54.4845966 ], [ -126.34402, 54.4845867 ], [ -126.3442505, 54.484628 ], [ -126.344612700000013, 54.4847618 ], [ -126.344759, 54.4848544 ], [ -126.344865, 54.4849014 ], [ -126.345148599999987, 54.4850424 ], [ -126.3453118, 54.4851635 ], [ -126.3454276, 54.4852731 ], [ -126.3455852, 54.48546540000001 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076278, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 212705.16584321801, "blue_line_key": 360873822, "length_metre": 782.22248471298201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3931375, 54.516365 ], [ -126.3924818, 54.516234 ], [ -126.3922023, 54.5160446 ], [ -126.3922747, 54.5159221 ], [ -126.392728699999978, 54.5157541 ], [ -126.393472099999983, 54.5156843 ], [ -126.3937412, 54.515574600000015 ], [ -126.393750199999985, 54.5154023 ], [ -126.39317290000001, 54.5149779 ], [ -126.3929731, 54.5146873 ], [ -126.3927609, 54.514572 ], [ -126.3924828, 54.5145535 ], [ -126.3920746, 54.514703 ], [ -126.39157680000001, 54.5150306 ], [ -126.3910667, 54.5150719 ], [ -126.3907237, 54.5150007 ], [ -126.3905009, 54.5148525 ], [ -126.3905469, 54.514505 ], [ -126.3906888, 54.5144082 ], [ -126.391029499999988, 54.5143042 ], [ -126.391698699999978, 54.5142501 ], [ -126.3918493, 54.5141846 ], [ -126.391906899999981, 54.5140066 ], [ -126.3916187, 54.513877 ], [ -126.3913913, 54.5138328 ], [ -126.3900546, 54.513706 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17063584, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1558.90096702306, "blue_line_key": 360851751, "length_metre": 164.83606332548399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2048974, 54.582924 ], [ -126.2048111, 54.5828414 ], [ -126.2047002, 54.5826406 ], [ -126.2046951, 54.5824882 ], [ -126.204734499999986, 54.5823629 ], [ -126.2049603, 54.5822248 ], [ -126.2050115, 54.5821635 ], [ -126.2050003, 54.582090900000011 ], [ -126.2049815, 54.5819285 ], [ -126.2048251, 54.5817177 ], [ -126.204759599999988, 54.5815554 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080165, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 226161.84964440201, "blue_line_key": 360873822, "length_metre": 186.482592403578, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.27795, 54.4959447 ], [ -126.2779204, 54.4959177 ], [ -126.2778754, 54.4958992 ], [ -126.2776823, 54.495786599999988 ], [ -126.2775539, 54.49563 ], [ -126.277366500000014, 54.4954463 ], [ -126.2772678, 54.4953095 ], [ -126.2772299, 54.4951742 ], [ -126.2772189, 54.4951016 ], [ -126.2772157, 54.4949307 ], [ -126.2772711, 54.4947883 ], [ -126.2774213, 54.4946202 ], [ -126.2775722, 54.4944436 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17067686, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 541.59292908082898, "blue_line_key": 360881574, "length_metre": 90.106651391818701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.597061599999975, 54.558334 ], [ -126.5972204, 54.5584789 ], [ -126.5980865, 54.5587025 ], [ -126.5981867, 54.558768 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17089927, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 3585.0932155717001, "blue_line_key": 360862508, "length_metre": 493.40364275015799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4973486, 54.4349715 ], [ -126.4971619, 54.4347707 ], [ -126.4969701, 54.4346126 ], [ -126.496720799999977, 54.4344018 ], [ -126.4965135, 54.4342807 ], [ -126.496393900000015, 54.4342238 ], [ -126.49624249999998, 54.4341668 ], [ -126.4960748, 54.4341355 ], [ -126.4958308, 54.4340771 ], [ -126.4955906, 54.4339731 ], [ -126.495408699999984, 54.4339332 ], [ -126.495209100000011, 54.4339019 ], [ -126.4949194, 54.4338691 ], [ -126.4947338, 54.4338748 ], [ -126.494486, 54.4338691 ], [ -126.4942868, 54.4338649 ], [ -126.493901799999989, 54.4338663 ], [ -126.4935765, 54.4338862 ], [ -126.4932178, 54.4339247 ], [ -126.4929871, 54.433919 ], [ -126.4926947, 54.4339218 ], [ -126.492481, 54.433882 ], [ -126.4921499, 54.4337581 ], [ -126.4917986, 54.4337054 ], [ -126.491476800000015, 54.4336455 ], [ -126.4912669, 54.4335601 ], [ -126.4911955, 54.4334775 ], [ -126.491008, 54.4332582 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17084534, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 3821.6857073466599, "blue_line_key": 360846413, "length_metre": 328.11495683894202, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3081171, 54.475701 ], [ -126.3082185, 54.4755671 ], [ -126.308371, 54.4753649 ], [ -126.3084894, 54.4751969 ], [ -126.3086885, 54.4749946 ], [ -126.3087443, 54.4748508 ], [ -126.308832099999989, 54.4746998 ], [ -126.308882399999973, 54.47462 ], [ -126.3090022, 54.474462 ], [ -126.3091371, 54.4743024 ], [ -126.309301499999975, 54.4741358 ], [ -126.3093704, 54.4740105 ], [ -126.3094447, 54.4738424 ], [ -126.3094786, 54.473788299999988 ], [ -126.3096156, 54.4735676 ], [ -126.3097342, 54.4734266 ], [ -126.3099172, 54.4732143 ], [ -126.3100066, 54.4730449 ], [ -126.31004, 54.4729922 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17068218, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 13644.877624962, "blue_line_key": 360875378, "length_metre": 18.952119294839701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.605524599999981, 54.5547147 ], [ -126.6056783, 54.5547176 ], [ -126.605816799999985, 54.554729 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17079182, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 6513.9771982346601, "blue_line_key": 360869846, "length_metre": 248.63652835228999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5804366, 54.4980212 ], [ -126.5805297, 54.4980497 ], [ -126.5807583, 54.4980625 ], [ -126.581068300000013, 54.4980597 ], [ -126.5814249, 54.4980497 ], [ -126.5815657, 54.4980255 ], [ -126.5818312, 54.4979671 ], [ -126.5819852, 54.4979614 ], [ -126.582309899999984, 54.4979586 ], [ -126.5824948, 54.4979628 ], [ -126.58260270000001, 54.4979913 ], [ -126.5829628, 54.4981337 ], [ -126.5830565, 54.4981537 ], [ -126.5831629, 54.4981651 ], [ -126.5833619, 54.4982135 ], [ -126.583541700000012, 54.498289 ], [ -126.5836638, 54.4983189 ], [ -126.5839262, 54.4983331 ], [ -126.584079199999977, 54.4983445 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092198, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 8903.3498126146205, "blue_line_key": 360862508, "length_metre": 115.611473605854, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.452568499999984, 54.4115504 ], [ -126.452541400000015, 54.4115233 ], [ -126.4525112, 54.4115048 ], [ -126.4524201, 54.4114578 ], [ -126.452298499999984, 54.4114279 ], [ -126.45191650000001, 54.4113937 ], [ -126.4516761, 54.4112983 ], [ -126.4514625, 54.4112584 ], [ -126.4513074, 54.4112541 ], [ -126.4510618, 54.4112498 ], [ -126.450938199999982, 54.4112741 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099381, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 25068.004420063, "blue_line_key": 360880905, "length_metre": 551.85743679939003, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.40639560000001, 54.2883805 ], [ -126.406980600000011, 54.288389 ], [ -126.4073549, 54.2885229 ], [ -126.4075644, 54.2887422 ], [ -126.4077288, 54.2892108 ], [ -126.408159499999982, 54.2895554 ], [ -126.4085257, 54.2899713 ], [ -126.409138499999983, 54.2903188 ], [ -126.4099654, 54.2906677 ], [ -126.4109484, 54.290996700000015 ], [ -126.411249700000013, 54.2909455 ], [ -126.4116156, 54.2907888 ], [ -126.411932900000011, 54.2907133 ], [ -126.4124935, 54.2906877 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091641, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 16703.296938376301, "blue_line_key": 360862508, "length_metre": 96.374735313795895, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.351873699999985, 54.4171635 ], [ -126.3504285, 54.416956399999989 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17065308, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 6318.7161402461097, "blue_line_key": 360851751, "length_metre": 475.13572693678702, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1565965, 54.5722285 ], [ -126.150975699999989, 54.5749803 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080042, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 223285.630879718, "blue_line_key": 360873822, "length_metre": 107.670745382268, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2999443, 54.4950176 ], [ -126.299893299999979, 54.4950717 ], [ -126.299843, 54.495151400000012 ], [ -126.299804599999987, 54.4952668 ], [ -126.299728, 54.495490399999987 ], [ -126.2996516, 54.4956855 ], [ -126.2995036, 54.4958265 ], [ -126.299332, 54.4958678 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100087, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 22333.031954041198, "blue_line_key": 360880905, "length_metre": 262.87045762219901, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3866529, 54.2766792 ], [ -126.386603, 54.2767504 ], [ -126.3865072, 54.2767931 ], [ -126.386474299999989, 54.2768372 ], [ -126.3865179, 54.2768928 ], [ -126.3866094, 54.2769028 ], [ -126.386701, 54.2768785 ], [ -126.386810900000015, 54.2768714 ], [ -126.3869172, 54.2768743 ], [ -126.387220899999974, 54.2769526 ], [ -126.3872766, 54.2770081 ], [ -126.3872296, 54.2770509 ], [ -126.386903600000011, 54.2770893 ], [ -126.3868842, 54.2771434 ], [ -126.386928200000014, 54.2771976 ], [ -126.38706089999998, 54.2772901 ], [ -126.386979299999979, 54.2773613 ], [ -126.3869551, 54.2774767 ], [ -126.386966300000012, 54.2775408 ], [ -126.3870103, 54.2775949 ], [ -126.387116, 54.2776063 ], [ -126.3873351, 54.2775394 ], [ -126.3876359, 54.2774283 ], [ -126.3877153, 54.277377 ], [ -126.3876606, 54.2772503 ], [ -126.3876971, 54.2771961 ], [ -126.387899199999978, 54.2771563 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17106267, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 49913.660470328097, "blue_line_key": 360886221, "length_metre": 2750.2369690113401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.484855900000014, 54.1852962 ], [ -126.484825399999977, 54.1852862 ], [ -126.4846907, 54.1852207 ], [ -126.484555399999977, 54.1851908 ], [ -126.4843403, 54.1851865 ], [ -126.4842483, 54.1851851 ], [ -126.4841697, 54.1852008 ], [ -126.4840795, 54.1852079 ], [ -126.483985800000013, 54.185225 ], [ -126.483907800000011, 54.1852321 ], [ -126.483832799999988, 54.1852307 ], [ -126.483739500000013, 54.1852193 ], [ -126.483589, 54.1851709 ], [ -126.483487200000013, 54.1850882 ], [ -126.483368899999988, 54.185031300000013 ], [ -126.4832939, 54.1850028 ], [ -126.483217199999984, 54.1849928 ], [ -126.483081200000015, 54.1849715 ], [ -126.483003899999986, 54.18497 ], [ -126.482851499999981, 54.1849672 ], [ -126.4827291, 54.1849829 ], [ -126.4826487, 54.1850441 ], [ -126.4826427, 54.185115300000014 ], [ -126.4826555, 54.1851609 ], [ -126.4826532, 54.185215 ], [ -126.4826495, 54.1852592 ], [ -126.48263009999998, 54.1853133 ], [ -126.482566100000014, 54.1853831 ], [ -126.4824541, 54.1854443 ], [ -126.4823304, 54.1854771 ], [ -126.4822055, 54.1854927 ], [ -126.48207020000001, 54.1854628 ], [ -126.4819501, 54.1854244 ], [ -126.4818775, 54.1853418 ], [ -126.481852499999974, 54.1852691 ], [ -126.4818543, 54.185216399999987 ], [ -126.4818737, 54.1851623 ], [ -126.481876699999987, 54.1850996 ], [ -126.4818816, 54.1850455 ], [ -126.481883899999985, 54.1849914 ], [ -126.4818869, 54.1849287 ], [ -126.4818771, 54.1848746 ], [ -126.4818479, 54.1848205 ], [ -126.481791699999988, 54.1847464 ], [ -126.4817034, 54.1847009 ], [ -126.4816119, 54.184671 ], [ -126.481521699999988, 54.184651 ], [ -126.4814157, 54.184614 ], [ -126.481327900000011, 54.184567 ], [ -126.481300399999981, 54.1844944 ], [ -126.481353399999989, 54.1844146 ], [ -126.4814325, 54.1843434 ], [ -126.4815129, 54.1842821 ], [ -126.4816091, 54.1842309 ], [ -126.4816895, 54.1841696 ], [ -126.481755299999975, 54.1841084 ], [ -126.481820399999975, 54.1840286 ], [ -126.4818398, 54.1839745 ], [ -126.481858100000011, 54.1839304 ], [ -126.4818611, 54.1838677 ], [ -126.4818635, 54.1838136 ], [ -126.4818512, 54.1837595 ], [ -126.4818384, 54.1837139 ], [ -126.4817519, 54.1836498 ], [ -126.481646399999974, 54.1836113 ], [ -126.4815568, 54.1835829 ], [ -126.4814185, 54.18356150000001 ], [ -126.4813131, 54.1835501 ], [ -126.481205800000012, 54.1835572 ], [ -126.4810675, 54.1835629 ], [ -126.4809444, 54.1835601 ], [ -126.480821299999974, 54.1835843 ], [ -126.4807245, 54.183637 ], [ -126.4806893, 54.1837353 ], [ -126.480715499999988, 54.1837979 ], [ -126.480713099999988, 54.183852 ], [ -126.4807089, 54.1838976 ], [ -126.4807077, 54.1839418 ], [ -126.480640099999974, 54.1840215 ], [ -126.4806049, 54.1840927 ], [ -126.4806177, 54.1841383 ], [ -126.4806738, 54.1842195 ], [ -126.4807927, 54.184295 ], [ -126.4808811, 54.1843676 ], [ -126.480908500000012, 54.1844132 ], [ -126.4808721, 54.1844943 ], [ -126.480807, 54.1845741 ], [ -126.480681499999974, 54.1846254 ], [ -126.480542499999984, 54.1846396 ], [ -126.480418299999982, 54.1846467 ], [ -126.4803268, 54.1846439 ], [ -126.4802494, 54.1846425 ], [ -126.4801575, 54.184641 ], [ -126.480051399999979, 54.1846382 ], [ -126.4798675, 54.1846353 ], [ -126.479761400000015, 54.1846325 ], [ -126.479684, 54.1846311 ], [ -126.4795914, 54.1846382 ], [ -126.4794994, 54.1846368 ], [ -126.4794226, 54.1846339 ], [ -126.4792873, 54.184604 ], [ -126.479197700000014, 54.1845755 ], [ -126.4788979, 54.1844616 ], [ -126.4788229, 54.1844331 ], [ -126.478732, 54.1843947 ], [ -126.4786431, 54.1843576 ], [ -126.4785535, 54.1843291 ], [ -126.4784773, 54.1842907 ], [ -126.4783883, 54.1842537 ], [ -126.4782982, 54.1842337 ], [ -126.4782073, 54.1842223 ], [ -126.4780532, 54.1842109 ], [ -126.477899, 54.1842337 ], [ -126.477787, 54.184295 ], [ -126.4777376, 54.1843648 ], [ -126.4777328, 54.1844459 ], [ -126.4778047, 54.18451 ], [ -126.4779091, 54.1845584 ], [ -126.4779987, 54.184614 ], [ -126.4780712, 54.1846695 ], [ -126.47806820000001, 54.1847322 ], [ -126.478064499999988, 54.1848034 ], [ -126.478074400000011, 54.1848846 ], [ -126.478115299999985, 54.1849672 ], [ -126.4782025, 54.1850227 ], [ -126.478307300000012, 54.1850697 ], [ -126.478428, 54.1850996 ], [ -126.4785054, 54.1851011 ], [ -126.478598, 54.1850939 ], [ -126.4786912, 54.1850783 ], [ -126.478783199999981, 54.1850526 ], [ -126.4789104, 54.1850099 ], [ -126.479001200000013, 54.1849943 ], [ -126.479094499999988, 54.1849786 ], [ -126.4791877, 54.184962899999988 ], [ -126.479281499999985, 54.18494579999998 ], [ -126.479374100000015, 54.1849387 ], [ -126.479524599999976, 54.1849601 ], [ -126.4796002, 54.18498 ], [ -126.479704399999989, 54.1850356 ], [ -126.4797776, 54.1851096 ], [ -126.479820300000014, 54.1851737 ], [ -126.4797851, 54.1852449 ], [ -126.479718699999978, 54.1853147 ], [ -126.479592, 54.185375900000011 ], [ -126.479514099999975, 54.1854101 ], [ -126.4793575, 54.18546 ], [ -126.4792795, 54.1854941 ], [ -126.4791851, 54.1855198 ], [ -126.479106500000015, 54.1855625 ], [ -126.479026100000013, 54.1855967 ], [ -126.4789463, 54.1856494 ], [ -126.47888420000001, 54.1856935 ], [ -126.4787411, 54.1857804 ], [ -126.4785827, 54.1858488 ], [ -126.4784871, 54.1858915 ], [ -126.4783622, 54.1859613 ], [ -126.478248299999976, 54.1860482 ], [ -126.4781673, 54.186118 ], [ -126.478148499999989, 54.1861635 ], [ -126.47813210000001, 54.1862162 ], [ -126.4781279, 54.1862618 ], [ -126.4781255, 54.1863159 ], [ -126.478102399999983, 54.1864142 ], [ -126.478038399999988, 54.1864569 ], [ -126.4779587, 54.1865096 ], [ -126.477833800000013, 54.1865523 ], [ -126.4777576, 54.186568 ], [ -126.477665, 54.1865751 ], [ -126.477587, 54.1865822 ], [ -126.4774329, 54.1865979 ], [ -126.477356699999987, 54.1865865 ], [ -126.477205, 54.1865751 ], [ -126.477069, 54.1865267 ], [ -126.4769204, 54.1864797 ], [ -126.4768149, 54.1864412 ], [ -126.4767247, 54.1864213 ], [ -126.476614399999988, 54.186437 ], [ -126.4765212, 54.186452599999988 ], [ -126.476431, 54.1864327 ], [ -126.4763566, 54.1863957 ], [ -126.4763303, 54.1863401 ], [ -126.4763048, 54.1862689 ], [ -126.476308899999978, 54.1861963 ], [ -126.4763588, 54.1861251 ], [ -126.476452, 54.1860823 ], [ -126.4765745, 54.1860937 ], [ -126.476725699999989, 54.1861336 ], [ -126.4768159, 54.1861806 ], [ -126.4769049, 54.1862176 ], [ -126.4770384, 54.1862661 ], [ -126.4771615, 54.186296 ], [ -126.477298, 54.1863159 ], [ -126.4774041, 54.1863188 ], [ -126.47751190000001, 54.1863031 ], [ -126.4776075, 54.1862604 ], [ -126.4776252, 54.1861977 ], [ -126.4776452, 54.186135 ], [ -126.4776957, 54.1860824 ], [ -126.4777578, 54.1860382 ], [ -126.4778248, 54.185967 ], [ -126.4778003, 54.185858700000011 ], [ -126.477729, 54.1857861 ], [ -126.4776412, 54.1857121 ], [ -126.4775211, 54.1856465 ], [ -126.477402799999979, 54.1855896 ], [ -126.477268099999975, 54.1855511 ], [ -126.477131, 54.1855127 ], [ -126.4770554, 54.1854927 ], [ -126.4769805, 54.1854642 ], [ -126.4768909, 54.1854358 ], [ -126.4768159, 54.1854073 ], [ -126.476741, 54.1853788 ], [ -126.476591, 54.1853218 ], [ -126.4764563, 54.1852563 ], [ -126.4763819, 54.1852264 ], [ -126.476232599999989, 54.1851609 ], [ -126.4760997, 54.1850769 ], [ -126.476041200000012, 54.1850227 ], [ -126.475985099999988, 54.1849757 ], [ -126.4758357, 54.1848832 ], [ -126.4757187, 54.1848091 ], [ -126.475598, 54.1847521 ], [ -126.4755102, 54.1847051 ], [ -126.4754224, 54.1846311 ], [ -126.4753206, 54.1845485 ], [ -126.475218200000015, 54.1844744 ], [ -126.4751304, 54.1844004 ], [ -126.4749774, 54.184379 ], [ -126.4748379, 54.1843947 ], [ -126.4747003, 54.1844189 ], [ -126.474574099999984, 54.18445160000001 ], [ -126.474497399999976, 54.1844687 ], [ -126.4744188, 54.1844844 ], [ -126.4742811, 54.1845086 ], [ -126.4742013, 54.1845342 ], [ -126.474108699999988, 54.1845414 ], [ -126.4740026, 54.184538499999988 ], [ -126.47387950000001, 54.1845357 ], [ -126.4737693, 54.1845784 ], [ -126.4736902, 54.1846496 ], [ -126.473654299999978, 54.1847293 ], [ -126.4736501, 54.1847749 ], [ -126.473648200000014, 54.1848276 ], [ -126.4736604, 54.1848817 ], [ -126.4736691, 54.1849729 ], [ -126.4736789, 54.1850541 ], [ -126.473677599999988, 54.1850982 ], [ -126.4736576, 54.1851609 ], [ -126.4736552, 54.185215 ], [ -126.4736504, 54.1852691 ], [ -126.473649099999989, 54.1853133 ], [ -126.473615099999989, 54.1853674 ], [ -126.4735493, 54.1854286 ], [ -126.4734439, 54.1854172 ], [ -126.4733184, 54.185441499999989 ], [ -126.4732526, 54.1855298 ], [ -126.473171099999988, 54.185601 ], [ -126.4730779, 54.1856437 ], [ -126.473010300000013, 54.1857234 ], [ -126.472991400000012, 54.185803199999988 ], [ -126.473046900000014, 54.1858858 ], [ -126.4731341, 54.1859684 ], [ -126.4732043, 54.186051 ], [ -126.4732488, 54.1860966 ], [ -126.473365199999989, 54.1861792 ], [ -126.473453, 54.1862533 ], [ -126.4735602, 54.1862732 ], [ -126.4736517, 54.186276 ], [ -126.473760700000014, 54.1862504 ], [ -126.4738539, 54.1862077 ], [ -126.4739356, 54.1861564 ], [ -126.4740591, 54.1861037 ], [ -126.4742005, 54.1860624 ], [ -126.474325399999984, 54.1860467 ], [ -126.4744753, 54.1860767 ], [ -126.474577699999983, 54.1861507 ], [ -126.474590599999985, 54.1861963 ], [ -126.474602800000014, 54.186250399999984 ], [ -126.4746303, 54.186296 ], [ -126.474688199999974, 54.1863786 ], [ -126.474790699999986, 54.1864526 ], [ -126.4748931, 54.1865267 ], [ -126.4750108, 54.1865922 ], [ -126.4750851, 54.1866563 ], [ -126.4751553, 54.186738899999987 ], [ -126.475227899999979, 54.1868215 ], [ -126.4752412, 54.1868657 ], [ -126.4752364, 54.1869198 ], [ -126.4752035, 54.1869639 ], [ -126.4751695, 54.1870181 ], [ -126.475121399999978, 54.1870707 ], [ -126.475071500000013, 54.1871149 ], [ -126.4750063, 54.1871676 ], [ -126.4749423, 54.1872103 ], [ -126.4748169, 54.1872886 ], [ -126.474658499999975, 54.187357 ], [ -126.4745166, 54.1874268 ], [ -126.474390499999984, 54.1874866 ], [ -126.474311299999982, 54.1875308 ], [ -126.47419810000001, 54.1876362 ], [ -126.474162100000015, 54.1876889 ], [ -126.4740641, 54.1877857 ], [ -126.4739569, 54.1878199 ], [ -126.4738192, 54.18779 ], [ -126.4737167, 54.187715900000015 ], [ -126.473629500000015, 54.1876333 ], [ -126.4735886, 54.1875507 ], [ -126.4735173, 54.1874781 ], [ -126.4734142, 54.1874126 ], [ -126.4733258, 54.187347 ], [ -126.4732521, 54.1872744 ], [ -126.4732276, 54.1871932 ], [ -126.47323, 54.187139099999989 ], [ -126.4732342, 54.1870665 ], [ -126.473239599999985, 54.1870038 ], [ -126.473228, 54.1869411 ], [ -126.473231, 54.1868785 ], [ -126.4732334, 54.1868244 ], [ -126.4732382, 54.1867702 ], [ -126.4732284, 54.1866891 ], [ -126.4731992, 54.1866349 ], [ -126.4731412, 54.1865794 ], [ -126.4730523, 54.1865424 ], [ -126.4729163, 54.186521 ], [ -126.472762800000012, 54.1865352 ], [ -126.472685399999989, 54.1865338 ], [ -126.47259339999998, 54.1865324 ], [ -126.4725032, 54.1865125 ], [ -126.4724282, 54.186484 ], [ -126.4723533, 54.1864555 ], [ -126.4722045, 54.1863886 ], [ -126.472130799999974, 54.186343 ], [ -126.4720728, 54.1862874 ], [ -126.4719979, 54.1862319 ], [ -126.4719107, 54.1861493 ], [ -126.471840500000013, 54.1860667 ], [ -126.471766799999983, 54.185994 ], [ -126.4716479, 54.1859456 ], [ -126.4715096, 54.1859513 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100808, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 507.08156478234298, "blue_line_key": 360874778, "length_metre": 87.605281005447793, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3613414, 54.2657612 ], [ -126.361218099999988, 54.2657854 ], [ -126.3609068, 54.2658238 ], [ -126.3607132, 54.2657654 ], [ -126.3605911, 54.2657455 ], [ -126.3603315, 54.2656942 ], [ -126.360254, 54.2657199 ], [ -126.3600825, 54.2657697 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17099723, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 20682.8434287852, "blue_line_key": 360881038, "length_metre": 937.95334172417802, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.087945100000013, 54.2920173 ], [ -126.084127900000013, 54.2839127 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17105897, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 9956.7783620355494, "blue_line_key": 360882583, "length_metre": 26.911126372326599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.957344, 54.189944800000013 ], [ -125.9575114, 54.1899135 ], [ -125.9576712, 54.1898109 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17054875, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 19817.195849402899, "blue_line_key": 360856488, "length_metre": 354.78652190953898, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.513233, 54.6278992 ], [ -126.513374700000014, 54.6278664 ], [ -126.5134238, 54.6277952 ], [ -126.513418299999984, 54.6276328 ], [ -126.5134866, 54.627563 ], [ -126.513624399999983, 54.6275559 ], [ -126.5138842, 54.6276157 ], [ -126.51406, 54.6277909 ], [ -126.514215499999978, 54.6277752 ], [ -126.514427, 54.6276186 ], [ -126.5145243, 54.6275573 ], [ -126.5146493, 54.6275232 ], [ -126.5147581, 54.627543100000011 ], [ -126.5148329, 54.6275901 ], [ -126.5148285, 54.6276528 ], [ -126.5150973, 54.6277938 ], [ -126.515232199999986, 54.6278949 ], [ -126.515175700000015, 54.6280373 ], [ -126.5152353, 54.6280928 ], [ -126.5153264, 54.6281213 ], [ -126.515522499999989, 54.6279376 ], [ -126.515618, 54.6279034 ], [ -126.515742, 54.6279148 ], [ -126.5158464, 54.6279974 ], [ -126.51578, 54.6280686 ], [ -126.5156984, 54.6281199 ], [ -126.515644400000014, 54.6282267 ], [ -126.5157611, 54.6283734 ], [ -126.5158035, 54.628429 ], [ -126.5159088, 54.628466 ], [ -126.516019, 54.6284603 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17081236, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 7889.7222619158501, "blue_line_key": 360875052, "length_metre": 234.57596821001101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.40823060000001, 54.490594 ], [ -126.4097056, 54.4886738 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17077857, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 219822.715351491, "blue_line_key": 360873822, "length_metre": 246.37646015680301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3295671, 54.5060182 ], [ -126.329323500000015, 54.5059925 ], [ -126.3285002, 54.5061848 ], [ -126.3283819, 54.506256 ], [ -126.328209199999989, 54.5066064 ], [ -126.3280618, 54.5066904 ], [ -126.3278373, 54.5067217 ], [ -126.3276624, 54.5066961 ], [ -126.327235, 54.506538 ], [ -126.326535499999977, 54.5066989 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17081788, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 227753.319030852, "blue_line_key": 360873822, "length_metre": 82.791491886836695, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.26946860000001, 54.4874109 ], [ -126.269352500000011, 54.4870748 ], [ -126.269186499999989, 54.4869138 ], [ -126.2688316, 54.486864 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17101976, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 0.0, "blue_line_key": 360871884, "length_metre": 373.57463768706998, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0703801, 54.2481579 ], [ -126.070503, 54.2481352 ], [ -126.0706462, 54.2480839 ], [ -126.0707259, 54.2480326 ], [ -126.0709209, 54.247893 ], [ -126.071099499999974, 54.2477449 ], [ -126.0713828, 54.2476438 ], [ -126.071668, 54.2475242 ], [ -126.0717962, 54.2474473 ], [ -126.072053499999981, 54.2472906 ], [ -126.072147199999975, 54.2472479 ], [ -126.07237330000001, 54.2471097 ], [ -126.072612400000011, 54.246963 ], [ -126.0728379, 54.2468334 ], [ -126.0730914, 54.2467138 ], [ -126.073391699999974, 54.2466127 ], [ -126.0736877, 54.2465301 ], [ -126.073955099999978, 54.2464389 ], [ -126.074254, 54.2463549 ], [ -126.074408600000012, 54.2463321 ], [ -126.074779299999975, 54.246305 ], [ -126.0749618, 54.2463193 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17104487, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 21223.602991274402, "blue_line_key": 360877225, "length_metre": 154.726295955051, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2546695, 54.2131381 ], [ -126.2547946, 54.2130953 ], [ -126.2549038, 54.2130896 ], [ -126.255114, 54.213148 ], [ -126.2552606, 54.2132406 ], [ -126.2553037, 54.2132961 ], [ -126.2553092, 54.2134485 ], [ -126.255351699999977, 54.2135126 ], [ -126.255526899999978, 54.2136337 ], [ -126.2556272, 54.2137263 ], [ -126.255665099999987, 54.2138701 ], [ -126.255640299999982, 54.2140054 ], [ -126.255665099999987, 54.214078 ], [ -126.255755099999988, 54.214125 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17092796, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 251461.298410096, "blue_line_key": 360873822, "length_metre": 405.81869493702402, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1859739, 54.4059888 ], [ -126.1859421, 54.4059888 ], [ -126.1856228, 54.4059447 ], [ -126.185307599999987, 54.4058208 ], [ -126.185085500000014, 54.4056897 ], [ -126.1849271, 54.4055245 ], [ -126.1849018, 54.4054519 ], [ -126.184884200000013, 54.4052625 ], [ -126.184958, 54.4050845 ], [ -126.184948, 54.4049762 ], [ -126.1848767, 54.4049021 ], [ -126.1847548, 54.4048737 ], [ -126.1844478, 54.4048836 ], [ -126.184123699999986, 54.4048936 ], [ -126.183798400000015, 54.4048865 ], [ -126.1837083, 54.404858 ], [ -126.1835493, 54.4047013 ], [ -126.183487, 54.4044934 ], [ -126.183401, 54.4043923 ], [ -126.1832673, 54.4043353 ], [ -126.1831766, 54.4043154 ], [ -126.1828578, 54.4042356 ], [ -126.1827194, 54.4042328 ], [ -126.182333899999989, 54.4042228 ], [ -126.1819709, 54.404341 ], [ -126.1818742, 54.4044193 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104559, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 2654.1832529895601, "blue_line_key": 360882583, "length_metre": 115.95636575782, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.02091, 54.2124003 ], [ -126.0208635, 54.2124074 ], [ -126.0205659, 54.2124815 ], [ -126.0203115, 54.2126097 ], [ -126.0200699, 54.2127564 ], [ -126.0198878, 54.212933 ], [ -126.0197386, 54.2130996 ], [ -126.019721300000015, 54.2131267 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17094933, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 5563.3423366724201, "blue_line_key": 360886524, "length_metre": 217.69004871603701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1997686, 54.3711555 ], [ -126.1998843, 54.3710515 ], [ -126.199995, 54.3709818 ], [ -126.200151, 54.370949 ], [ -126.200232399999976, 54.3709063 ], [ -126.2002696, 54.3708165 ], [ -126.2003651, 54.3707482 ], [ -126.2004176, 54.370677 ], [ -126.2004101, 54.3705417 ], [ -126.2006212, 54.3703765 ], [ -126.2008651, 54.3702013 ], [ -126.2010419, 54.3700973 ], [ -126.2011563, 54.3699834 ], [ -126.201238299999986, 54.3699321 ], [ -126.2015009, 54.3699022 ], [ -126.201823499999989, 54.3699364 ], [ -126.201915899999989, 54.369937799999988 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099624, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 24355.404497734002, "blue_line_key": 360880905, "length_metre": 33.782982802426503, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3996176, 54.2852216 ], [ -126.399851399999989, 54.2851817 ], [ -126.400003099999978, 54.2852216 ], [ -126.4000337, 54.2852315 ], [ -126.4000771, 54.2852671 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17103528, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 31321.9029079383, "blue_line_key": 360881038, "length_metre": 214.730143731558, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0661445, 54.2267193 ], [ -126.066038599999985, 54.2266894 ], [ -126.0658855, 54.2266951 ], [ -126.065556699999988, 54.2267677 ], [ -126.0654186, 54.2267919 ], [ -126.065355799999978, 54.2267905 ], [ -126.0650501, 54.2268005 ], [ -126.064836899999989, 54.2267506 ], [ -126.0645016, 54.226715 ], [ -126.064457100000013, 54.2267236 ], [ -126.064290899999989, 54.2266652 ], [ -126.064245899999989, 54.2266552 ], [ -126.064202, 54.2266353 ], [ -126.0639583, 54.2266025 ], [ -126.0638681, 54.226582599999986 ], [ -126.063777500000015, 54.2265441 ], [ -126.0636763, 54.2264615 ], [ -126.0636096, 54.2263248 ], [ -126.0636, 54.2262251 ], [ -126.0636192, 54.2261995 ], [ -126.0636253, 54.2261098 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17053554, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 499.52191414951801, "blue_line_key": 360851779, "length_metre": 503.76655565355998, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.52534390000001, 54.6369301 ], [ -126.5255065, 54.6370511 ], [ -126.5257411, 54.6372705 ], [ -126.5257806, 54.6373701 ], [ -126.5257863, 54.6375325 ], [ -126.5257481, 54.6376578 ], [ -126.525697, 54.6377561 ], [ -126.5256216, 54.6379612 ], [ -126.5255943, 54.6381406 ], [ -126.525605200000015, 54.6382304 ], [ -126.5255942, 54.6383913 ], [ -126.5255999, 54.6385893 ], [ -126.525564, 54.6386434 ], [ -126.5254901, 54.6388656 ], [ -126.5253678, 54.6390707 ], [ -126.525311, 54.6392572 ], [ -126.525319, 54.6393484 ], [ -126.525307099999978, 54.6395549 ], [ -126.525284599999978, 54.6396702 ], [ -126.5252493, 54.6397514 ], [ -126.5251929, 54.6398938 ], [ -126.5251738, 54.6399565 ], [ -126.5251623, 54.6401545 ], [ -126.5251442, 54.6402072 ], [ -126.5251251, 54.6402698 ], [ -126.525119800000013, 54.6403425 ], [ -126.5251012, 54.6404037 ], [ -126.525000499999976, 54.6405105 ], [ -126.5248779, 54.6405162 ], [ -126.524782500000015, 54.6405504 ], [ -126.524614, 54.6407541 ], [ -126.5245639, 54.640842400000011 ], [ -126.524528100000012, 54.6408965 ], [ -126.5244947, 54.6409577 ], [ -126.5244589, 54.6410118 ], [ -126.5244241, 54.6410916 ], [ -126.524386799999988, 54.6411714 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17077853, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 220312.72408341101, "blue_line_key": 360873822, "length_metre": 77.051660942136195, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3240872, 54.506491 ], [ -126.3237073, 54.5063999 ], [ -126.3234486, 54.5061321 ], [ -126.3232655, 54.5060324 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092806, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 18226.791437001099, "blue_line_key": 360862508, "length_metre": 426.27352997543898, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3460353, 54.4072421 ], [ -126.3460923, 54.4070541 ], [ -126.346099599999988, 54.4069373 ], [ -126.346084100000013, 54.4067123 ], [ -126.346, 54.4065841 ], [ -126.3459675, 54.4063862 ], [ -126.3459042, 54.4061512 ], [ -126.3457578, 54.4060401 ], [ -126.345686199999989, 54.405966 ], [ -126.345483799999982, 54.4057367 ], [ -126.345290899999981, 54.4056257 ], [ -126.3452067, 54.4054975 ], [ -126.3449836, 54.405375 ], [ -126.3447469, 54.4052354 ], [ -126.3446372, 54.4050346 ], [ -126.3444656, 54.4048153 ], [ -126.3443502, 54.4046785 ], [ -126.344360400000014, 54.4045262 ], [ -126.344425, 54.404482 ], [ -126.3446547, 54.4042627 ], [ -126.344754399999985, 54.4041473 ], [ -126.344774199999989, 54.4040847 ], [ -126.344793599999988, 54.4040234 ], [ -126.3447893, 54.4038425 ], [ -126.3447939, 54.4037884 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17103656, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 27085.403656379, "blue_line_key": 360886221, "length_metre": 3437.0337166498098, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6318097, 54.236149 ], [ -126.6317371, 54.2360579 ], [ -126.63166360000001, 54.2360109 ], [ -126.6315409, 54.2359995 ], [ -126.631356699999984, 54.2359966 ], [ -126.6312651, 54.2359938 ], [ -126.631173, 54.2359923 ], [ -126.6309893, 54.2359881 ], [ -126.6308505, 54.2360222 ], [ -126.630818299999987, 54.2360308 ], [ -126.6306319, 54.2360892 ], [ -126.630459699999975, 54.236149 ], [ -126.6303343, 54.2362003 ], [ -126.6302377, 54.236253 ], [ -126.6301264, 54.2363128 ], [ -126.6297472, 54.2365307 ], [ -126.62957489999998, 54.2365905 ], [ -126.6294184, 54.2366404 ], [ -126.6292942, 54.2366745 ], [ -126.6291687, 54.2366987 ], [ -126.6290308, 54.2366959 ], [ -126.6288958, 54.2366575 ], [ -126.628760500000013, 54.2365919 ], [ -126.62864350000001, 54.2365093 ], [ -126.6285392, 54.2364253 ], [ -126.6284652, 54.2363797 ], [ -126.6284082, 54.2363342 ], [ -126.6282452, 54.2362231 ], [ -126.6280985, 54.2360935 ], [ -126.6280413, 54.2360208 ], [ -126.6279842, 54.2359482 ], [ -126.627897499999975, 54.2358556 ], [ -126.6278551, 54.23581 ], [ -126.6277391, 54.2356904 ], [ -126.6276965, 54.2356178 ], [ -126.6276523, 54.2355636 ], [ -126.6276143, 54.2354369 ], [ -126.6276361, 54.2353201 ], [ -126.6277191, 54.2352233 ], [ -126.6278144, 54.2351535 ], [ -126.627939900000015, 54.2351293 ], [ -126.628078300000013, 54.2351307 ], [ -126.6281693, 54.2351421 ], [ -126.628245099999987, 54.235162 ], [ -126.6284108, 54.2352105 ], [ -126.628576900000013, 54.2352574 ], [ -126.6286973, 54.2352959 ], [ -126.6288189, 54.2353173 ], [ -126.628927300000015, 54.2353002 ], [ -126.6290538, 54.2352318 ], [ -126.6291814, 54.2351535 ], [ -126.6292925, 54.2350737 ], [ -126.629420099999976, 54.2349954 ], [ -126.629503700000015, 54.23489 ], [ -126.629572400000015, 54.2347647 ], [ -126.6296253, 54.2346493 ], [ -126.62969219999998, 54.2345154 ], [ -126.6297305, 54.2344001 ], [ -126.6297214, 54.2343089 ], [ -126.6296325, 54.2342363 ], [ -126.6295115, 54.2342064 ], [ -126.629359600000015, 54.234195 ], [ -126.629221699999988, 54.2341921 ], [ -126.6290967, 54.2342078 ], [ -126.6289262, 54.2342491 ], [ -126.628800700000014, 54.2342733 ], [ -126.62866240000001, 54.2343061 ], [ -126.6285076, 54.234330300000011 ], [ -126.628337500000015, 54.234336 ], [ -126.6281533, 54.2343331 ], [ -126.627969, 54.2343374 ], [ -126.6277713, 54.2343246 ], [ -126.6276023, 54.2343132 ], [ -126.6274807, 54.2342918 ], [ -126.627449, 54.2342918 ], [ -126.6272842, 54.2342619 ], [ -126.6271009, 54.2342221 ], [ -126.627010500000011, 54.2342021 ], [ -126.626934699999978, 54.2341822 ], [ -126.626782, 54.2341523 ], [ -126.626662199999984, 54.2341053 ], [ -126.6265752, 54.2340412 ], [ -126.626501499999975, 54.2339671 ], [ -126.6264603, 54.2339045 ], [ -126.626449400000013, 54.2338318 ], [ -126.6264369, 54.2337777 ], [ -126.626439, 54.2337236 ], [ -126.626431599999989, 54.2336068 ], [ -126.626424, 54.2334629 ], [ -126.6264437, 54.2334003 ], [ -126.6264464, 54.2333376 ], [ -126.626484499999989, 54.2332023 ], [ -126.6264928, 54.2330684 ], [ -126.6264949, 54.2330143 ], [ -126.6265, 54.2329517 ], [ -126.626519, 54.2328705 ], [ -126.6265245, 54.2327722 ], [ -126.6265266, 54.2327181 ], [ -126.626545299999975, 54.2326654 ], [ -126.6266147, 54.2325586 ], [ -126.626711, 54.2324518 ], [ -126.626824599999978, 54.2323649 ], [ -126.6269662, 54.2322951 ], [ -126.6271222, 54.2322538 ], [ -126.627325, 54.2322039 ], [ -126.627465099999981, 54.2321797 ], [ -126.6275717, 54.2321541 ], [ -126.627792699999986, 54.2320872 ], [ -126.6279298, 54.2320715 ], [ -126.6280553, 54.2320473 ], [ -126.6281655, 54.2320046 ], [ -126.628273799999988, 54.2319533 ], [ -126.6283562, 54.231865 ], [ -126.628422, 54.2317753 ], [ -126.6284888, 54.2314349 ], [ -126.6284497, 54.2313181 ], [ -126.6284212, 54.231254 ], [ -126.6284117, 54.2311913 ], [ -126.628372099999979, 54.2310831 ], [ -126.6282995, 54.2309919 ], [ -126.628225300000011, 54.2309264 ], [ -126.628090199999988, 54.230888 ], [ -126.62793760000001, 54.2308581 ], [ -126.6277867, 54.2308367 ], [ -126.6276647, 54.2308168 ], [ -126.6274805, 54.2308139 ], [ -126.6273285, 54.2308096 ], [ -126.627189, 54.230825300000014 ], [ -126.6270145, 54.2309122 ], [ -126.6269818, 54.2309563 ], [ -126.626931, 54.2310446 ], [ -126.626894400000012, 54.2311344 ], [ -126.626875500000011, 54.2312155 ], [ -126.6268698, 54.2312868 ], [ -126.6268525, 54.2313494 ], [ -126.626817500000016, 54.2314206 ], [ -126.626768, 54.2314918 ], [ -126.6267176, 54.2315445 ], [ -126.6265777, 54.2315958 ], [ -126.6264833, 54.2316214 ], [ -126.6263765, 54.2316271 ], [ -126.6262662, 54.2316428 ], [ -126.6261443, 54.2316499 ], [ -126.62602, 54.231657 ], [ -126.6258815, 54.2316627 ], [ -126.625757299999989, 54.2316969 ], [ -126.625632, 54.2317482 ], [ -126.6254754, 54.231798 ], [ -126.625319, 54.2318408 ], [ -126.6252428, 54.2318564 ], [ -126.625149, 54.2318735 ], [ -126.62502520000001, 54.2318792 ], [ -126.6249354, 54.2318507 ], [ -126.624878200000012, 54.2317781 ], [ -126.6248528, 54.2317055 ], [ -126.6248717, 54.2316243 ], [ -126.6249671, 54.2315545 ], [ -126.6250801, 54.2314762 ], [ -126.625207099999983, 54.2314064 ], [ -126.625349300000011, 54.2313281 ], [ -126.6254459, 54.2312412 ], [ -126.6254644, 54.2311956 ], [ -126.625483100000011, 54.2311429 ], [ -126.6254895, 54.2310076 ], [ -126.625512499999985, 54.2308737 ], [ -126.625516300000015, 54.2308011 ], [ -126.625506800000011, 54.2307384 ], [ -126.625498600000014, 54.2306031 ], [ -126.625459600000013, 54.2304863 ], [ -126.6254159, 54.2304308 ], [ -126.625374099999988, 54.2303767 ], [ -126.6252864, 54.2302941 ], [ -126.6252127, 54.23022 ], [ -126.625187200000013, 54.2301474 ], [ -126.6251911, 54.2300676 ], [ -126.6251943, 54.2300035 ], [ -126.625197700000015, 54.2299594 ], [ -126.6252174, 54.2298967 ], [ -126.6252816, 54.2298255 ], [ -126.6253149, 54.2297728 ], [ -126.6253346, 54.2297102 ], [ -126.6253379, 54.2296389 ], [ -126.6253276, 54.2295578 ], [ -126.6253197, 54.2294495 ], [ -126.6253109, 54.2293228 ], [ -126.625299, 54.2292601 ], [ -126.6252881, 54.2291875 ], [ -126.6252491, 54.2290707 ], [ -126.6252111, 54.2289439 ], [ -126.6251832, 54.2288713 ], [ -126.6251713, 54.2288086 ], [ -126.6251356, 54.2286548 ], [ -126.6250822, 54.2285095 ], [ -126.62507140000001, 54.228436900000013 ], [ -126.625042399999984, 54.2283742 ], [ -126.6250044, 54.2282475 ], [ -126.6249488, 54.2281293 ], [ -126.624894499999982, 54.228021 ], [ -126.6248231, 54.2279199 ], [ -126.624766600000015, 54.2278387 ], [ -126.624709900000013, 54.2277647 ], [ -126.6246222, 54.2276821 ], [ -126.6245522, 54.2275909 ], [ -126.624481399999979, 54.2274813 ], [ -126.624437199999988, 54.2274271 ], [ -126.6243959, 54.2273716 ], [ -126.62431, 54.2272634 ], [ -126.624238, 54.2271708 ], [ -126.624136799999988, 54.2270711 ], [ -126.6240011, 54.2270141 ], [ -126.6238021, 54.2269913 ], [ -126.6236179, 54.2269885 ], [ -126.6233904, 54.2269842 ], [ -126.6230329, 54.2270583 ], [ -126.6229351, 54.2271281 ], [ -126.6228549, 54.2271893 ], [ -126.622820499999975, 54.227252 ], [ -126.6228178, 54.2273146 ], [ -126.622814600000012, 54.2273858 ], [ -126.622839399999975, 54.227467 ], [ -126.6228955, 54.2275496 ], [ -126.622969599999976, 54.2276223 ], [ -126.6230115, 54.2276693 ], [ -126.623041, 54.2277234 ], [ -126.6230365, 54.2277775 ], [ -126.6229552, 54.2278558 ], [ -126.6229214, 54.22791 ], [ -126.6229193, 54.2279641 ], [ -126.62288430000001, 54.2280353 ], [ -126.6227544, 54.2281407 ], [ -126.6226612, 54.2281563 ], [ -126.6225856, 54.2281635 ], [ -126.622478300000012, 54.2281706 ], [ -126.6223862, 54.2281692 ], [ -126.6222776, 54.2281663 ], [ -126.6221884, 54.2281293 ], [ -126.6220968, 54.2281264 ], [ -126.6219877, 54.228125 ], [ -126.621895599999988, 54.2281236 ], [ -126.6218052, 54.2281036 ], [ -126.6217165, 54.228065199999989 ], [ -126.6216435, 54.2280096 ], [ -126.6215542, 54.2279456 ], [ -126.6214359, 54.227853 ], [ -126.6213941, 54.2277989 ], [ -126.621339299999988, 54.2276992 ], [ -126.62133, 54.227581 ], [ -126.6213316, 54.2275283 ], [ -126.6213361, 54.2274741 ], [ -126.6213563, 54.2273759 ], [ -126.621422200000012, 54.2272861 ], [ -126.6215358, 54.2271993 ], [ -126.621648, 54.2271024 ], [ -126.6217621, 54.2270141 ], [ -126.621842699999974, 54.2269173 ], [ -126.6218754, 54.2268731 ], [ -126.62189450000001, 54.226819 ], [ -126.6219172, 54.2267207 ], [ -126.6218915, 54.226621 ], [ -126.621846799999986, 54.2265755 ], [ -126.6218191, 54.2265299 ], [ -126.621733600000013, 54.2264202 ], [ -126.6216325, 54.2263205 ], [ -126.6214407, 54.226181 ], [ -126.621380699999989, 54.2261439 ], [ -126.6212022, 54.226077 ], [ -126.621036, 54.2260029 ], [ -126.6209619, 54.2259645 ], [ -126.620886700000014, 54.225936 ], [ -126.6207375, 54.2258619 ], [ -126.620572, 54.2258135 ], [ -126.6204816, 54.2257936 ], [ -126.6204047, 54.2257836 ], [ -126.620238, 54.2257523 ], [ -126.6200701, 54.2257309 ], [ -126.6199012, 54.2257195 ], [ -126.6197498, 54.2257067 ], [ -126.619597199999987, 54.2256768 ], [ -126.61947570000001, 54.2256483 ], [ -126.6193718, 54.2256184 ], [ -126.6192366, 54.2255529 ], [ -126.6192112, 54.2254802 ], [ -126.6191816, 54.2254261 ], [ -126.6191562, 54.225353499999983 ], [ -126.619146, 54.2252723 ], [ -126.6191509, 54.2251826 ], [ -126.6192165, 54.2251213 ], [ -126.6193266, 54.2250786 ], [ -126.6194351, 54.2250544 ], [ -126.619526400000012, 54.2250373 ], [ -126.6196204, 54.2250402 ], [ -126.6197095, 54.2250501 ], [ -126.619832699999989, 54.225053 ], [ -126.6199564, 54.2250544 ], [ -126.6200791, 54.2250658 ], [ -126.6201853, 54.2250687 ], [ -126.6202762, 54.22508 ], [ -126.62036830000001, 54.2250815 ], [ -126.620505600000016, 54.2250929 ], [ -126.620629900000012, 54.2250857 ], [ -126.6207689, 54.2250715 ], [ -126.620892, 54.2250473 ], [ -126.620987, 54.2250131 ], [ -126.621081100000012, 54.2249604 ], [ -126.6211607, 54.2249077 ], [ -126.621194, 54.224855 ], [ -126.621229, 54.2247838 ], [ -126.621264499999981, 54.2247041 ], [ -126.6212865, 54.2246143 ], [ -126.6212915, 54.2245246 ], [ -126.6212805, 54.2244249 ], [ -126.621255100000013, 54.2243523 ], [ -126.6211707, 54.2241985 ], [ -126.6210993, 54.2240973 ], [ -126.6209841, 54.2239962 ], [ -126.6209705, 54.2239521 ], [ -126.6209139, 54.223878 ], [ -126.6208874, 54.2238154 ], [ -126.620799499999976, 54.2237057 ], [ -126.620731799999987, 54.2235875 ], [ -126.620690400000015, 54.2235049 ], [ -126.6206479, 54.2234322 ], [ -126.620606, 54.2233511 ], [ -126.6205812, 54.2232699 ], [ -126.6205679, 54.2231972 ], [ -126.620543599999976, 54.2231075 ], [ -126.620487699999984, 54.2230249 ], [ -126.6203983, 54.22296080000001 ], [ -126.620308799999989, 54.2229039 ], [ -126.620173899999983, 54.2228654 ], [ -126.6200835, 54.2228455 ], [ -126.619960899999981, 54.2228341 ], [ -126.6198548, 54.2228241 ], [ -126.6197461, 54.2228213 ], [ -126.6196254, 54.2228184 ], [ -126.6195164, 54.222844 ], [ -126.6194063, 54.2228868 ], [ -126.6192809, 54.222938 ], [ -126.619139099999984, 54.2229808 ], [ -126.6190154, 54.2230135 ], [ -126.61889069999998, 54.2230562 ], [ -126.6187799, 54.2231075 ], [ -126.6186546, 54.2231588 ], [ -126.6185433, 54.2232115 ], [ -126.6184332, 54.2232542 ], [ -126.6183095, 54.223287 ], [ -126.6182006, 54.2233126 ], [ -126.6181085, 54.2233112 ], [ -126.618000599999974, 54.2233269 ], [ -126.6178914, 54.2233325 ], [ -126.617784699999987, 54.2233311 ], [ -126.617648599999981, 54.2233098 ], [ -126.617526499999983, 54.2232898 ], [ -126.6173439, 54.2232414 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17055233, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 26622.746007496, "blue_line_key": 360856488, "length_metre": 438.692219617918, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5755901, 54.6267185 ], [ -126.575881099999989, 54.6267883 ], [ -126.576142800000014, 54.6267925 ], [ -126.5763002, 54.6267783 ], [ -126.576534799999976, 54.6267114 ], [ -126.576763199999988, 54.6265262 ], [ -126.5769224, 54.6264493 ], [ -126.577021099999982, 54.6263696 ], [ -126.577087399999982, 54.6262912 ], [ -126.5772208, 54.626131699999988 ], [ -126.5774034, 54.6259366 ], [ -126.5774831, 54.6259124 ], [ -126.577744799999977, 54.6259167 ], [ -126.5778979, 54.6259651 ], [ -126.5780958, 54.626005 ], [ -126.578206400000013, 54.6259622 ], [ -126.5783075, 54.6258469 ], [ -126.5783451, 54.625723 ], [ -126.578586800000011, 54.6255563 ], [ -126.578805699999975, 54.6255421 ], [ -126.5790112, 54.6254666 ], [ -126.5790903, 54.6254225 ], [ -126.5791748, 54.6253342 ], [ -126.579193800000013, 54.6252715 ], [ -126.579404, 54.6250963 ], [ -126.579486499999987, 54.6250351 ], [ -126.5796123, 54.6249838 ], [ -126.579707700000014, 54.6249496 ], [ -126.580053400000011, 54.624867 ], [ -126.580367099999989, 54.6247915 ], [ -126.5805102, 54.6247403 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17054034, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 0.0, "blue_line_key": 360851779, "length_metre": 96.869875166867303, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.522366, 54.6333994 ], [ -126.5222328, 54.6335219 ], [ -126.5220577, 54.6336088 ], [ -126.5219284, 54.6337057 ], [ -126.5219241, 54.6337683 ], [ -126.5218825, 54.6339463 ], [ -126.521878099999981, 54.634009 ], [ -126.5219625, 54.6341642 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17072022, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 662.95791378011404, "blue_line_key": 360881632, "length_metre": 88.673135695533006, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.64058630000001, 54.5367498 ], [ -126.6415174, 54.5361657 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17077989, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 217848.33855746899, "blue_line_key": 360873822, "length_metre": 726.14042229010499, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3431567, 54.5065252 ], [ -126.343098399999974, 54.5065793 ], [ -126.343065200000012, 54.507112 ], [ -126.3428597, 54.507347 ], [ -126.3418981, 54.508022 ], [ -126.341778100000013, 54.5080562 ], [ -126.3415296, 54.5080306 ], [ -126.341161399999976, 54.5078155 ], [ -126.341146900000012, 54.5076688 ], [ -126.3412521, 54.5075791 ], [ -126.3416771, 54.5075563 ], [ -126.341881199999975, 54.5074993 ], [ -126.341878399999985, 54.5071803 ], [ -126.3410491, 54.506951 ], [ -126.3404337, 54.5066092 ], [ -126.3391536, 54.5065038 ], [ -126.338620400000011, 54.5063742 ], [ -126.338266099999984, 54.5062104 ], [ -126.3382509, 54.5059057 ], [ -126.338616699999989, 54.5053274 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17063755, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 22423.072648497298, "blue_line_key": 360875378, "length_metre": 117.196385341801, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.681795799999989, 54.578909200000012 ], [ -126.6829356, 54.5797269 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17100394, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 22859.165567300799, "blue_line_key": 360881038, "length_metre": 235.02872160313501, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.079404900000014, 54.273365 ], [ -126.0794405, 54.2733209 ], [ -126.079472400000014, 54.2732938 ], [ -126.079489099999975, 54.2732682 ], [ -126.0795209, 54.2732411 ], [ -126.079641, 54.2730731 ], [ -126.0796475, 54.273001799999989 ], [ -126.0795453, 54.2729278 ], [ -126.079307700000015, 54.2728039 ], [ -126.0790098, 54.2726714 ], [ -126.078980699999988, 54.2726444 ], [ -126.078966699999981, 54.2726159 ], [ -126.0789376, 54.2725888 ], [ -126.078911100000013, 54.2725347 ], [ -126.0789162, 54.2724806 ], [ -126.0789887, 54.2723026 ], [ -126.0790655, 54.272106 ], [ -126.0790781, 54.271918 ], [ -126.0789839, 54.2717357 ], [ -126.0788812, 54.2716432 ], [ -126.0787027, 54.2715577 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102979, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 30145.622640454701, "blue_line_key": 360881038, "length_metre": 179.43566086301001, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.067488899999987, 54.2341423 ], [ -126.067451299999988, 54.2340255 ], [ -126.067422799999989, 54.233997 ], [ -126.0671948, 54.2339742 ], [ -126.067151, 54.2339543 ], [ -126.0671226, 54.2339187 ], [ -126.0671453, 54.233810500000011 ], [ -126.0670522, 54.2336196 ], [ -126.0669926, 54.2335826 ], [ -126.0667621, 54.2335669 ], [ -126.066717, 54.2335569 ], [ -126.066371699999976, 54.2334686 ], [ -126.0661931, 54.2333647 ], [ -126.065881600000012, 54.2332308 ], [ -126.0658391, 54.2331938 ], [ -126.0658247, 54.2331667 ], [ -126.065828200000013, 54.233104 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101166, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 25472.990522510401, "blue_line_key": 360881038, "length_metre": 53.793120195848502, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.070566500000012, 54.2604446 ], [ -126.0703476, 54.260296499999988 ], [ -126.0703358, 54.2602424 ], [ -126.070260800000014, 54.2600145 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17095256, "stream_order": 4, "gnis_name": "Dungate Creek", "downstream_route_measure": 0.0, "blue_line_key": 360760898, "length_metre": 11.570182270718201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6217139, 54.3603842 ], [ -126.6216877, 54.3604868 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17072195, "stream_order": 5, "gnis_name": "Richfield Creek", "downstream_route_measure": 4813.8626026662496, "blue_line_key": 360788426, "length_metre": 597.43838654919, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.318511, 54.5367156 ], [ -126.31848930000001, 54.5368053 ], [ -126.3185147, 54.5368865 ], [ -126.3188426, 54.5370916 ], [ -126.3190531, 54.537177 ], [ -126.319246699999979, 54.5372895 ], [ -126.319303699999978, 54.5373436 ], [ -126.3195839, 54.5375658 ], [ -126.319846899999987, 54.537788 ], [ -126.320080099999984, 54.5379902 ], [ -126.3203327, 54.5381583 ], [ -126.3204525, 54.5382153 ], [ -126.3206939, 54.5383107 ], [ -126.320875699999988, 54.5383591 ], [ -126.3212412, 54.5384574 ], [ -126.321437, 54.5385428 ], [ -126.3215233, 54.5386254 ], [ -126.3215747, 54.5387793 ], [ -126.321519599999988, 54.5389217 ], [ -126.321357800000015, 54.539025599999988 ], [ -126.3209922, 54.5392065 ], [ -126.3208967, 54.5392407 ], [ -126.3205357, 54.5393318 ], [ -126.3201424, 54.5394031 ], [ -126.3200493, 54.5394372 ], [ -126.319935499999985, 54.539488499999983 ], [ -126.319839799999983, 54.5395583 ], [ -126.319533400000012, 54.5397591 ], [ -126.319489300000015, 54.5399471 ], [ -126.3195306, 54.5400112 ], [ -126.3197056, 54.5401764 ], [ -126.3197136, 54.5402932 ], [ -126.319627699999984, 54.5404256 ], [ -126.3195462, 54.5404968 ], [ -126.3193704, 54.5405638 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17083530, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1377.00429122885, "blue_line_key": 360875052, "length_metre": 236.71515028018101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3358634, 54.4787246 ], [ -126.3383737, 54.4792445 ], [ -126.339124799999979, 54.4796233 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17087764, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 235846.81880964799, "blue_line_key": 360873822, "length_metre": 10.100124249339, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2334899, 54.4512502 ], [ -126.233493900000013, 54.4512046 ], [ -126.2334802, 54.4511605 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17075158, "stream_order": 4, "gnis_name": "Johnny David Creek", "downstream_route_measure": 705.77311782654795, "blue_line_key": 360866287, "length_metre": 87.909997703950097, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3685818, 54.5199968 ], [ -126.3684185, 54.5201193 ], [ -126.368378299999989, 54.5202617 ], [ -126.3684043, 54.5203343 ], [ -126.3685343, 54.520481 ], [ -126.3687311, 54.5205494 ], [ -126.3689199, 54.5205081 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17062202, "stream_order": 4, "gnis_name": "Richfield Creek", "downstream_route_measure": 16687.7861027201, "blue_line_key": 360788426, "length_metre": 954.74452111143898, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2171058, 54.5881865 ], [ -126.2169829, 54.5881936 ], [ -126.2168596, 54.5881808 ], [ -126.2165511, 54.5881566 ], [ -126.216227800000013, 54.5881395 ], [ -126.2159334, 54.5881238 ], [ -126.215702, 54.5881181 ], [ -126.215362299999981, 54.5881196 ], [ -126.2150682, 54.588131 ], [ -126.2149277, 54.5881181 ], [ -126.2146501, 54.5881039 ], [ -126.2145115, 54.5880996 ], [ -126.2142642, 54.5881039 ], [ -126.2140311, 54.5881167 ], [ -126.21381, 54.5881651 ], [ -126.213637, 54.5882235 ], [ -126.2132577, 54.5883232 ], [ -126.2129907, 54.5883973 ], [ -126.212741200000011, 54.5884286 ], [ -126.2126163, 54.5884343 ], [ -126.2122891, 54.5884628 ], [ -126.212182, 54.58846 ], [ -126.2119008, 54.5884628 ], [ -126.2115155, 54.5884542 ], [ -126.2112692, 54.5884486 ], [ -126.2109254, 54.5884756 ], [ -126.210847, 54.5885098 ], [ -126.2105545, 54.5886835 ], [ -126.210425, 54.588779 ], [ -126.2101653, 54.5889712 ], [ -126.2099202, 54.5891364 ], [ -126.2096613, 54.5892917 ], [ -126.2094703, 54.5893871 ], [ -126.2091371, 54.5894954 ], [ -126.209009200000011, 54.5895651 ], [ -126.2089272, 54.5896164 ], [ -126.208713199999977, 54.5898186 ], [ -126.2085989, 54.5899055 ], [ -126.2085033, 54.589939699999981 ], [ -126.2081903, 54.5899767 ], [ -126.207911599999989, 54.5899796 ], [ -126.2077886, 54.589986700000011 ], [ -126.2076779, 54.5900009 ], [ -126.2073521, 54.5900394 ], [ -126.2071283, 54.5901234 ], [ -126.206952, 54.5902189 ], [ -126.2066959, 54.5903385 ], [ -126.2064638, 54.5903413 ], [ -126.206077400000012, 54.5903428 ], [ -126.205721, 54.5903428 ], [ -126.205410799999981, 54.5903442 ], [ -126.2050224, 54.5903442 ], [ -126.2048043, 54.5903841 ], [ -126.2045531, 54.590441 ], [ -126.2044427, 54.5904752 ], [ -126.2041101, 54.5905749 ], [ -126.203872, 54.5906504 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17079086, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 6762.6137265869502, "blue_line_key": 360869846, "length_metre": 196.44460929847099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.584079199999977, 54.4983445 ], [ -126.5842605, 54.4983944 ], [ -126.5844109, 54.498477 ], [ -126.5845446, 54.4985795 ], [ -126.5846858, 54.4987803 ], [ -126.584817499999986, 54.4989171 ], [ -126.585010399999987, 54.4990467 ], [ -126.585338, 54.4992688 ], [ -126.5856708, 54.4993842 ], [ -126.5859884, 54.4994796 ], [ -126.5861531, 54.4995637 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17090126, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 183639.18167436699, "blue_line_key": 360873822, "length_metre": 915.06742071185704, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6025483, 54.4311119 ], [ -126.6023702, 54.4312928 ], [ -126.60206740000001, 54.4314523 ], [ -126.6016691, 54.4313867 ], [ -126.600082699999987, 54.4309082 ], [ -126.599411800000013, 54.4308171 ], [ -126.5988644, 54.4307929 ], [ -126.598191300000011, 54.4308555 ], [ -126.597602400000014, 54.431035 ], [ -126.5973632, 54.4312856 ], [ -126.5974553, 54.431485 ], [ -126.597693299999989, 54.4315961 ], [ -126.5984354, 54.4316445 ], [ -126.5987422, 54.4317969 ], [ -126.5988118, 54.4319977 ], [ -126.5987409, 54.4322014 ], [ -126.59854150000001, 54.4324293 ], [ -126.5972586, 54.4332582 ], [ -126.5966044, 54.4337794 ], [ -126.5965943, 54.4340472 ], [ -126.5971444, 54.43455560000001 ], [ -126.597226100000015, 54.4348974 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17092797, "stream_order": 5, "gnis_name": "Bulkley River", "downstream_route_measure": 268827.842284418, "blue_line_key": 360873822, "length_metre": 1298.8136427347599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0751856, 54.4043353 ], [ -126.0748266, 54.4044079 ], [ -126.0745275, 54.4044906 ], [ -126.074404799999982, 54.4046942 ], [ -126.0744243, 54.4048566 ], [ -126.0745167, 54.4050745 ], [ -126.074535, 54.4052539 ], [ -126.074642699999984, 54.405463300000015 ], [ -126.07486320000001, 54.4056313 ], [ -126.0749961, 54.4056969 ], [ -126.0752154, 54.405882 ], [ -126.0752252, 54.4059632 ], [ -126.0751631, 54.4061683 ], [ -126.0748254, 54.4063577 ], [ -126.0745086, 54.406503 ], [ -126.0741261, 54.4066739 ], [ -126.0738999, 54.406812 ], [ -126.0739281, 54.4070655 ], [ -126.0740217, 54.4072464 ], [ -126.0741, 54.4074558 ], [ -126.074172899999979, 54.407727799999989 ], [ -126.0743149, 54.4079101 ], [ -126.0745195, 54.4080682 ], [ -126.0747694, 54.4082362 ], [ -126.0749894, 54.4083858 ], [ -126.0751952, 54.4085339 ], [ -126.0752533, 54.4088059 ], [ -126.0752851, 54.4089953 ], [ -126.0753187, 54.4091933 ], [ -126.0753051, 54.4093727 ], [ -126.075234, 54.4094881 ], [ -126.0751654, 54.4096035 ], [ -126.0751205, 54.4098086 ], [ -126.0751598, 54.4098826 ], [ -126.0752798, 54.4099567 ], [ -126.075606399999984, 54.4101091 ], [ -126.0757013, 54.4102999 ], [ -126.07568040000001, 54.4103711 ], [ -126.0754714, 54.4105093 ], [ -126.0752116, 54.4106659 ], [ -126.074905699999988, 54.4108553 ], [ -126.0746317, 54.4110376 ], [ -126.0746452, 54.4110747 ], [ -126.074677, 54.4112641 ], [ -126.074709399999975, 54.411445 ], [ -126.075037200000011, 54.4116144 ], [ -126.0752743, 54.411764 ], [ -126.075542700000014, 54.4118608 ], [ -126.075881, 54.4118865 ], [ -126.0762181, 54.4119221 ], [ -126.076596099999989, 54.4120203 ], [ -126.0768792, 54.4121443 ], [ -126.0770539, 54.4123109 ], [ -126.077351, 54.4124433 ], [ -126.0777004, 54.4125331 ], [ -126.0780184, 54.4125943 ], [ -126.0783242, 54.4126555 ], [ -126.0786079, 54.4127709 ], [ -126.0787433, 54.412809400000015 ], [ -126.0790724, 54.4129617 ], [ -126.079266, 54.4130557 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102790, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 29880.318083759499, "blue_line_key": 360881038, "length_metre": 109.90463684023101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.068822199999985, 54.2354882 ], [ -126.068520799999973, 54.2353999 ], [ -126.068475, 54.2353984 ], [ -126.0684299, 54.2353885 ], [ -126.068231700000013, 54.2353842 ], [ -126.0681528, 54.2353999 ], [ -126.068107, 54.2353984 ], [ -126.067871700000012, 54.2354554 ], [ -126.0677185, 54.2354611 ], [ -126.06761250000001, 54.2354312 ], [ -126.0675701, 54.2353942 ], [ -126.0675445, 54.2353044 ], [ -126.0675227, 54.2352048 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091620, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 16557.487307398002, "blue_line_key": 360862508, "length_metre": 73.350639125289703, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.354124700000014, 54.4172045 ], [ -126.352992499999985, 54.4171797 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17090500, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 182650.95961014001, "blue_line_key": 360873822, "length_metre": 988.222064227293, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.606423, 54.4269546 ], [ -126.6060368, 54.4270443 ], [ -126.605015400000013, 54.4271298 ], [ -126.6041442, 54.4272765 ], [ -126.603097299999988, 54.427604 ], [ -126.6018508, 54.4278789 ], [ -126.6003732, 54.4283603 ], [ -126.599104, 54.4285882 ], [ -126.5988199, 54.4287078 ], [ -126.59849, 54.4289798 ], [ -126.598278, 54.429286 ], [ -126.5982984, 54.4294242 ], [ -126.5984237, 54.4295495 ], [ -126.5989161, 54.429682 ], [ -126.6001663, 54.4297831 ], [ -126.6009223, 54.4299953 ], [ -126.6023943, 54.4306333 ], [ -126.6026424, 54.4308911 ], [ -126.6025483, 54.4311119 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17068836, "stream_order": 4, "gnis_name": "Johnny David Creek", "downstream_route_measure": 5831.0274496036, "blue_line_key": 360866287, "length_metre": 168.464859025999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4103936, 54.5525542 ], [ -126.4105388, 54.5527009 ], [ -126.4106059, 54.5528462 ], [ -126.4105679, 54.55299 ], [ -126.4105176, 54.5530427 ], [ -126.4105232, 54.5531951 ], [ -126.410547900000012, 54.5532862 ], [ -126.410649, 54.5534045 ], [ -126.4107019, 54.5535412 ], [ -126.4107401, 54.553685 ], [ -126.4107735, 54.553884399999987 ], [ -126.410849, 54.553921499999987 ], [ -126.410955, 54.5539414 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17089846, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 276173.947785103, "blue_line_key": 360873822, "length_metre": 298.90165734800303, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.140484500000014, 54.4346525 ], [ -126.1405045, 54.434814800000012 ], [ -126.1407019, 54.4350897 ], [ -126.1408911, 54.4352378 ], [ -126.1412596, 54.435507 ], [ -126.141491699999989, 54.4356921 ], [ -126.1417117, 54.4358773 ], [ -126.1419899, 54.4360909 ], [ -126.1421927, 54.436249 ], [ -126.1423972, 54.4364156 ], [ -126.1426578, 54.4366649 ], [ -126.1428011, 54.4368386 ], [ -126.1428258, 54.4369198 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17068165, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 10754.1902796124, "blue_line_key": 360875378, "length_metre": 833.96575524143805, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5668552, 54.5555522 ], [ -126.5672266, 54.5555507 ], [ -126.567427400000014, 54.555545 ], [ -126.567766799999987, 54.5555436 ], [ -126.5678906, 54.555555 ], [ -126.5679962, 54.555583500000012 ], [ -126.568070299999988, 54.555639 ], [ -126.568180399999989, 54.5556333 ], [ -126.5683985, 54.555592 ], [ -126.5684938, 54.5555579 ], [ -126.568634799999984, 54.5555337 ], [ -126.568914299999989, 54.5554852 ], [ -126.569215399999976, 54.5553741 ], [ -126.5693702, 54.5553599 ], [ -126.5696207, 54.5553385 ], [ -126.5697794, 54.5552417 ], [ -126.5698894, 54.555236 ], [ -126.5700908, 54.5552218 ], [ -126.5704012, 54.5552189 ], [ -126.5706154, 54.5552317 ], [ -126.5709572, 54.5552303 ], [ -126.5710633, 54.555250199999989 ], [ -126.5713231, 54.5553086 ], [ -126.5716241, 54.555432499999988 ], [ -126.5720018, 54.5556191 ], [ -126.5721079, 54.555639 ], [ -126.5724281, 54.5557359 ], [ -126.5726589, 54.5557501 ], [ -126.5729207, 54.5557459 ], [ -126.573277300000015, 54.5557444 ], [ -126.5735391, 54.5557402 ], [ -126.5738029, 54.5557373 ], [ -126.574174699999986, 54.5557345 ], [ -126.574546, 54.555733 ], [ -126.574847600000012, 54.555884 ], [ -126.5751226, 54.5559339 ], [ -126.575258099999985, 54.5559823 ], [ -126.57559209999998, 54.5560962 ], [ -126.5758067, 54.5561361 ], [ -126.5759261, 54.5561745 ], [ -126.5762974, 54.5561731 ], [ -126.5766393, 54.5561717 ], [ -126.5769792, 54.5561689 ], [ -126.5772277, 54.5561745 ], [ -126.577318600000012, 54.556203 ], [ -126.5774364, 54.556295600000013 ], [ -126.577492399999983, 54.5563682 ], [ -126.5775533, 54.5564053 ], [ -126.5776437, 54.5564423 ], [ -126.577841600000013, 54.5565092 ], [ -126.5779639, 54.5565391 ], [ -126.578285600000015, 54.5565819 ], [ -126.5784806, 54.5566574 ], [ -126.5786039, 54.5566773 ], [ -126.5787429, 54.5566801 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092497, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 9564.4561178233107, "blue_line_key": 360862508, "length_metre": 801.35428919835397, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4440116, 54.410354 ], [ -126.4437244, 54.41029420000001 ], [ -126.4435092, 54.41028 ], [ -126.4432333, 54.4102572 ], [ -126.4430794, 54.4102358 ], [ -126.442973599999988, 54.4101888 ], [ -126.442706, 54.4100663 ], [ -126.4423784, 54.409878299999988 ], [ -126.442136300000016, 54.4098014 ], [ -126.4418046, 54.4096875 ], [ -126.4416052, 54.4096562 ], [ -126.4413592, 54.409632 ], [ -126.4411914, 54.4096291 ], [ -126.4408061, 54.4096391 ], [ -126.4404649, 54.409649 ], [ -126.4401738, 54.4096348 ], [ -126.4399121, 54.409620599999982 ], [ -126.4396498, 54.4096149 ], [ -126.4394171, 54.40963619999998 ], [ -126.439152900000011, 54.4096846 ], [ -126.4389346, 54.4097345 ], [ -126.438592, 54.40979 ], [ -126.4384837, 54.4098057 ], [ -126.4381424, 54.4098157 ], [ -126.4378901, 54.4096846 ], [ -126.4378314, 54.4096291 ], [ -126.437775499999987, 54.4095379 ], [ -126.4376265, 54.4094539 ], [ -126.4373704, 54.4093685 ], [ -126.4372815, 54.4092944 ], [ -126.437258, 54.4091947 ], [ -126.4372639, 54.4090879 ], [ -126.4373312, 54.4090081 ], [ -126.4372878, 54.4089441 ], [ -126.43718389999998, 54.4089056 ], [ -126.437015800000012, 54.4088757 ], [ -126.4367552, 54.4088515 ], [ -126.436665499999975, 54.4088145 ], [ -126.4364764, 54.4086293 ], [ -126.4363355, 54.4084114 ], [ -126.436261, 54.4083729 ], [ -126.4361719, 54.4083274 ], [ -126.4358202, 54.4082562 ], [ -126.435686100000012, 54.4081992 ], [ -126.435583099999988, 54.4081166 ], [ -126.435556799999986, 54.4080525 ], [ -126.435484, 54.4079884 ], [ -126.4352874, 54.4079215 ], [ -126.435000599999981, 54.4078261 ], [ -126.4348045, 54.4077577 ], [ -126.4346259, 54.4076466 ], [ -126.4344163, 54.4075611 ], [ -126.4342782, 54.4075227 ], [ -126.4341715, 54.40751980000001 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17096470, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 11356.053019398099, "blue_line_key": 360881038, "length_metre": 133.54543449718599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.155540300000013, 54.3380241 ], [ -126.1555244, 54.3380142 ], [ -126.155490299999983, 54.3378518 ], [ -126.1555016, 54.3376723 ], [ -126.1555, 54.3374744 ], [ -126.1555143, 54.3372864 ], [ -126.1555089, 54.3371326 ], [ -126.155298, 54.3370742 ], [ -126.1550387, 54.3370414 ], [ -126.1550221, 54.33704 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17094550, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 1584.1534855294699, "blue_line_key": 360886524, "length_metre": 368.978712276956, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1573854, 54.3785714 ], [ -126.1574184, 54.3785543 ], [ -126.1575182, 54.3784403 ], [ -126.1574857, 54.378259500000013 ], [ -126.1572383, 54.3782538 ], [ -126.157218, 54.378127 ], [ -126.157362499999977, 54.378031599999986 ], [ -126.1574328, 54.3778977 ], [ -126.157535, 54.3777567 ], [ -126.157651300000012, 54.3776513 ], [ -126.157854, 54.3775844 ], [ -126.158075, 54.3775274 ], [ -126.1581681, 54.3775203 ], [ -126.15835, 54.3775516 ], [ -126.158568500000015, 54.3775288 ], [ -126.1587436, 54.3774434 ], [ -126.1589615, 54.377395 ], [ -126.1591728, 54.3774534 ], [ -126.159303899999983, 54.3775645 ], [ -126.1594111, 54.3775858 ], [ -126.159564699999976, 54.3775801 ], [ -126.159596499999978, 54.3775531 ], [ -126.1596963, 54.3774662 ], [ -126.159827299999989, 54.3773608 ], [ -126.1600599, 54.3773394 ], [ -126.160333099999974, 54.3773821 ], [ -126.160567500000013, 54.3773423 ], [ -126.1607555, 54.3772753 ], [ -126.1608057, 54.3772312 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17104474, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 22830.040298916199, "blue_line_key": 360877225, "length_metre": 90.939551048299506, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.272787, 54.2131181 ], [ -126.2729089, 54.2131381 ], [ -126.2729521, 54.2131936 ], [ -126.27290690000001, 54.2133987 ], [ -126.2729317, 54.2134713 ], [ -126.2731126, 54.2135297 ], [ -126.273345599999985, 54.2134984 ], [ -126.273563599999989, 54.2134414 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17106572, "stream_order": 4, "gnis_name": "Buck Creek", "downstream_route_measure": 60500.864452250302, "blue_line_key": 360886221, "length_metre": 1065.3090733839099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4085109, 54.1811033 ], [ -126.406855, 54.1808837 ], [ -126.405830900000012, 54.1805096 ], [ -126.4031188, 54.179118 ], [ -126.396003600000014, 54.1783097 ], [ -126.3934169, 54.1784158 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17092834, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 176009.722227992, "blue_line_key": 360873822, "length_metre": 395.56716799590799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6526673, 54.4041559 ], [ -126.651083199999988, 54.404151600000013 ], [ -126.6506862, 54.4040832 ], [ -126.650522200000012, 54.4039921 ], [ -126.650290899999987, 54.4037215 ], [ -126.649939499999988, 54.4030863 ], [ -126.6494617, 54.4026733 ], [ -126.649188, 54.4024967 ], [ -126.6489657, 54.4024255 ], [ -126.6482751, 54.4024482 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17095025, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 5293.8192435679903, "blue_line_key": 360886221, "length_metre": 817.85967017309099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.628553299999979, 54.3712452 ], [ -126.6286332, 54.3710658 ], [ -126.6288095, 54.370939 ], [ -126.6294384, 54.3706998 ], [ -126.6294748, 54.3704975 ], [ -126.6293829, 54.3702568 ], [ -126.6290497, 54.3698253 ], [ -126.6286202, 54.3695504 ], [ -126.62787130000001, 54.369371 ], [ -126.6268834, 54.3693154 ], [ -126.6266002, 54.3692585 ], [ -126.6262051, 54.3688782 ], [ -126.6261149, 54.3687586 ], [ -126.626081899999988, 54.3684894 ], [ -126.6261793, 54.3679382 ], [ -126.6262743, 54.3678414 ], [ -126.6265165, 54.367736 ], [ -126.6270455, 54.3675936 ], [ -126.627235500000012, 54.3672461 ], [ -126.627218899999988, 54.3669299 ], [ -126.6271133, 54.3667846 ], [ -126.6268118, 54.366598 ], [ -126.6254875, 54.3661138 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17105284, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 2869.70151014155, "blue_line_key": 360880905, "length_metre": 529.03015412888897, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.412136699999976, 54.1987607 ], [ -126.4132392, 54.1990526 ], [ -126.4137178, 54.199272 ], [ -126.4136478, 54.1994258 ], [ -126.413139, 54.1996152 ], [ -126.4118037, 54.1997263 ], [ -126.4112832, 54.1998872 ], [ -126.4111925, 54.2000581 ], [ -126.411299599999978, 54.2006805 ], [ -126.4103979, 54.201075 ], [ -126.4102536, 54.2012188 ], [ -126.4101188, 54.2016205 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101396, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 16341.5051281702, "blue_line_key": 360880905, "length_metre": 95.690532582775603, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3960013, 54.2553758 ], [ -126.395921499999986, 54.2554285 ], [ -126.3958868, 54.2554912 ], [ -126.39592, 54.2556977 ], [ -126.396094299999987, 54.2558643 ], [ -126.396104200000011, 54.2559185 ], [ -126.396036, 54.2560338 ], [ -126.3959549, 54.2561036 ], [ -126.3958903, 54.2561478 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101466, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 15935.044127508199, "blue_line_key": 360880905, "length_metre": 131.51992946881401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4017038, 54.2543219 ], [ -126.4016403, 54.254329 ], [ -126.4015171, 54.2543533 ], [ -126.4013773, 54.2543689 ], [ -126.401238799999987, 54.2543746 ], [ -126.4011015, 54.2543632 ], [ -126.400964699999975, 54.2543504 ], [ -126.4008267, 54.2543476 ], [ -126.4006882, 54.2543533 ], [ -126.400596, 54.2543518 ], [ -126.400486199999989, 54.2543589 ], [ -126.4001456, 54.2544045 ], [ -126.4000365, 54.2544302 ], [ -126.4000059, 54.2544472 ], [ -126.3998674, 54.2544529 ], [ -126.3997277, 54.2544686 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17097988, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 16195.160458464199, "blue_line_key": 360886524, "length_metre": 536.66880581456303, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2618527, 54.3186819 ], [ -126.261811099999989, 54.3186278 ], [ -126.261814699999988, 54.3185637 ], [ -126.2617462, 54.3184555 ], [ -126.2617327, 54.3183914 ], [ -126.261603, 54.3182632 ], [ -126.2615785, 54.318182 ], [ -126.2616052, 54.3180197 ], [ -126.2616071, 54.317967 ], [ -126.2616076, 54.317742 ], [ -126.261512099999976, 54.3175597 ], [ -126.2614166, 54.3173774 ], [ -126.2612605, 54.3171666 ], [ -126.261252599999978, 54.3170868 ], [ -126.261288, 54.3170156 ], [ -126.2613387, 54.3169359 ], [ -126.2614419, 54.3167578 ], [ -126.2614638, 54.3166766 ], [ -126.261490599999988, 54.3164801 ], [ -126.261469199999979, 54.3163633 ], [ -126.2613394, 54.3162423 ], [ -126.2612557, 54.3161155 ], [ -126.261007399999983, 54.3159033 ], [ -126.2609711, 54.3157395 ], [ -126.2609093, 54.3155316 ], [ -126.260903200000016, 54.3154063 ], [ -126.2608199, 54.315251 ], [ -126.260601, 54.3150929 ], [ -126.2602598, 54.3148878 ], [ -126.2601747, 54.3147782 ], [ -126.260064, 54.3146044 ], [ -126.260067, 54.3145418 ], [ -126.2601838, 54.3144278 ], [ -126.2603579, 54.3143239 ], [ -126.2604233, 54.3142712 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17075899, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 214608.754765408, "blue_line_key": 360873822, "length_metre": 105.155384957587, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3771961, 54.5162764 ], [ -126.3756905, 54.5159178 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076362, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 0.0, "blue_line_key": 360875378, "length_metre": 19.930551329179501, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4629314, 54.5130908 ], [ -126.4631142, 54.5132346 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17084384, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 2074.30835650578, "blue_line_key": 360869846, "length_metre": 2040.0638127017401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.538854, 54.4734379 ], [ -126.5389811, 54.4733967 ], [ -126.5390734, 54.473371 ], [ -126.5393884, 54.473297 ], [ -126.5394968, 54.4732813 ], [ -126.5398539, 54.4732343 ], [ -126.5401005, 54.47323 ], [ -126.540443200000013, 54.4732101 ], [ -126.5407961, 54.4732172 ], [ -126.5411195, 54.4732599 ], [ -126.5412237, 54.4732984 ], [ -126.54137870000001, 54.4732827 ], [ -126.541593800000015, 54.4733055 ], [ -126.541718300000014, 54.4732998 ], [ -126.541998799999988, 54.47326850000001 ], [ -126.5423717, 54.4732044 ], [ -126.542561100000015, 54.473146 ], [ -126.542779, 54.4731047 ], [ -126.54316630000001, 54.4730762 ], [ -126.5435222, 54.4730748 ], [ -126.54372, 54.4731332 ], [ -126.543974899999981, 54.4732457 ], [ -126.544203199999984, 54.473287 ], [ -126.5443246, 54.4733254 ], [ -126.5446124, 54.4734209 ], [ -126.5448249, 54.4734793 ], [ -126.545103200000014, 54.4735035 ], [ -126.5453456, 54.4735533 ], [ -126.5456067, 54.4735846 ], [ -126.5458994, 54.4735818 ], [ -126.546209199999979, 54.4735789 ], [ -126.54631710000001, 54.4735718 ], [ -126.546673, 54.4735704 ], [ -126.546795499999973, 54.4735918 ], [ -126.5470718, 54.4736146 ], [ -126.5474069, 54.4736658 ], [ -126.5476989, 54.4737 ], [ -126.547960099999983, 54.4737313 ], [ -126.5481595, 54.4737356 ], [ -126.5483568, 54.4738025 ], [ -126.5484882, 54.4739037 ], [ -126.548771300000013, 54.4740902 ], [ -126.5491, 54.4742583 ], [ -126.5494057, 54.4743096 ], [ -126.549665300000015, 54.4743594 ], [ -126.549981300000013, 54.4745004 ], [ -126.550131, 54.4745844 ], [ -126.5503539, 54.4747326 ], [ -126.550590899999989, 54.4749177 ], [ -126.5507835, 54.4750473 ], [ -126.550904, 54.4750672 ], [ -126.551106, 54.4750715 ], [ -126.5513672, 54.4750957 ], [ -126.5515488, 54.4751442 ], [ -126.551803799999973, 54.4752567 ], [ -126.5519696, 54.4753507 ], [ -126.552250699999988, 54.4755358 ], [ -126.5523936, 54.4757096 ], [ -126.5524977, 54.4757836 ], [ -126.5528263, 54.4759873 ], [ -126.553172300000014, 54.4761482 ], [ -126.5534524, 54.4763505 ], [ -126.5536481, 54.4764359 ], [ -126.5537387, 54.4764644 ], [ -126.553847, 54.4764843 ], [ -126.553921800000012, 54.4765228 ], [ -126.554203500000014, 54.4766994 ], [ -126.554324400000013, 54.4767464 ], [ -126.554650900000013, 54.4769771 ], [ -126.5549771, 54.4771737 ], [ -126.5551844, 54.4773389 ], [ -126.5553429, 54.4775311 ], [ -126.5555052, 54.4776422 ], [ -126.5556947, 54.4778445 ], [ -126.5559171, 54.4780011 ], [ -126.5561375, 54.4781848 ], [ -126.556224, 54.4782674 ], [ -126.556443699999988, 54.4784882 ], [ -126.55653, 54.4786064 ], [ -126.556580900000014, 54.4787702 ], [ -126.5565997, 54.4789767 ], [ -126.5566866, 54.4790864 ], [ -126.556760399999987, 54.4791419 ], [ -126.5570467, 54.4792558 ], [ -126.557288700000015, 54.4793142 ], [ -126.5573782, 54.4793883 ], [ -126.5574174, 54.4795151 ], [ -126.557331, 54.479657499999988 ], [ -126.5573259, 54.4797287 ], [ -126.557329, 54.4799452 ], [ -126.5573699, 54.4800178 ], [ -126.5575321, 54.4801645 ], [ -126.5577415, 54.480267 ], [ -126.557941500000013, 54.4802984 ], [ -126.5580483, 54.4803012 ], [ -126.558331, 54.4802428 ], [ -126.5584531, 54.480237099999989 ], [ -126.558666100000011, 54.480287 ], [ -126.558741, 54.48033250000001 ], [ -126.5587672, 54.4804052 ], [ -126.558777, 54.4805319 ], [ -126.558771299999989, 54.4806117 ], [ -126.55873720000001, 54.4806744 ], [ -126.5585111, 54.480831 ], [ -126.5582405, 54.4809606 ], [ -126.5580043, 54.4810546 ], [ -126.557924700000015, 54.4811073 ], [ -126.5579054, 54.48117 ], [ -126.5579144, 54.4812426 ], [ -126.557974, 54.4812967 ], [ -126.558046299999987, 54.4813708 ], [ -126.558105399999988, 54.4814263 ], [ -126.5582389, 54.481536 ], [ -126.5582803, 54.4816001 ], [ -126.558306, 54.4816813 ], [ -126.5583578, 54.4818707 ], [ -126.5584715, 54.4820088 ], [ -126.558650500000013, 54.4821285 ], [ -126.5588244, 54.4823122 ], [ -126.559003499999974, 54.4823962 ], [ -126.5592475, 54.482456 ], [ -126.5593842, 54.482486 ], [ -126.559709099999978, 54.4825102 ], [ -126.559815, 54.4825301 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17092680, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 251254.92583951401, "blue_line_key": 360873822, "length_metre": 206.37257058183201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1885665, 54.4065984 ], [ -126.188322, 54.4065841 ], [ -126.1880232, 54.4066667 ], [ -126.187899499999986, 54.406691 ], [ -126.1875747, 54.4066824 ], [ -126.1874539, 54.406644 ], [ -126.1873662, 54.4065884 ], [ -126.187227199999981, 54.4063691 ], [ -126.187052799999989, 54.406221 ], [ -126.186753, 54.4060885 ], [ -126.186296399999989, 54.4060244 ], [ -126.1859739, 54.4059888 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17105038, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 7908.3255207320999, "blue_line_key": 360882583, "length_metre": 83.807724704764695, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.9683099, 54.2045287 ], [ -125.968247499999976, 54.204513 ], [ -125.9680878, 54.2044447 ], [ -125.9678312, 54.2042894 ], [ -125.9677694, 54.2042723 ], [ -125.967722900000012, 54.2042467 ], [ -125.9676581, 54.2042311 ], [ -125.9676121, 54.204204 ], [ -125.9675631, 54.2041784 ], [ -125.9672962, 54.2040772 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17105368, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 38539.929571699497, "blue_line_key": 360886221, "length_metre": 1289.8542081165899, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5693814, 54.2032241 ], [ -126.5693034, 54.2032313 ], [ -126.5691968, 54.2032298 ], [ -126.5690882, 54.203227 ], [ -126.568983300000014, 54.203207 ], [ -126.568892299999973, 54.2031686 ], [ -126.5687879, 54.203113 ], [ -126.568684599999983, 54.2030475 ], [ -126.568612500000015, 54.202983400000015 ], [ -126.5685985, 54.2029749 ], [ -126.5685233, 54.2029193 ], [ -126.568465800000013, 54.2028553 ], [ -126.568379400000012, 54.2027627 ], [ -126.568290300000015, 54.202725699999988 ], [ -126.568248, 54.202653 ], [ -126.5681599, 54.202579 ], [ -126.5680719, 54.2025049 ], [ -126.5679991, 54.2024494 ], [ -126.567883, 54.2023312 ], [ -126.5678119, 54.2022571 ], [ -126.5677837, 54.2022201 ], [ -126.567668699999984, 54.2020919 ], [ -126.567611199999973, 54.202027799999982 ], [ -126.5675525, 54.2019737 ], [ -126.5674362, 54.2018626 ], [ -126.5673036, 54.20177 ], [ -126.5672444, 54.2017244 ], [ -126.5671851, 54.2016789 ], [ -126.5670702, 54.2015777 ], [ -126.5669674, 54.2014766 ], [ -126.566909900000013, 54.2014125 ], [ -126.5668688, 54.201357 ], [ -126.5667673, 54.2012388 ], [ -126.566665699999987, 54.2011548 ], [ -126.566559, 54.2011263 ], [ -126.566465799999989, 54.2011419 ], [ -126.566370299999974, 54.2012117 ], [ -126.566257799999974, 54.2012815 ], [ -126.566148899999988, 54.2013342 ], [ -126.5660557, 54.2013499 ], [ -126.565947099999988, 54.201347 ], [ -126.5658275, 54.2013 ], [ -126.5657256, 54.2012445 ], [ -126.5656521, 54.2011704 ], [ -126.565624399999976, 54.2010978 ], [ -126.5656772, 54.201018 ], [ -126.56574040000001, 54.2009568 ], [ -126.5658213, 54.2009141 ], [ -126.5658833, 54.2008699 ], [ -126.5660117, 54.200783 ], [ -126.566044399999981, 54.2007389 ], [ -126.5660502, 54.2006748 ], [ -126.565993299999988, 54.2006022 ], [ -126.5659035, 54.2005466 ], [ -126.565721200000013, 54.2005253 ], [ -126.5656133, 54.2005139 ], [ -126.565445, 54.200501 ], [ -126.565307799999985, 54.2004897 ], [ -126.565157700000015, 54.2004327 ], [ -126.5649254, 54.2002304 ], [ -126.56488419999998, 54.2001478 ], [ -126.5648731, 54.2000766 ], [ -126.564938, 54.1999969 ], [ -126.5650657, 54.1999185 ], [ -126.565238, 54.1998587 ], [ -126.565347499999973, 54.1998245 ], [ -126.5654268, 54.1998003 ], [ -126.5655656, 54.1997662 ], [ -126.5657198, 54.1997434 ], [ -126.565845700000011, 54.1997177 ], [ -126.566001700000015, 54.199676399999987 ], [ -126.5660936, 54.199650800000015 ], [ -126.5661862, 54.1996437 ], [ -126.5662642, 54.199636600000012 ], [ -126.566355699999988, 54.1996394 ], [ -126.5665397, 54.1996422 ], [ -126.5666798, 54.199618 ], [ -126.5667736, 54.1995668 ], [ -126.5668239, 54.199487 ], [ -126.5668432, 54.1994329 ], [ -126.566844800000013, 54.1993873 ], [ -126.5668642, 54.1993261 ], [ -126.566884, 54.1992363 ], [ -126.5668587, 54.1991637 ], [ -126.566754800000012, 54.1991067 ], [ -126.5666346, 54.1990683 ], [ -126.5665279, 54.1990398 ], [ -126.56644, 54.1989928 ], [ -126.5663525, 54.1989102 ], [ -126.5663408, 54.1988475 ], [ -126.5663471, 54.1987478 ], [ -126.5663541, 54.1986325 ], [ -126.5663574, 54.1985684 ], [ -126.5663762, 54.1985157 ], [ -126.5663966, 54.1984174 ], [ -126.566386600000016, 54.1983362 ], [ -126.5663138, 54.1982807 ], [ -126.5662388, 54.1982522 ], [ -126.5661279, 54.1982764 ], [ -126.5660483, 54.1983291 ], [ -126.565968, 54.1983904 ], [ -126.5658743, 54.1984416 ], [ -126.565779299999988, 54.1984758 ], [ -126.5656551, 54.19851 ], [ -126.5655138, 54.1985513 ], [ -126.5654043, 54.1985855 ], [ -126.5652174, 54.1986453 ], [ -126.5650774, 54.1986966 ], [ -126.564939, 54.1987023 ], [ -126.5647866, 54.1986724 ], [ -126.5646358, 54.1986239 ], [ -126.5645168, 54.1985684 ], [ -126.564414199999987, 54.1984943 ], [ -126.564341399999989, 54.1984117 ], [ -126.5643008, 54.1983206 ], [ -126.5642785, 54.1982123 ], [ -126.564266100000012, 54.1981582 ], [ -126.564269, 54.1980956 ], [ -126.5642612, 54.1979603 ], [ -126.5642711, 54.1978164 ], [ -126.56427570000001, 54.1977352 ], [ -126.564293099999986, 54.1976726 ], [ -126.564301899999975, 54.1975387 ], [ -126.564308700000012, 54.1974034 ], [ -126.564313399999989, 54.1973493 ], [ -126.5643022, 54.1972781 ], [ -126.5642171, 54.1971684 ], [ -126.564084599999987, 54.1970758 ], [ -126.563861, 54.1969448 ], [ -126.5637573, 54.196880699999987 ], [ -126.563593700000013, 54.1968138 ], [ -126.5634435, 54.1967568 ], [ -126.563291699999979, 54.1967183 ], [ -126.5631692, 54.196707 ], [ -126.5630607, 54.1967312 ], [ -126.562968199999986, 54.1967653 ], [ -126.5628105, 54.1968252 ], [ -126.5627784, 54.1968608 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091872, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 7414.2031781576898, "blue_line_key": 360862508, "length_metre": 679.36632726229698, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4679685, 54.4140328 ], [ -126.4678616, 54.4140028 ], [ -126.467737799999981, 54.414 ], [ -126.467446099999989, 54.4139943 ], [ -126.467214500000011, 54.4139986 ], [ -126.46703, 54.4139943 ], [ -126.466752, 54.4139986 ], [ -126.4667027, 54.4140413 ], [ -126.466406799999987, 54.4141168 ], [ -126.4661208, 54.4142549 ], [ -126.4659457, 54.4143489 ], [ -126.465670499999987, 54.4145327 ], [ -126.4656002, 54.4146836 ], [ -126.46552770000001, 54.4148616 ], [ -126.4654368, 54.4150852 ], [ -126.4652236, 54.4152875 ], [ -126.4651278, 54.4153302 ], [ -126.4647502, 54.415457 ], [ -126.4646043, 54.4155795 ], [ -126.464364800000013, 54.4157105 ], [ -126.4641141, 54.415776 ], [ -126.4638673, 54.4157888 ], [ -126.4637617, 54.4157689 ], [ -126.4636695, 54.4157318 ], [ -126.463309599999988, 54.4155794 ], [ -126.463128399999988, 54.415531 ], [ -126.4629159, 54.4154812 ], [ -126.4627494, 54.4154328 ], [ -126.462380199999984, 54.41539 ], [ -126.4622582, 54.4153957 ], [ -126.4619489, 54.4153986 ], [ -126.4616538, 54.415437 ], [ -126.461389, 54.415494 ], [ -126.4610796, 54.4154968 ], [ -126.4609417, 54.4154855 ], [ -126.4606996, 54.4154085 ], [ -126.4604712, 54.4153758 ], [ -126.460364099999978, 54.4153744 ], [ -126.460007499999989, 54.4153929 ], [ -126.4598236, 54.4153801 ], [ -126.4596555, 54.4153502 ], [ -126.4593652, 54.4152989 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17071465, "stream_order": 4, "gnis_name": "Johnny David Creek", "downstream_route_measure": 3501.5239985447301, "blue_line_key": 360866287, "length_metre": 2028.6935343883299, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3865981, 54.5398702 ], [ -126.3866183, 54.5400226 ], [ -126.38666, 54.5401137 ], [ -126.3867536, 54.5403231 ], [ -126.3869419, 54.5405424 ], [ -126.3871204, 54.5406635 ], [ -126.387241100000011, 54.5406834 ], [ -126.3875612, 54.5407717 ], [ -126.3878431, 54.5409483 ], [ -126.3879765, 54.5410509 ], [ -126.3882866, 54.541273 ], [ -126.388345699999988, 54.5413286 ], [ -126.3885484, 54.5415209 ], [ -126.3886228, 54.5415679 ], [ -126.3889239, 54.5417174 ], [ -126.389013, 54.5417644 ], [ -126.3892944, 54.5419424 ], [ -126.3893682, 54.541998 ], [ -126.3893985, 54.5420165 ], [ -126.389411200000012, 54.5420435 ], [ -126.3894278, 54.5420521 ], [ -126.389441, 54.5420706 ], [ -126.389470300000013, 54.5420991 ], [ -126.3894854, 54.5421261 ], [ -126.389523, 54.5422429 ], [ -126.389586099999988, 54.5424694 ], [ -126.3896452, 54.5425249 ], [ -126.3897794, 54.5425904 ], [ -126.3898853, 54.5426104 ], [ -126.3901029, 54.5426061 ], [ -126.3901967, 54.5425904 ], [ -126.3905733, 54.5425178 ], [ -126.3906834, 54.5424836 ], [ -126.391031899999987, 54.5423298 ], [ -126.3911274, 54.5422956 ], [ -126.3914243, 54.5422401 ], [ -126.3915962, 54.5422258 ], [ -126.3917362, 54.5422187 ], [ -126.3919998, 54.5422159 ], [ -126.3923067, 54.542223 ], [ -126.3924298, 54.5422429 ], [ -126.392625799999976, 54.5423284 ], [ -126.39273, 54.5424024 ], [ -126.3927566, 54.5424665 ], [ -126.3927822, 54.5425477 ], [ -126.3927627, 54.5426104 ], [ -126.392711799999987, 54.5426716 ], [ -126.392722699999979, 54.5427528 ], [ -126.392779699999977, 54.5428354 ], [ -126.392870899999977, 54.5428553 ], [ -126.3931625, 54.542871 ], [ -126.3933589, 54.542955 ], [ -126.393591499999985, 54.5431672 ], [ -126.393925399999986, 54.5432726 ], [ -126.3941201, 54.5434037 ], [ -126.394400399999981, 54.5435988 ], [ -126.3944737, 54.5436629 ], [ -126.394513, 54.543754 ], [ -126.3945961, 54.5439164 ], [ -126.3946537, 54.5439904 ], [ -126.394859399999987, 54.5441742 ], [ -126.3949684, 54.544375 ], [ -126.3949808, 54.5444376 ], [ -126.394969499999988, 54.544617099999989 ], [ -126.3949886, 54.5448151 ], [ -126.395086, 54.5449788 ], [ -126.395212599999979, 54.5451711 ], [ -126.3953256, 54.5453534 ], [ -126.3955007, 54.5454916 ], [ -126.3957526, 54.5456767 ], [ -126.3960219, 54.5458262 ], [ -126.39635, 54.5460043 ], [ -126.3964365, 54.546086900000013 ], [ -126.39662389999998, 54.5463162 ], [ -126.396786400000011, 54.5464273 ], [ -126.3969373, 54.5464942 ], [ -126.397212, 54.546544 ], [ -126.397407499999986, 54.546638 ], [ -126.397569800000014, 54.5467776 ], [ -126.397792599999988, 54.5468987 ], [ -126.3978995, 54.5469371 ], [ -126.3982014, 54.5470425 ], [ -126.3983069, 54.547071 ], [ -126.3986585, 54.5471607 ], [ -126.398842, 54.5471906 ], [ -126.399088, 54.5471963 ], [ -126.3993831, 54.547202 ], [ -126.3994886, 54.5472234 ], [ -126.3998555, 54.5473117 ], [ -126.4000044, 54.5473772 ], [ -126.4000799, 54.5474071 ], [ -126.4003682, 54.5475025 ], [ -126.4007021, 54.5476079 ], [ -126.4009553, 54.5477404 ], [ -126.401170799999974, 54.547763200000013 ], [ -126.401464, 54.5477603 ], [ -126.401744, 54.547739 ], [ -126.402007700000013, 54.5477361 ], [ -126.4022074, 54.547776 ], [ -126.4023128, 54.5478045 ], [ -126.402645699999979, 54.5479198 ], [ -126.402797299999989, 54.5479497 ], [ -126.402892099999988, 54.5479526 ], [ -126.4031853, 54.5479497 ], [ -126.403541799999985, 54.5479483 ], [ -126.403724299999979, 54.5479882 ], [ -126.4040551, 54.5481306 ], [ -126.404335, 54.5483343 ], [ -126.4046483, 54.5485479 ], [ -126.4049429, 54.5487516 ], [ -126.40504559999998, 54.5488441 ], [ -126.4052211, 54.5490093 ], [ -126.405453799999989, 54.5492216 ], [ -126.4056429, 54.549432300000014 ], [ -126.4057849, 54.5496232 ], [ -126.405891200000013, 54.5496702 ], [ -126.4062075, 54.549777 ], [ -126.406389300000015, 54.549861 ], [ -126.406704300000015, 54.5500205 ], [ -126.4070374, 54.5501003 ], [ -126.407359199999988, 54.5501701 ], [ -126.4076574, 54.5503567 ], [ -126.407747599999979, 54.5503937 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17084454, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 462.69200956092999, "blue_line_key": 360875052, "length_metre": 688.63972151500298, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3275286, 54.4734878 ], [ -126.327598799999976, 54.4735804 ], [ -126.3276087, 54.4736701 ], [ -126.3276147, 54.4738054 ], [ -126.327622100000013, 54.4739578 ], [ -126.327623699999975, 54.4741472 ], [ -126.3276653, 54.4742099 ], [ -126.327799700000014, 54.4742939 ], [ -126.327936200000011, 54.4743238 ], [ -126.3280761, 54.4743096 ], [ -126.3284578, 54.4741657 ], [ -126.32862870000001, 54.474133 ], [ -126.328828800000011, 54.4741287 ], [ -126.3289841, 54.4741401 ], [ -126.329348599999989, 54.4742113 ], [ -126.3294704, 54.4742412 ], [ -126.32970610000001, 54.4743993 ], [ -126.3299175, 54.4744947 ], [ -126.33005, 54.4745773 ], [ -126.3303074, 54.4746742 ], [ -126.3306233, 54.4748066 ], [ -126.330729, 54.4748266 ], [ -126.3309279, 54.4748394 ], [ -126.3311715, 54.4748992 ], [ -126.3313082, 54.4749562 ], [ -126.3315762, 54.4750786 ], [ -126.3318169, 54.4751741 ], [ -126.3320874, 54.4752965 ], [ -126.332309599999988, 54.4754375 ], [ -126.3324083, 54.4755743 ], [ -126.3323707, 54.4757081 ], [ -126.3323136, 54.475842 ], [ -126.332335699999987, 54.4759944 ], [ -126.3324691, 54.4760884 ], [ -126.332590299999978, 54.4761269 ], [ -126.3327568, 54.4761482 ], [ -126.3329873, 54.4761895 ], [ -126.3330772, 54.4762266 ], [ -126.3331188, 54.4762821 ], [ -126.333131, 54.4763448 ], [ -126.3331351, 54.4765342 ], [ -126.3331733, 54.4766339 ], [ -126.333272099999988, 54.4767706 ], [ -126.3333769, 54.4768276 ], [ -126.3335822, 54.4770028 ], [ -126.3339408, 54.4771808 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17106006, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 47236.404102828099, "blue_line_key": 360886221, "length_metre": 721.57111045633303, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4979587, 54.1901641 ], [ -126.4979013, 54.1901 ], [ -126.4978732, 54.1900359 ], [ -126.4978463, 54.1899818 ], [ -126.49782, 54.18992630000001 ], [ -126.49780770000001, 54.189872199999989 ], [ -126.497796099999974, 54.1898095 ], [ -126.4977679, 54.1897454 ], [ -126.4977563, 54.1896827 ], [ -126.4977312, 54.1896101 ], [ -126.497704899999974, 54.1895474 ], [ -126.4976628, 54.1894748 ], [ -126.497634599999984, 54.1894107 ], [ -126.497608899999989, 54.1893466 ], [ -126.4975966, 54.1892925 ], [ -126.497585, 54.1892299 ], [ -126.497588, 54.1891672 ], [ -126.497593400000014, 54.1891045 ], [ -126.4975981, 54.1889963 ], [ -126.497570599999989, 54.1889507 ], [ -126.4975004, 54.1888681 ], [ -126.497380199999981, 54.1888026 ], [ -126.4973065, 54.1887841 ], [ -126.4971499, 54.1888069 ], [ -126.4970233, 54.1888681 ], [ -126.4969125, 54.1889464 ], [ -126.496799899999985, 54.1890162 ], [ -126.4966738, 54.189076 ], [ -126.496596400000016, 54.1891017 ], [ -126.4965032, 54.1891173 ], [ -126.4964106, 54.1891245 ], [ -126.496288799999988, 54.1891316 ], [ -126.4955314, 54.1892142 ], [ -126.495438799999974, 54.1892213 ], [ -126.4953449, 54.1892455 ], [ -126.495253, 54.1892712 ], [ -126.495145099999974, 54.1892868 ], [ -126.495052500000014, 54.1892939 ], [ -126.494974500000012, 54.1893011 ], [ -126.4948978, 54.189318199999988 ], [ -126.494758800000014, 54.1893053 ], [ -126.4946704, 54.1892598 ], [ -126.494644099999988, 54.1892042 ], [ -126.494660499999981, 54.1891515 ], [ -126.494758499999989, 54.1890817 ], [ -126.4948828, 54.1890475 ], [ -126.4950235, 54.1890148 ], [ -126.495178200000012, 54.1889635 ], [ -126.4952897, 54.1889037 ], [ -126.4953724, 54.1888154 ], [ -126.4953907, 54.1887713 ], [ -126.4954247, 54.1887171 ], [ -126.495442899999986, 54.188673 ], [ -126.495459900000014, 54.1886189 ], [ -126.495464599999977, 54.1885647 ], [ -126.4954811, 54.1885121 ], [ -126.4954852, 54.1884665 ], [ -126.495487099999977, 54.1884138 ], [ -126.4954912, 54.1883682 ], [ -126.495493, 54.1883226 ], [ -126.4954973, 54.1882699 ], [ -126.4954685, 54.1882144 ], [ -126.4954148, 54.1881062 ], [ -126.495342799999975, 54.188015 ], [ -126.4952573, 54.1879409 ], [ -126.4951219, 54.187884 ], [ -126.495047, 54.1878555 ], [ -126.494896399999988, 54.1878071 ], [ -126.4947739, 54.1877957 ], [ -126.494664300000011, 54.1878299 ], [ -126.494629, 54.1879011 ], [ -126.4946278, 54.1879452 ], [ -126.494623, 54.1879993 ], [ -126.4946207, 54.1880535 ], [ -126.494601300000014, 54.1881076 ], [ -126.4945532, 54.1881603 ], [ -126.4945051, 54.188213 ], [ -126.4944235, 54.1882913 ], [ -126.4942962, 54.1883611 ], [ -126.494153699999984, 54.1884124 ], [ -126.493999, 54.1884366 ], [ -126.4938613, 54.1884337 ], [ -126.493710799999988, 54.1884124 ], [ -126.49359, 54.1883824 ], [ -126.4934699, 54.1883169 ], [ -126.4934278, 54.1882714 ], [ -126.493403300000011, 54.1881631 ], [ -126.4934051, 54.1881446 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17092410, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 249458.595627439, "blue_line_key": 360873822, "length_metre": 542.80258194407998, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1991976, 54.4096149 ], [ -126.1990278, 54.4096106 ], [ -126.1988863, 54.409643300000013 ], [ -126.1988074, 54.409686099999988 ], [ -126.1987708, 54.4097402 ], [ -126.198797399999975, 54.4098299 ], [ -126.198795, 54.409857 ], [ -126.198898699999987, 54.409922500000015 ], [ -126.1991604, 54.4099367 ], [ -126.1993401, 54.4099951 ], [ -126.1994468, 54.410025 ], [ -126.199488599999981, 54.4100792 ], [ -126.199505099999982, 54.4102785 ], [ -126.1992357, 54.4103882 ], [ -126.1989052, 54.4104979 ], [ -126.1988391, 54.4105591 ], [ -126.1986424, 54.4107528 ], [ -126.1985309, 54.410777 ], [ -126.198379499999973, 54.4107557 ], [ -126.1982887, 54.4107086 ], [ -126.198241, 54.4105278 ], [ -126.198093, 54.4104423 ], [ -126.1980058, 54.4103512 ], [ -126.1979888, 54.4101532 ], [ -126.1981308, 54.4100848 ], [ -126.1983914, 54.4099111 ], [ -126.198393, 54.4098655 ], [ -126.1983966, 54.4098214 ], [ -126.198375399999989, 54.4096761 ], [ -126.198126699999989, 54.4094824 ], [ -126.1980654, 54.4094625 ], [ -126.1978556, 54.4093856 ], [ -126.197686499999989, 54.4093727 ], [ -126.1973936, 54.4093841 ], [ -126.1970801, 54.4094667 ], [ -126.1969981, 54.409518 ], [ -126.1968396, 54.4096049 ], [ -126.196655199999981, 54.4098256 ], [ -126.196353399999978, 54.4099438 ], [ -126.196246699999989, 54.409941 ], [ -126.1962155, 54.4099325 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091618, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 4078.4968583218601, "blue_line_key": 360862508, "length_metre": 2781.5639422583899, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.491008, 54.4332582 ], [ -126.4909113, 54.4330944 ], [ -126.4907979, 54.4329292 ], [ -126.490726, 54.432848 ], [ -126.490591400000014, 54.432764 ], [ -126.4904556, 54.4327255 ], [ -126.490239599999981, 54.4327198 ], [ -126.4898836, 54.4327227 ], [ -126.4895144, 54.4327141 ], [ -126.4891589, 54.4327155 ], [ -126.4888761, 54.4328095 ], [ -126.4886584, 54.432858 ], [ -126.4883194, 54.4328608 ], [ -126.4881351, 54.4328209 ], [ -126.4878706, 54.4326258 ], [ -126.487780299999983, 54.4325973 ], [ -126.48764220000001, 54.4325859 ], [ -126.4873014, 54.4325874 ], [ -126.4871623, 54.4325931 ], [ -126.4869911, 54.4326344 ], [ -126.48664620000001, 54.432717 ], [ -126.486444800000015, 54.4327397 ], [ -126.4863067, 54.4327284 ], [ -126.486185600000013, 54.4326899 ], [ -126.4858877, 54.4325133 ], [ -126.4856531, 54.4323096 ], [ -126.4853595, 54.4320789 ], [ -126.485162699999989, 54.432012 ], [ -126.4849658, 54.431945 ], [ -126.4847067, 54.4318952 ], [ -126.4844467, 54.4318895 ], [ -126.4842455, 54.4318767 ], [ -126.48404619999998, 54.4318724 ], [ -126.4837892, 54.4317955 ], [ -126.483684900000014, 54.43173 ], [ -126.4835953, 54.4316645 ], [ -126.4834646, 54.4315277 ], [ -126.4834534, 54.4314551 ], [ -126.4834508, 54.4312671 ], [ -126.483431700000011, 54.4310777 ], [ -126.4833908, 54.430978 ], [ -126.483378, 54.4309239 ], [ -126.4833578, 54.4307515 ], [ -126.4833779, 54.4306803 ], [ -126.483412699999988, 54.4306091 ], [ -126.483446699999988, 54.4305749 ], [ -126.483463599999979, 54.4305479 ], [ -126.4836592, 54.4303813 ], [ -126.48370869999998, 54.43031 ], [ -126.4837639, 54.4301947 ], [ -126.4837696, 54.430095 ], [ -126.483726600000011, 54.4300224 ], [ -126.483565399999989, 54.4299027 ], [ -126.483476, 54.4298643 ], [ -126.4832615, 54.4298059 ], [ -126.4830263, 54.4296392 ], [ -126.4828343, 54.4295096 ], [ -126.4824856, 54.429394299999984 ], [ -126.4823067, 54.4292832 ], [ -126.482147099999978, 54.429145 ], [ -126.4819723, 54.4289528 ], [ -126.481810599999989, 54.4288417 ], [ -126.4815867, 54.4287192 ], [ -126.4814515, 54.4286722 ], [ -126.481317, 54.4285882 ], [ -126.4812758, 54.4285241 ], [ -126.481267399999979, 54.4284158 ], [ -126.4813223, 54.4282734 ], [ -126.4812855, 54.4280926 ], [ -126.4812, 54.4280014 ], [ -126.480904099999975, 54.4277707 ], [ -126.480798400000012, 54.4277507 ], [ -126.4806746, 54.4277479 ], [ -126.4805663, 54.4277636 ], [ -126.480471, 54.4277977 ], [ -126.4803578, 54.4278761 ], [ -126.4802095, 54.4280612 ], [ -126.4800625, 54.4281937 ], [ -126.4799186, 54.428262 ], [ -126.4796976, 54.4283475 ], [ -126.4794714, 54.4285312 ], [ -126.4793908, 54.4285654 ], [ -126.4791439, 54.4285782 ], [ -126.4790389, 54.4285497 ], [ -126.4789629, 54.4284942 ], [ -126.4788175, 54.4283646 ], [ -126.4786751, 54.4281638 ], [ -126.4785964, 54.4279558 ], [ -126.478495399999986, 54.4278462 ], [ -126.4784545, 54.4277465 ], [ -126.4784052, 54.4275385 ], [ -126.4782356, 54.4273107 ], [ -126.4781207, 54.427164 ], [ -126.478008, 54.4269902 ], [ -126.477859900000013, 54.4268891 ], [ -126.47771419999998, 54.4267324 ], [ -126.4777112, 54.426553 ], [ -126.477688300000011, 54.4264091 ], [ -126.4776186, 54.426308 ], [ -126.4775301, 54.4262254 ], [ -126.4773371, 54.4261129 ], [ -126.4772373, 54.4259861 ], [ -126.4772462, 54.4258423 ], [ -126.4773123, 54.4257796 ], [ -126.4775546, 54.4256059 ], [ -126.4775894, 54.4255347 ], [ -126.47762419999998, 54.4254635 ], [ -126.477607299999988, 54.425247 ], [ -126.4774802, 54.425037599999989 ], [ -126.4774214, 54.4249821 ], [ -126.4772338, 54.4247984 ], [ -126.4770591, 54.4246061 ], [ -126.477031, 54.4245605 ], [ -126.4768898, 54.42434260000001 ], [ -126.476792, 54.4241959 ], [ -126.47663439999998, 54.4240036 ], [ -126.4765533, 54.4237957 ], [ -126.476543, 54.4237416 ], [ -126.4765084, 54.4235337 ], [ -126.4764858, 54.4234169 ], [ -126.476405799999981, 54.423199 ], [ -126.4763402, 54.4230096 ], [ -126.476166299999988, 54.4228429 ], [ -126.4758832, 54.4226663 ], [ -126.4756761, 54.4225453 ], [ -126.475334300000014, 54.4223131 ], [ -126.4751901, 54.4221664 ], [ -126.4750769, 54.4219941 ], [ -126.475055900000015, 54.421858799999988 ], [ -126.4750897, 54.4218047 ], [ -126.4752193, 54.4217007 ], [ -126.475538, 54.4215184 ], [ -126.475655, 54.4213945 ], [ -126.4758346, 54.4212179 ], [ -126.4759008, 54.4211481 ], [ -126.47605080000001, 54.4209444 ], [ -126.4762481, 54.4207593 ], [ -126.476445899999987, 54.4205656 ], [ -126.476468499999982, 54.4204317 ], [ -126.4764629, 54.4202879 ], [ -126.4764362, 54.420196700000012 ], [ -126.4763532, 54.4200429 ], [ -126.47627319999998, 54.419825 ], [ -126.476173899999978, 54.4196968 ], [ -126.4759546, 54.4195131 ], [ -126.475885799999986, 54.4193678 ], [ -126.4758752, 54.4192867 ], [ -126.4758711, 54.4191243 ], [ -126.4758943, 54.4189819 ], [ -126.475934799999976, 54.418811 ], [ -126.4759953, 54.4185973 ], [ -126.4759877, 54.4184521 ], [ -126.4760005, 54.4182555 ], [ -126.4760242, 54.4181117 ], [ -126.4760963, 54.4179693 ], [ -126.476073, 54.417834 ], [ -126.4759879, 54.4177072 ], [ -126.4758129, 54.4175505 ], [ -126.475740500000015, 54.417485 ], [ -126.4756205, 54.4174295 ], [ -126.475451799999973, 54.4174081 ], [ -126.475251500000013, 54.4174209 ], [ -126.474879800000011, 54.4174409 ], [ -126.4747889, 54.4174209 ], [ -126.4746694, 54.417364 ], [ -126.4744926, 54.4171988 ], [ -126.47414950000001, 54.4170122 ], [ -126.4740932, 54.4169567 ], [ -126.4741343, 54.4167772 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17093596, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 173682.30826826699, "blue_line_key": 360873822, "length_metre": 315.45356158568302, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.676358099999987, 54.3928776 ], [ -126.674488, 54.3931695 ], [ -126.673779, 54.393309099999989 ], [ -126.673405199999976, 54.3934273 ], [ -126.6731369, 54.3935939 ], [ -126.672846, 54.3938816 ], [ -126.672576100000015, 54.3943132 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101856, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 27742.730362455699, "blue_line_key": 360881038, "length_metre": 65.299670220013994, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0698943, 54.2487048 ], [ -126.070149699999988, 54.2485667 ], [ -126.0702513, 54.2484428 ], [ -126.0703714, 54.2482747 ], [ -126.0703749, 54.2482121 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17070485, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 8235.9227723582608, "blue_line_key": 360875378, "length_metre": 274.88471511604803, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5389567, 54.5454759 ], [ -126.5391154, 54.5454075 ], [ -126.5392762, 54.5453121 ], [ -126.5393092, 54.5452594 ], [ -126.539397900000012, 54.5450814 ], [ -126.53946280000001, 54.5450287 ], [ -126.539763, 54.5448991 ], [ -126.539939, 54.5447951 ], [ -126.5402011, 54.5445843 ], [ -126.540324399999989, 54.5445687 ], [ -126.5404167, 54.5445715 ], [ -126.540556699999982, 54.5445644 ], [ -126.54083510000001, 54.5445615 ], [ -126.540972, 54.5445915 ], [ -126.541046599999987, 54.5446384 ], [ -126.5412935, 54.5446698 ], [ -126.5415071, 54.5447196 ], [ -126.5418256, 54.5448065 ], [ -126.5419002, 54.5448535 ], [ -126.5422, 54.5449945 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17087127, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 234600.42487858, "blue_line_key": 360873822, "length_metre": 114.240622200613, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2399616, 54.4566579 ], [ -126.2399189, 54.4565853 ], [ -126.2399246, 54.4565212 ], [ -126.2399581, 54.4564685 ], [ -126.240150299999982, 54.456383 ], [ -126.240184899999974, 54.4563204 ], [ -126.2401781, 54.456195 ], [ -126.2401348, 54.456131 ], [ -126.2400928, 54.4560768 ], [ -126.2400031, 54.4560469 ], [ -126.239894399999983, 54.4560355 ], [ -126.239692199999979, 54.4560669 ], [ -126.2395626, 54.4561623 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076617, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 215175.868940627, "blue_line_key": 360873822, "length_metre": 297.01593293915499, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3706929, 54.5137117 ], [ -126.3702858, 54.5135437 ], [ -126.3691238, 54.51336 ], [ -126.3688186, 54.5131463 ], [ -126.36869, 54.5129398 ], [ -126.36851, 54.5128031 ], [ -126.3677389, 54.512561 ], [ -126.3672128, 54.5121665 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080260, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 223978.36771153699, "blue_line_key": 360873822, "length_metre": 67.559103604260301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2957163, 54.494492 ], [ -126.296114100000011, 54.4942343 ], [ -126.2961184, 54.4941388 ], [ -126.295969199999988, 54.4939993 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17086184, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 0.0, "blue_line_key": 360236038, "length_metre": 14.3051098568708, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5211275, 54.4624673 ], [ -126.521348499999988, 54.462473 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17106180, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 49023.497054738, "blue_line_key": 360886221, "length_metre": 890.16341559012994, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4873086, 54.184782 ], [ -126.4872629, 54.1847806 ], [ -126.487169599999987, 54.1847963 ], [ -126.4870916, 54.1848034 ], [ -126.486997899999977, 54.1848205 ], [ -126.4869071, 54.1848362 ], [ -126.4868145, 54.1848433 ], [ -126.486705299999983, 54.184849 ], [ -126.4866292, 54.184857500000014 ], [ -126.4865512, 54.1848647 ], [ -126.4864593, 54.1848632 ], [ -126.4863672, 54.1848689 ], [ -126.48626, 54.184876 ], [ -126.486168, 54.1848746 ], [ -126.4860748, 54.1848903 ], [ -126.485934599999979, 54.1849145 ], [ -126.4857952, 54.1849572 ], [ -126.485731199999975, 54.1849999 ], [ -126.4857715, 54.1850911 ], [ -126.4858757, 54.1851466 ], [ -126.4860111, 54.1851766 ], [ -126.486167, 54.1851623 ], [ -126.4863211, 54.1851466 ], [ -126.4863967, 54.1851395 ], [ -126.4864882, 54.1851424 ], [ -126.4865649, 54.1851523 ], [ -126.4866551, 54.1851723 ], [ -126.4867746, 54.1852193 ], [ -126.4868777, 54.1853118 ], [ -126.4869332, 54.1853945 ], [ -126.4869466, 54.1854386 ], [ -126.4869595, 54.1854842 ], [ -126.4869377, 54.1855654 ], [ -126.4869188, 54.1856451 ], [ -126.4868683, 54.1856978 ], [ -126.486819, 54.1857605 ], [ -126.486815399999983, 54.1858317 ], [ -126.4868727, 54.1858958 ], [ -126.486942899999988, 54.1859784 ], [ -126.4870789, 54.1860268 ], [ -126.4871556, 54.1860368 ], [ -126.487246500000012, 54.1860482 ], [ -126.487337799999978, 54.1860581 ], [ -126.4874755, 54.186061 ], [ -126.487598, 54.1860724 ], [ -126.48772, 54.1860852 ], [ -126.4878558, 54.1861137 ], [ -126.487929, 54.1861607 ], [ -126.4880016, 54.1862162 ], [ -126.4880437, 54.1862889 ], [ -126.488042, 54.1863344 ], [ -126.488009100000014, 54.1863786 ], [ -126.4879731, 54.186431299999988 ], [ -126.4879403, 54.1864754 ], [ -126.4878307, 54.1865367 ], [ -126.487704600000015, 54.1865694 ], [ -126.487567500000011, 54.1865851 ], [ -126.487439599999988, 54.1866364 ], [ -126.487344600000014, 54.1866976 ], [ -126.487250199999977, 54.1867574 ], [ -126.4872624, 54.1868115 ], [ -126.487366099999988, 54.1868685 ], [ -126.487454, 54.1869426 ], [ -126.4874649, 54.1869867 ], [ -126.4874907, 54.1870779 ], [ -126.487485299999989, 54.1871676 ], [ -126.4874043, 54.1872374 ], [ -126.4872923, 54.1872986 ], [ -126.4871533, 54.1873399 ], [ -126.4870285, 54.1873826 ], [ -126.486903, 54.1874069 ], [ -126.486781099999988, 54.1873869 ], [ -126.4866774, 54.18733 ], [ -126.4865616, 54.1872388 ], [ -126.486503, 54.1871918 ], [ -126.4864615, 54.1871106 ], [ -126.486497899999989, 54.1870295 ], [ -126.4865948, 54.1869426 ], [ -126.486722, 54.1868728 ], [ -126.4868329, 54.1867945 ], [ -126.4868827, 54.1867232 ], [ -126.4868631, 54.1865609 ], [ -126.486790499999984, 54.186505300000015 ], [ -126.486686299999988, 54.1864498 ], [ -126.4865479, 54.1864284 ], [ -126.486473, 54.186427 ], [ -126.486381, 54.1864256 ], [ -126.4862731, 54.1864142 ], [ -126.4861969, 54.1864028 ], [ -126.4861055, 54.1863928 ], [ -126.486015299999977, 54.1863729 ], [ -126.48590990000001, 54.1863615 ], [ -126.485802, 54.1863501 ], [ -126.4857112, 54.1863387 ], [ -126.485635, 54.1863202 ], [ -126.4855028, 54.1862547 ], [ -126.4853838, 54.1861792 ], [ -126.4853247, 54.186133600000012 ], [ -126.4852661, 54.1860866 ], [ -126.485207599999981, 54.1860325 ], [ -126.4851655, 54.1859869 ], [ -126.485064199999982, 54.1859029 ], [ -126.48496, 54.1858203 ], [ -126.4849044, 54.1857377 ], [ -126.4849251, 54.1856665 ], [ -126.4849872, 54.1856223 ], [ -126.4850828, 54.1855796 ], [ -126.485116299999987, 54.1855269 ], [ -126.485121100000015, 54.1854728 ], [ -126.485108299999979, 54.1854272 ], [ -126.4850339, 54.1853631 ], [ -126.4849144, 54.1853161 ], [ -126.484855900000014, 54.1852962 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102529, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 10660.707339810901, "blue_line_key": 360880905, "length_metre": 1914.88505690533, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4517259, 54.2376615 ], [ -126.4517252, 54.2376701 ], [ -126.4517235, 54.2377156 ], [ -126.4517322, 54.2377868 ], [ -126.451714, 54.2378581 ], [ -126.4516929, 54.2379307 ], [ -126.451657, 54.2380104 ], [ -126.451592, 54.2380902 ], [ -126.4515146, 54.2381158 ], [ -126.4512786, 54.2381828 ], [ -126.4512023, 54.2381984 ], [ -126.451109, 54.2382141 ], [ -126.4510297, 54.2382312 ], [ -126.4508614, 54.2382454 ], [ -126.4507693, 54.238244 ], [ -126.4506319, 54.2382397 ], [ -126.4505105, 54.2382113 ], [ -126.4504189, 54.2382084 ], [ -126.450309699999977, 54.238207 ], [ -126.450171200000014, 54.2382127 ], [ -126.4500164, 54.2382369 ], [ -126.449908400000012, 54.2382526 ], [ -126.449800400000015, 54.2382682 ], [ -126.449707100000012, 54.2382839 ], [ -126.4496314, 54.238291 ], [ -126.4495228, 54.238288200000014 ], [ -126.449400200000014, 54.2383038 ], [ -126.449277, 54.238301 ], [ -126.449169599999976, 54.2383081 ], [ -126.4490598, 54.2383152 ], [ -126.4488921, 54.2383209 ], [ -126.4487994, 54.238328 ], [ -126.4487084, 54.2383167 ], [ -126.4485869, 54.2382953 ], [ -126.4484948, 54.2382939 ], [ -126.4483728, 54.2382739 ], [ -126.4482666, 54.2382711 ], [ -126.4481574, 54.2382696 ], [ -126.4480811, 54.2382583 ], [ -126.447990100000013, 54.2382469 ], [ -126.447915099999989, 54.2382454 ], [ -126.447823, 54.238244 ], [ -126.4476967, 54.2382768 ], [ -126.4476316, 54.2383565 ], [ -126.4476268, 54.2384106 ], [ -126.4476392, 54.2384648 ], [ -126.4476661, 54.2385189 ], [ -126.447709, 54.238583 ], [ -126.4477359, 54.2386371 ], [ -126.4477647, 54.2386926 ], [ -126.4477917, 54.2387468 ], [ -126.447818599999977, 54.2388009 ], [ -126.4478298, 54.238865 ], [ -126.44787070000001, 54.2389276 ], [ -126.447899, 54.2389917 ], [ -126.4479065, 54.2391 ], [ -126.4479012, 54.2391897 ], [ -126.447807900000015, 54.2392324 ], [ -126.447683599999976, 54.2392395 ], [ -126.447547399999976, 54.2392182 ], [ -126.447412500000013, 54.239179699999987 ], [ -126.447262200000011, 54.2390957 ], [ -126.447173, 54.2390658 ], [ -126.4470674, 54.2390273 ], [ -126.4469923, 54.2389989 ], [ -126.44679450000001, 54.238959 ], [ -126.446690199999978, 54.2389305 ], [ -126.446599799999987, 54.2389105 ], [ -126.4464496, 54.2388536 ], [ -126.4463427, 54.2388322 ], [ -126.446206100000012, 54.2388123 ], [ -126.446070599999985, 54.2387824 ], [ -126.4459491, 54.238761 ], [ -126.4458264, 54.2387496 ], [ -126.445719, 54.2387297 ], [ -126.4455982, 54.2387268 ], [ -126.4454902, 54.2387154 ], [ -126.4453669, 54.2387126 ], [ -126.445276600000014, 54.2387197 ], [ -126.4451376, 54.2387268 ], [ -126.4450296, 54.2387425 ], [ -126.4449509, 54.2387582 ], [ -126.44477950000001, 54.238808 ], [ -126.44468329999998, 54.2388522 ], [ -126.4446023, 54.2389219 ], [ -126.4445658, 54.2390102 ], [ -126.444591, 54.2391099 ], [ -126.444601, 54.2391911 ], [ -126.444599299999979, 54.2392367 ], [ -126.4444866, 54.2393335 ], [ -126.4443299, 54.2393834 ], [ -126.4442506, 54.2394005 ], [ -126.4441744, 54.2394161 ], [ -126.4440633, 54.2394404 ], [ -126.443985900000015, 54.239466 ], [ -126.443878, 54.2394817 ], [ -126.443784600000015, 54.2394973 ], [ -126.443662, 54.239513 ], [ -126.4435828, 54.2395301 ], [ -126.443396100000015, 54.2395614 ], [ -126.443319300000013, 54.2395785 ], [ -126.443212500000016, 54.2395842 ], [ -126.443074, 54.2395899 ], [ -126.442903800000011, 54.2395956 ], [ -126.4428263, 54.2395942 ], [ -126.442580399999983, 54.239607 ], [ -126.442458500000015, 54.2396141 ], [ -126.4423645, 54.2396113 ], [ -126.4419538, 54.2395671 ], [ -126.441864, 54.2395386 ], [ -126.4417432, 54.2395087 ], [ -126.4416351, 54.2394973 ], [ -126.4414844, 54.239476 ], [ -126.4413923, 54.2394745 ], [ -126.4412836, 54.239471699999989 ], [ -126.4412086, 54.2394703 ], [ -126.4411305, 54.2394774 ], [ -126.4410384, 54.239476 ], [ -126.4409603, 54.2394831 ], [ -126.4407743, 54.2395329 ], [ -126.4407397, 54.2395956 ], [ -126.440736, 54.2396397 ], [ -126.440747800000011, 54.2397295 ], [ -126.4407577, 54.2398106 ], [ -126.440753599999979, 54.2398562 ], [ -126.4407806, 54.2399374 ], [ -126.4407752, 54.2400001 ], [ -126.4407735, 54.2400456 ], [ -126.4407553, 54.2400898 ], [ -126.44064130000001, 54.2401767 ], [ -126.440549899999979, 54.2401938 ], [ -126.4404266, 54.2401909 ], [ -126.440302699999975, 54.2401966 ], [ -126.4401648, 54.2401938 ], [ -126.440027499999985, 54.2401824 ], [ -126.439876200000015, 54.2401695 ], [ -126.4397395, 54.2401496 ], [ -126.4396461, 54.2401382 ], [ -126.4395711, 54.2401368 ], [ -126.4394801, 54.2401254 ], [ -126.439388, 54.240124 ], [ -126.439264099999988, 54.2401297 ], [ -126.439172, 54.2401282 ], [ -126.439079299999989, 54.2401354 ], [ -126.4389238, 54.2401681 ], [ -126.4387829, 54.2402279 ], [ -126.4387189, 54.2402707 ], [ -126.4386373, 54.2403148 ], [ -126.4385745, 54.2403675 ], [ -126.4384776, 54.2404273 ], [ -126.4383838, 54.2404715 ], [ -126.438287399999979, 54.2405228 ], [ -126.438209399999977, 54.2405569 ], [ -126.4381301, 54.240574 ], [ -126.4380409, 54.2405441 ], [ -126.437966499999987, 54.2405071 ], [ -126.4378937, 54.2404515 ], [ -126.4378356, 54.240396 ], [ -126.4377917, 54.2403419 ], [ -126.437733599999973, 54.2402863 ], [ -126.4376157, 54.2402208 ], [ -126.4375253, 54.2402009 ], [ -126.4374472, 54.240208 ], [ -126.4373551, 54.2402066 ], [ -126.437279499999988, 54.2402137 ], [ -126.4371708, 54.2402108 ], [ -126.4370946, 54.2402194 ], [ -126.4370024, 54.2402251 ], [ -126.4369086, 54.2402422 ], [ -126.436769399999989, 54.2402564 ], [ -126.4366139, 54.2402892 ], [ -126.4365206, 54.2403048 ], [ -126.436398, 54.2403205 ], [ -126.436272300000013, 54.2403447 ], [ -126.436162, 54.2403875 ], [ -126.4360534, 54.2404117 ], [ -126.4359589, 54.2404373 ], [ -126.4358656, 54.24048 ], [ -126.4357699, 54.2405228 ], [ -126.4356595, 54.2405655 ], [ -126.4355662, 54.2406082 ], [ -126.4353937, 54.240668 ], [ -126.4352498, 54.2407364 ], [ -126.435156, 54.2407805 ], [ -126.4350315, 54.2408218 ], [ -126.4349206, 54.2408731 ], [ -126.434795600000015, 54.2409158 ], [ -126.4346852, 54.2409586 ], [ -126.434604799999988, 54.2409927 ], [ -126.434432300000012, 54.2410796 ], [ -126.4343512, 54.2411494 ], [ -126.434286700000015, 54.2411936 ], [ -126.434222, 54.2412448 ], [ -126.4341709, 54.2412989 ], [ -126.434137400000012, 54.2413516 ], [ -126.4340089, 54.2414385 ], [ -126.4339913, 54.2415012 ], [ -126.4338926, 54.2416066 ], [ -126.4338409, 54.2416692 ], [ -126.4337934, 54.2417134 ], [ -126.4337593, 54.2417746 ], [ -126.4336789, 54.2418359 ], [ -126.4336266, 54.2419071 ], [ -126.4335778, 54.2419683 ], [ -126.433510899999987, 54.2420395 ], [ -126.433386, 54.2421093 ], [ -126.433261399999978, 54.2421236 ], [ -126.4330454, 54.2421278 ], [ -126.4329533, 54.2421264 ], [ -126.432847099999975, 54.2421236 ], [ -126.4327556, 54.2421136 ], [ -126.432647, 54.2421107 ], [ -126.4325414, 54.2420993 ], [ -126.432404100000014, 54.242088 ], [ -126.432296099999988, 54.2420766 ], [ -126.432143499999981, 54.2420737 ], [ -126.4320508, 54.2420808 ], [ -126.4318811, 54.2420851 ], [ -126.431789, 54.2420837 ], [ -126.431635899999975, 54.2420894 ], [ -126.4315602, 54.2420965 ], [ -126.4313754, 54.2421022 ], [ -126.4312979, 54.2421008 ], [ -126.4311448, 54.2421065 ], [ -126.4310666, 54.2421136 ], [ -126.430913499999988, 54.2421193 ], [ -126.4307896, 54.242125 ], [ -126.4306511, 54.2421307 ], [ -126.4305443, 54.2421293 ], [ -126.4304204, 54.242135 ], [ -126.4303454, 54.242133499999987 ], [ -126.4302051, 54.2421307 ], [ -126.4299939, 54.2421079 ], [ -126.429902399999989, 54.2420979 ], [ -126.429826699999978, 54.242078 ], [ -126.429644200000013, 54.2420296 ], [ -126.4294921, 54.2419982 ], [ -126.4293243, 54.2420039 ], [ -126.4292445, 54.2420296 ], [ -126.429151800000014, 54.2420637 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100659, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 19538.403516963201, "blue_line_key": 360880905, "length_metre": 289.10499598386201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3673597, 54.2677451 ], [ -126.367374399999989, 54.2677451 ], [ -126.3673885, 54.2677465 ], [ -126.3675687, 54.267822 ], [ -126.367723699999985, 54.2678248 ], [ -126.367801899999989, 54.2677907 ], [ -126.367883, 54.2677209 ], [ -126.3679102, 54.26755 ], [ -126.368001799999988, 54.2675258 ], [ -126.368094, 54.2675272 ], [ -126.368221, 54.2674859 ], [ -126.368255699999978, 54.2674232 ], [ -126.3683631, 54.2674161 ], [ -126.368468799999988, 54.2674545 ], [ -126.368687, 54.2676212 ], [ -126.3687787, 54.2676511 ], [ -126.3690411, 54.2676198 ], [ -126.3692297, 54.2675699 ], [ -126.3694281, 54.2675742 ], [ -126.3695185, 54.2675941 ], [ -126.36959250000001, 54.2676326 ], [ -126.3696188, 54.2676952 ], [ -126.3695519, 54.2678206 ], [ -126.369636899999989, 54.2679302 ], [ -126.369849300000013, 54.2679431 ], [ -126.370062499999989, 54.2680014 ], [ -126.370099899999985, 54.2681282 ], [ -126.3702039, 54.2681852 ], [ -126.370276, 54.2682493 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100961, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 10734.437272908201, "blue_line_key": 360877225, "length_metre": 585.31215184375799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.201958399999981, 54.267597 ], [ -126.2019927, 54.2675429 ], [ -126.2022039, 54.2673776 ], [ -126.202240099999983, 54.2672979 ], [ -126.202298, 54.2671184 ], [ -126.202399, 54.2669945 ], [ -126.202403499999988, 54.2669418 ], [ -126.202416899999974, 54.2667439 ], [ -126.2023971, 54.266590099999988 ], [ -126.2023119, 54.2664889 ], [ -126.202237599999989, 54.2664519 ], [ -126.2019248, 54.2662924 ], [ -126.2017422, 54.2662511 ], [ -126.2014574, 54.2661557 ], [ -126.2011738, 54.2660503 ], [ -126.201115300000012, 54.266003299999987 ], [ -126.2010606, 54.2658851 ], [ -126.201039, 54.2657768 ], [ -126.201042199999975, 54.2657142 ], [ -126.201043399999975, 54.2654891 ], [ -126.2011733, 54.2653667 ], [ -126.201268, 54.265314 ], [ -126.2014912, 54.2652299 ], [ -126.201662200000015, 54.2651886 ], [ -126.2018194, 54.2651117 ], [ -126.2019656, 54.2649978 ], [ -126.202115, 54.2648482 ], [ -126.2021837, 54.2647329 ], [ -126.2021901, 54.2646617 ], [ -126.2021724, 54.2644552 ], [ -126.2021629, 54.264374 ], [ -126.2020788, 54.2642629 ], [ -126.2018869, 54.2641333 ], [ -126.201787699999983, 54.2640236 ], [ -126.2015862, 54.2637929 ], [ -126.2015646, 54.2636576 ], [ -126.2016219, 54.2635066 ], [ -126.20176690000001, 54.2634027 ], [ -126.202048600000012, 54.2633186 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17086747, "stream_order": 4, "gnis_name": "Raspberry Creek", "downstream_route_measure": 3291.0109885667498, "blue_line_key": 360817924, "length_metre": 353.21166722163701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6164159, 54.4578144 ], [ -126.616582799999989, 54.4578628 ], [ -126.6166905, 54.4578913 ], [ -126.616914, 54.4580309 ], [ -126.6170789, 54.4581063 ], [ -126.6173794, 54.4582288 ], [ -126.617485099999982, 54.4582844 ], [ -126.6175923, 54.4583143 ], [ -126.6179702, 54.4584467 ], [ -126.61830350000001, 54.4585521 ], [ -126.6184972, 54.458664600000013 ], [ -126.618571, 54.4587202 ], [ -126.6188062, 54.4589039 ], [ -126.619122800000014, 54.4590363 ], [ -126.619335799999988, 54.4590862 ], [ -126.619657499999988, 54.4591546 ], [ -126.619971699999979, 54.459287 ], [ -126.6201533, 54.459371 ], [ -126.6204684, 54.459522 ], [ -126.6207679, 54.4596616 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17079913, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 203640.65294631201, "blue_line_key": 360873822, "length_metre": 107.686340355062, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4804591, 54.4951472 ], [ -126.480791199999985, 54.4952284 ], [ -126.4811271, 54.4954391 ], [ -126.4812238, 54.4956115 ], [ -126.481167899999988, 54.4958977 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17082415, "stream_order": 4, "gnis_name": "Ailport Creek", "downstream_route_measure": 12033.5476959603, "blue_line_key": 360878058, "length_metre": 85.469881173873901, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1370954, 54.484769 ], [ -126.1368132, 54.4848245 ], [ -126.136700499999989, 54.4848857 ], [ -126.136499399999977, 54.4851051 ], [ -126.136319, 54.4852803 ], [ -126.1362528, 54.4853144 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17092270, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 178746.75224186599, "blue_line_key": 360873822, "length_metre": 535.91467340752399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.628299700000014, 54.4102358 ], [ -126.6281511, 54.4103042 ], [ -126.6278102, 54.4103554 ], [ -126.6273259, 54.4103056 ], [ -126.6269293, 54.4101375 ], [ -126.6265555, 54.409798599999988 ], [ -126.6262996, 54.4096903 ], [ -126.6258434, 54.4095949 ], [ -126.6253654, 54.4096676 ], [ -126.624517899999987, 54.4100208 ], [ -126.624344799999989, 54.4102999 ], [ -126.624404599999977, 54.4105919 ], [ -126.624573899999987, 54.4108012 ], [ -126.625492, 54.4114322 ], [ -126.6255523, 54.4119406 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17094416, "stream_order": 5, "gnis_name": "Bulkley River", "downstream_route_measure": 259882.47478030901, "blue_line_key": 360873822, "length_metre": 319.79940707182499, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1043648, 54.3804263 ], [ -126.099561099999988, 54.3810837 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104759, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 36554.541143574497, "blue_line_key": 360886221, "length_metre": 479.98251709047099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.57967, 54.2094992 ], [ -126.579541899999981, 54.2093525 ], [ -126.5794856, 54.2092713 ], [ -126.579446, 54.209136 ], [ -126.579424599999982, 54.2089908 ], [ -126.5794134, 54.2089195 ], [ -126.579371, 54.2088469 ], [ -126.5793186, 54.2086931 ], [ -126.5792667, 54.2085379 ], [ -126.579242499999978, 54.2084481 ], [ -126.579229399999988, 54.2083755 ], [ -126.57919290000001, 54.2082316 ], [ -126.579184500000011, 54.208132 ], [ -126.57928050000001, 54.2080266 ], [ -126.5793143, 54.2079724 ], [ -126.5793506, 54.2078841 ], [ -126.5793428, 54.2077759 ], [ -126.579302799999979, 54.2076762 ], [ -126.5792153, 54.2075936 ], [ -126.579082, 54.2075096 ], [ -126.578963, 54.207454 ], [ -126.5788392, 54.2074597 ], [ -126.5787127, 54.207521 ], [ -126.5786166, 54.2075993 ], [ -126.5785657, 54.2076876 ], [ -126.5785725, 54.2078329 ], [ -126.578584299999974, 54.2078955 ], [ -126.578639599999988, 54.2079867 ], [ -126.5786497, 54.2080679 ], [ -126.5785825, 54.2081747 ], [ -126.578549699999982, 54.2082188 ], [ -126.5783916, 54.2083143 ], [ -126.578298899999979, 54.2083214 ], [ -126.578208, 54.20831 ], [ -126.5781042, 54.2082459 ], [ -126.578061800000015, 54.2081733 ], [ -126.5780043, 54.2081092 ], [ -126.5779014, 54.208008 ], [ -126.5778603, 54.2079525 ], [ -126.577788599999977, 54.2078528 ], [ -126.577718600000011, 54.2077346 ], [ -126.5776803, 54.2076164 ], [ -126.5776227, 54.2075523 ], [ -126.577516099999983, 54.2075509 ], [ -126.5774075, 54.207548 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17095959, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 8489.5510003751006, "blue_line_key": 360886221, "length_metre": 699.22588155534697, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6115471, 54.3506312 ], [ -126.611413899999988, 54.3505301 ], [ -126.6113875, 54.350466 ], [ -126.6113775, 54.3503763 ], [ -126.611366300000014, 54.3503037 ], [ -126.6113776, 54.3500971 ], [ -126.611400599999982, 54.3499547 ], [ -126.6114343, 54.3499006 ], [ -126.611627899999988, 54.3497525 ], [ -126.611896, 54.3496499 ], [ -126.612099199999989, 54.3496001 ], [ -126.612333600000014, 54.3495588 ], [ -126.612411, 54.3495332 ], [ -126.612475899999978, 54.3494805 ], [ -126.612662, 54.3494306 ], [ -126.612822, 54.3493437 ], [ -126.612888699999985, 54.3492369 ], [ -126.6128966, 54.349103 ], [ -126.6129092, 54.3489136 ], [ -126.612881799999982, 54.3488595 ], [ -126.61262259999998, 54.3488182 ], [ -126.6124066, 54.3488139 ], [ -126.6123115, 54.3488481 ], [ -126.612152399999985, 54.3489535 ], [ -126.6119498, 54.3489948 ], [ -126.6117196, 54.3489891 ], [ -126.6116441, 54.3489606 ], [ -126.6114969, 54.348851 ], [ -126.6114699, 54.3487954 ], [ -126.6114478, 54.3486074 ], [ -126.6114568, 54.3484636 ], [ -126.6114667, 54.3483098 ], [ -126.611521499999981, 54.3481673 ], [ -126.611637, 54.3480263 ], [ -126.6118487, 54.3478056 ], [ -126.6119289, 54.3477444 ], [ -126.612124099999988, 54.3475777 ], [ -126.6122257, 54.3473997 ], [ -126.612356, 54.3472858 ], [ -126.6125833, 54.3470835 ], [ -126.6126846, 54.3469411 ], [ -126.61274130000001, 54.3467446 ], [ -126.612791, 54.3467004 ], [ -126.6128642, 54.3465124 ], [ -126.6128666, 54.3464498 ], [ -126.6128612, 54.3462703 ], [ -126.6128725, 54.3460638 ], [ -126.6128467, 54.3459912 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17055047, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 27826.729020515901, "blue_line_key": 360856488, "length_metre": 301.67017037440701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.590926, 54.6259822 ], [ -126.590954199999985, 54.6260363 ], [ -126.5908984, 54.6261702 ], [ -126.590985300000014, 54.6262898 ], [ -126.591137499999988, 54.6263197 ], [ -126.591277699999978, 54.6263126 ], [ -126.5913374, 54.6263681 ], [ -126.591377, 54.6264678 ], [ -126.5913695, 54.6266117 ], [ -126.5913597, 54.6267911 ], [ -126.591366400000013, 54.6269079 ], [ -126.5914104, 54.6269805 ], [ -126.5914462, 54.6271344 ], [ -126.591512200000011, 54.6273508 ], [ -126.59152180000001, 54.6274235 ], [ -126.5915352, 54.6274776 ], [ -126.5915712, 54.627667 ], [ -126.5916691, 54.627840799999987 ], [ -126.5917512, 54.6280031 ], [ -126.5917766, 54.6280943 ], [ -126.5917743, 54.6281655 ], [ -126.5918383, 54.6283734 ], [ -126.5919104, 54.6284646 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17087195, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 234761.148202871, "blue_line_key": 360873822, "length_metre": 53.022633968504401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2390309, 54.4560526 ], [ -126.238993799999974, 54.4559159 ], [ -126.238975599999989, 54.4557265 ], [ -126.238924, 54.4555826 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076506, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 206946.63600437099, "blue_line_key": 360873822, "length_metre": 117.951610416835, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4530049, 54.5124599 ], [ -126.4519707, 54.5124357 ], [ -126.4512032, 54.512546699999987 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17085392, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 197530.84325876, "blue_line_key": 360873822, "length_metre": 439.35328834642701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5128237, 54.467548799999989 ], [ -126.513198300000013, 54.4679704 ], [ -126.51330870000001, 54.4682296 ], [ -126.513248199999978, 54.4683678 ], [ -126.513085499999988, 54.4684546 ], [ -126.512775699999978, 54.4684646 ], [ -126.5124904, 54.4683621 ], [ -126.5122682, 54.4681356 ], [ -126.5120473, 54.4680032 ], [ -126.511819, 54.4679832 ], [ -126.5114637, 54.4680673 ], [ -126.5110512, 54.4683151 ], [ -126.5108224, 54.4685629 ], [ -126.5105067, 54.4693961 ], [ -126.5102531, 54.4696239 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17067610, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 631.69958047264697, "blue_line_key": 360881574, "length_metre": 226.88870004441799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5981867, 54.558768 ], [ -126.5985228, 54.5588549 ], [ -126.5986107, 54.5589204 ], [ -126.5986235, 54.5589831 ], [ -126.598708, 54.5591013 ], [ -126.598858799999988, 54.5591768 ], [ -126.5989502, 54.5591967 ], [ -126.5992287, 54.559201 ], [ -126.5995962, 54.5592537 ], [ -126.5997185, 54.5592836 ], [ -126.5999902, 54.559379 ], [ -126.60000740000001, 54.559379 ], [ -126.6003444, 54.5594132 ], [ -126.6006514, 54.559463 ], [ -126.600878399999985, 54.5595314 ], [ -126.6011515, 54.5596439 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17077525, "stream_order": 5, "gnis_name": "Richfield Creek", "downstream_route_measure": 0.0, "blue_line_key": 360788426, "length_metre": 15.479631892393099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.344089, 54.5075478 ], [ -126.3440364, 54.5076831 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092306, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 12257.5160566959, "blue_line_key": 360862508, "length_metre": 60.220790056869497, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.408311, 54.4105919 ], [ -126.407805599999989, 54.410139 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17090565, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 182563.56936713, "blue_line_key": 360873822, "length_metre": 87.390243010439605, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.60707810000001, 54.4263251 ], [ -126.6068989, 54.4267552 ], [ -126.606423, 54.4269546 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17091060, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 181612.628106875, "blue_line_key": 360873822, "length_metre": 357.01288431617002, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.607041599999974, 54.4223345 ], [ -126.6068979, 54.4225709 ], [ -126.6067107, 54.422729 ], [ -126.606328399999981, 54.4228002 ], [ -126.6060083, 54.4227845 ], [ -126.6056825, 54.4226378 ], [ -126.6049382, 54.4220482 ], [ -126.6043388, 54.4219841 ], [ -126.6040171, 54.4220924 ], [ -126.603362299999986, 54.4226507 ], [ -126.6033064, 54.4227689 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17097419, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 13680.673238233399, "blue_line_key": 360881038, "length_metre": 1698.72446702755, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.137526799999989, 54.3319869 ], [ -126.1372797, 54.3319812 ], [ -126.1369873, 54.331992600000014 ], [ -126.1367695, 54.332041 ], [ -126.13643780000001, 54.3321407 ], [ -126.1363002, 54.3321564 ], [ -126.136135799999977, 54.3320709 ], [ -126.136004500000013, 54.3319684 ], [ -126.1358096, 54.3318929 ], [ -126.135599199999987, 54.3318331 ], [ -126.1354202, 54.3317476 ], [ -126.1352748, 54.3316365 ], [ -126.1352085, 54.3314827 ], [ -126.1352199, 54.3313033 ], [ -126.1351682, 54.3311495 ], [ -126.1350553, 54.3310298 ], [ -126.1347278, 54.3308418 ], [ -126.1344835, 54.3306197 ], [ -126.1344001, 54.3304658 ], [ -126.1344133, 54.3302949 ], [ -126.1345004, 54.3301625 ], [ -126.134599099999974, 54.3300386 ], [ -126.134673399999983, 54.3298876 ], [ -126.1347593, 54.3297452 ], [ -126.1348745, 54.3296227 ], [ -126.134961, 54.3294988 ], [ -126.134958900000015, 54.3293094 ], [ -126.134828899999974, 54.3291898 ], [ -126.134470799999988, 54.3290189 ], [ -126.1342778, 54.3289248 ], [ -126.1340834, 54.3288479 ], [ -126.1338115, 54.3287696 ], [ -126.133610300000015, 54.3287924 ], [ -126.1333753, 54.3288408 ], [ -126.133142799999987, 54.3288892 ], [ -126.1328773, 54.3289277 ], [ -126.1325818, 54.3289747 ], [ -126.1322736, 54.3289761 ], [ -126.1319678, 54.3289775 ], [ -126.131675500000014, 54.3289619 ], [ -126.131464, 54.328912 ], [ -126.1312519, 54.3288437 ], [ -126.1308958, 54.3286742 ], [ -126.1307491, 54.3285802 ], [ -126.1306345, 54.328452 ], [ -126.130721, 54.328301 ], [ -126.1308891, 54.3283224 ], [ -126.1309637, 54.3283523 ], [ -126.1311967, 54.3283295 ], [ -126.1312539, 54.3281786 ], [ -126.1312169, 54.3280248 ], [ -126.131104, 54.3279051 ], [ -126.130973399999988, 54.327794 ], [ -126.1308085, 54.32771 ], [ -126.130613499999981, 54.3276416 ], [ -126.1304333, 54.3275662 ], [ -126.130238299999988, 54.3274978 ], [ -126.1300606, 54.3274223 ], [ -126.1299606, 54.3272941 ], [ -126.1299744, 54.3271147 ], [ -126.129970499999985, 54.3269438 ], [ -126.1299501, 54.3267714 ], [ -126.1298378, 54.3266433 ], [ -126.129672299999982, 54.3265678 ], [ -126.1293309, 54.3263983 ], [ -126.129005299999989, 54.3262188 ], [ -126.128876, 54.3260907 ], [ -126.128858599999987, 54.3259098 ], [ -126.128855399999978, 54.3257303 ], [ -126.1288527, 54.3255495 ], [ -126.1288494, 54.32537 ], [ -126.1288456, 54.3251991 ], [ -126.128842299999988, 54.3250197 ], [ -126.1287754, 54.3248744 ], [ -126.1286925, 54.3247462 ], [ -126.1285772, 54.3246266 ], [ -126.128479699999986, 54.3244984 ], [ -126.1283975, 54.3243617 ], [ -126.1282968, 54.3242421 ], [ -126.128134399999979, 54.324158 ], [ -126.1279395, 54.3240897 ], [ -126.1277593, 54.3240142 ], [ -126.127401299999988, 54.323843300000014 ], [ -126.127205799999984, 54.3237763 ], [ -126.1270102, 54.3237165 ], [ -126.1268026, 54.3236225 ], [ -126.126493, 54.323426 ], [ -126.1262987, 54.3233491 ], [ -126.1260237, 54.3233063 ], [ -126.1258282, 54.3232394 ], [ -126.1256346, 54.323154 ], [ -126.12545489999998, 54.323077 ], [ -126.125259500000013, 54.3230101 ], [ -126.1250352, 54.3229417 ], [ -126.124808500000015, 54.3228734 ], [ -126.12445120000001, 54.322721 ], [ -126.1243035, 54.3226099 ], [ -126.1241385, 54.3225601 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17088495, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 238223.12070440501, "blue_line_key": 360873822, "length_metre": 792.71194227866999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.214788, 54.446756799999989 ], [ -126.2146499, 54.4467525 ], [ -126.2144652, 54.4467212 ], [ -126.2143608, 54.4466842 ], [ -126.214270499999984, 54.4466628 ], [ -126.2141801, 54.4466073 ], [ -126.213958100000013, 54.4464677 ], [ -126.2138293, 54.446321 ], [ -126.2137714, 54.4462569 ], [ -126.213676099999986, 54.446091700000011 ], [ -126.213654, 54.4459479 ], [ -126.213554699999975, 54.4458282 ], [ -126.213334499999974, 54.4456701 ], [ -126.2131392, 54.4455861 ], [ -126.212925, 54.4455619 ], [ -126.2128301, 54.4455875 ], [ -126.2127664, 54.4456217 ], [ -126.2127288, 54.44572 ], [ -126.212739, 54.4458012 ], [ -126.2127656, 54.4458638 ], [ -126.2128224, 54.4459379 ], [ -126.2129483, 54.4461202 ], [ -126.2129591, 54.4461928 ], [ -126.212968600000011, 54.4462826 ], [ -126.212974099999983, 54.4464179 ], [ -126.2129406, 54.4464705 ], [ -126.2127497, 54.446566 ], [ -126.212575199999989, 54.446615799999989 ], [ -126.212461600000012, 54.4467212 ], [ -126.2124044, 54.4468537 ], [ -126.2124254, 54.4470075 ], [ -126.212444, 54.4471884 ], [ -126.212391599999989, 54.4472937 ], [ -126.2122443, 54.4473906 ], [ -126.2121329, 54.4474419 ], [ -126.2120109, 54.4474476 ], [ -126.2117484, 54.4474419 ], [ -126.211550699999989, 54.447392 ], [ -126.211191199999988, 54.4472396 ], [ -126.211043, 54.4471471 ], [ -126.211001599999989, 54.4470915 ], [ -126.2109931, 54.4469647 ], [ -126.21101130000001, 54.4469206 ], [ -126.2110142, 54.446885 ], [ -126.2110671, 54.4467782 ], [ -126.21131, 54.44664 ], [ -126.2113435, 54.4465873 ], [ -126.21134739999998, 54.4465147 ], [ -126.211294200000012, 54.4463965 ], [ -126.2111643, 54.4462598 ], [ -126.210863300000014, 54.4461629 ], [ -126.210549299999983, 54.4460205 ], [ -126.2104755, 54.4459735 ], [ -126.2104647, 54.4459009 ], [ -126.210485299999988, 54.4458297 ], [ -126.2106149, 54.4457342 ], [ -126.2108701, 54.4456231 ], [ -126.2108876, 54.4455605 ], [ -126.210815, 54.4454964 ], [ -126.21071, 54.445475 ], [ -126.2103737, 54.445422300000011 ], [ -126.2102835, 54.4453938 ], [ -126.210209600000013, 54.4453469 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104846, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 7128.3718027885898, "blue_line_key": 360882583, "length_metre": 111.198075797429, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.975652, 54.2083214 ], [ -125.9756518, 54.2082957 ], [ -125.975723, 54.2082217 ], [ -125.9757374, 54.2080052 ], [ -125.9755908, 54.2079012 ], [ -125.9754818, 54.2078671 ], [ -125.9754357, 54.20785990000001 ], [ -125.9753884, 54.2078428 ], [ -125.9752798, 54.2078272 ], [ -125.9752308, 54.2078015 ], [ -125.9751968, 54.2077488 ], [ -125.9751953, 54.2077132 ], [ -125.9751985, 54.2075338 ], [ -125.9751963, 54.2075067 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17053667, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 21948.2719904736, "blue_line_key": 360856488, "length_metre": 924.04503111222095, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.53307310000001, 54.6385266 ], [ -126.5331704, 54.6384654 ], [ -126.5332358, 54.6384041 ], [ -126.5334171, 54.6382275 ], [ -126.5335492, 54.6380865 ], [ -126.5337115, 54.6379726 ], [ -126.5337892, 54.637947 ], [ -126.534011, 54.6378886 ], [ -126.5342729, 54.6378857 ], [ -126.5346622, 54.6378843 ], [ -126.535034700000011, 54.6378743 ], [ -126.5352694, 54.637843 ], [ -126.535473599999989, 54.6377931 ], [ -126.535729299999986, 54.6376721 ], [ -126.5360346, 54.6374713 ], [ -126.5361486, 54.6373758 ], [ -126.5362149, 54.6373046 ], [ -126.5363357, 54.6371181 ], [ -126.5364512, 54.6370041 ], [ -126.536727899999988, 54.6367933 ], [ -126.5370747, 54.6366936 ], [ -126.5371982, 54.636678 ], [ -126.5375593, 54.6366224 ], [ -126.5378407, 54.6365555 ], [ -126.5380034, 54.636433 ], [ -126.538231400000015, 54.63624930000001 ], [ -126.538313100000011, 54.6362051 ], [ -126.5385329, 54.6361382 ], [ -126.5386746, 54.6361055 ], [ -126.5390195, 54.6360399 ], [ -126.53934910000001, 54.6359758 ], [ -126.539565599999989, 54.6359616 ], [ -126.5396764, 54.6359545 ], [ -126.539984899999979, 54.6359516 ], [ -126.5402487, 54.6359573 ], [ -126.540554500000013, 54.6360271 ], [ -126.5407143, 54.6361923 ], [ -126.540859699999984, 54.6363561 ], [ -126.541079599999989, 54.6365683 ], [ -126.5411698, 54.6366139 ], [ -126.541321499999981, 54.6366808 ], [ -126.5414617, 54.6366737 ], [ -126.5416492, 54.6366509 ], [ -126.541775099999981, 54.6365997 ], [ -126.5418862, 54.6365484 ], [ -126.542192, 54.6363746 ], [ -126.542355199999989, 54.6362436 ], [ -126.542465400000012, 54.6362094 ], [ -126.5425584, 54.6362108 ], [ -126.542867, 54.636208 ], [ -126.5431312, 54.6362051 ], [ -126.5434885, 54.6362037 ], [ -126.5437681, 54.6361994 ], [ -126.5438916, 54.6361838 ], [ -126.5440514, 54.6361339 ], [ -126.544355200000012, 54.6359516 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17085138, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 1507.1144438242, "blue_line_key": 360846413, "length_metre": 1940.4376971044301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.280397799999989, 54.4700184 ], [ -126.280659299999982, 54.4700412 ], [ -126.280857899999987, 54.4700825 ], [ -126.28093290000001, 54.4701195 ], [ -126.2812555, 54.4703431 ], [ -126.281573400000013, 54.4704485 ], [ -126.2816951, 54.4704784 ], [ -126.2820324, 54.4705226 ], [ -126.2822549, 54.4706622 ], [ -126.282375199999976, 54.4706821 ], [ -126.2827093, 54.470797499999989 ], [ -126.2827985, 54.470835900000012 ], [ -126.283173299999973, 54.4709883 ], [ -126.2835441, 54.4710139 ], [ -126.2837857, 54.4710652 ], [ -126.2840718, 54.4711706 ], [ -126.2842966, 54.4712831 ], [ -126.284601, 54.4713714 ], [ -126.2849018, 54.4714768 ], [ -126.2849758, 54.4715238 ], [ -126.2850031, 54.4715779 ], [ -126.2850245, 54.4717317 ], [ -126.2850906, 54.471877 ], [ -126.2852654, 54.4720337 ], [ -126.285339900000011, 54.4720793 ], [ -126.2854463, 54.4721177 ], [ -126.2857808, 54.4721975 ], [ -126.2859604, 54.4722644 ], [ -126.286292, 54.4723798 ], [ -126.2866699, 54.4725236 ], [ -126.287031500000012, 54.4726304 ], [ -126.2873319, 54.4727714 ], [ -126.287644899999989, 54.4729324 ], [ -126.2878242, 54.4730349 ], [ -126.288022199999986, 54.4730847 ], [ -126.2883912, 54.4731018 ], [ -126.288744600000015, 54.4731004 ], [ -126.288898800000013, 54.4731218 ], [ -126.2890346, 54.4731602 ], [ -126.2893352, 54.4732941 ], [ -126.2896919, 54.4734906 ], [ -126.2898278, 54.4735291 ], [ -126.2900856, 54.4736245 ], [ -126.2904017, 54.4737214 ], [ -126.2906887, 54.4738453 ], [ -126.2909593, 54.4739322 ], [ -126.2912161, 54.4740375 ], [ -126.291413299999988, 54.4740689 ], [ -126.291519799999989, 54.4741073 ], [ -126.2916251, 54.4741629 ], [ -126.291907299999977, 54.4743138 ], [ -126.2920104, 54.4743964 ], [ -126.292182900000014, 54.4745802 ], [ -126.292299, 54.4746813 ], [ -126.292390200000014, 54.4747283 ], [ -126.2927027, 54.474897800000015 ], [ -126.29294560000001, 54.4749661 ], [ -126.293293600000013, 54.475063 ], [ -126.293399, 54.4751114 ], [ -126.293714, 54.4752253 ], [ -126.2938623, 54.4753464 ], [ -126.2941253, 54.4755586 ], [ -126.2944674, 54.4757551 ], [ -126.2948451, 54.4758719 ], [ -126.2949685, 54.4758833 ], [ -126.2952886, 54.4759346 ], [ -126.2955925, 54.4760314 ], [ -126.295920900000013, 54.4761838 ], [ -126.296102199999979, 54.4762323 ], [ -126.2962711, 54.4762536 ], [ -126.2966107, 54.4762707 ], [ -126.2968057, 54.4763291 ], [ -126.2968969, 54.4763761 ], [ -126.2969302, 54.4765655 ], [ -126.296966399999988, 54.4767193 ], [ -126.2970618, 54.4769273 ], [ -126.29726239999998, 54.4771566 ], [ -126.297319300000012, 54.4772036 ], [ -126.2976792, 54.4773916 ], [ -126.2977554, 54.477411499999988 ], [ -126.298060600000014, 54.4774357 ], [ -126.29837, 54.4774343 ], [ -126.2986129, 54.4775026 ], [ -126.2987598, 54.4776137 ], [ -126.2988271, 54.477749 ], [ -126.298940099999982, 54.4779142 ], [ -126.2990136, 54.4779698 ], [ -126.2991952, 54.4780453 ], [ -126.2992992, 54.4780837 ], [ -126.2996507, 54.478136400000011 ], [ -126.299851599999982, 54.4781507 ], [ -126.300175, 54.4781578 ], [ -126.300375100000011, 54.4781535 ], [ -126.3004683, 54.4781464 ], [ -126.300765700000014, 54.4781165 ], [ -126.3010008, 54.478041 ], [ -126.30133330000001, 54.4779399 ], [ -126.301548, 54.4779356 ], [ -126.301671, 54.4779484 ], [ -126.302020399999989, 54.4780552 ], [ -126.302371099999988, 54.4780894 ], [ -126.302482, 54.4780738 ], [ -126.3026205, 54.4780495 ], [ -126.3028264, 54.4780011 ], [ -126.3030429, 54.4779783 ], [ -126.3032635, 54.4779299 ], [ -126.3035771, 54.4778473 ], [ -126.3037003, 54.4778316 ], [ -126.303889500000011, 54.4777818 ], [ -126.3040502, 54.4776949 ], [ -126.3041313, 54.4776251 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17065216, "stream_order": 4, "gnis_name": "Redtop Creek", "downstream_route_measure": 1664.86871731878, "blue_line_key": 360883143, "length_metre": 277.279520712796, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.302619899999982, 54.5724946 ], [ -126.3027625, 54.5727039 ], [ -126.3028114, 54.5728933 ], [ -126.302776599999973, 54.5729645 ], [ -126.3027022, 54.573134 ], [ -126.3027088, 54.5732693 ], [ -126.3026989, 54.5734303 ], [ -126.302722799999984, 54.57353 ], [ -126.3027647, 54.5735855 ], [ -126.302953, 54.5738048 ], [ -126.3030064, 54.5739045 ], [ -126.303106599999978, 54.5740598 ], [ -126.303235500000014, 54.5741894 ], [ -126.3034721, 54.5743831 ], [ -126.303619, 54.5744756 ], [ -126.3037699, 54.5745426 ], [ -126.304118699999989, 54.5746409 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17080264, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 7002.6910893843797, "blue_line_key": 360875052, "length_metre": 321.79024805190801, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.396836, 54.4946957 ], [ -126.4015035, 54.4936907 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17071466, "stream_order": 5, "gnis_name": "Richfield Creek", "downstream_route_measure": 5411.3009892154396, "blue_line_key": 360788426, "length_metre": 779.76387623014898, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3193704, 54.5405638 ], [ -126.3192318, 54.540588 ], [ -126.319014799999977, 54.5405837 ], [ -126.318644100000014, 54.5405837 ], [ -126.3183662, 54.540578 ], [ -126.3181361, 54.5405552 ], [ -126.3181082, 54.5404741 ], [ -126.318010699999988, 54.5403188 ], [ -126.317944, 54.5401736 ], [ -126.3177965, 54.5400625 ], [ -126.317485, 54.5400824 ], [ -126.3173232, 54.5401864 ], [ -126.3172417, 54.5402647 ], [ -126.317108499999989, 54.5404057 ], [ -126.3169738, 54.5405652 ], [ -126.316792100000015, 54.5407675 ], [ -126.316708199999979, 54.5408387 ], [ -126.3164956, 54.5410309 ], [ -126.316526899999985, 54.541256 ], [ -126.3165483, 54.5414183 ], [ -126.316527, 54.5414995 ], [ -126.3164766, 54.5415522 ], [ -126.3163966, 54.5416049 ], [ -126.3161605, 54.541661899999987 ], [ -126.3159119, 54.5416918 ], [ -126.3156149, 54.5417402 ], [ -126.3154293, 54.5417445 ], [ -126.315307299999986, 54.5417145 ], [ -126.31520110000001, 54.5416676 ], [ -126.3150726, 54.5415023 ], [ -126.3149279, 54.5413557 ], [ -126.3147755, 54.5413072 ], [ -126.3144368, 54.5413001 ], [ -126.3141122, 54.5413015 ], [ -126.3139397, 54.5413243 ], [ -126.313891700000013, 54.541377 ], [ -126.3137417, 54.5415451 ], [ -126.313539800000015, 54.5417559 ], [ -126.313494899999981, 54.5419809 ], [ -126.3134969, 54.5421774 ], [ -126.313504099999989, 54.5423312 ], [ -126.3134673, 54.5423939 ], [ -126.3133796, 54.5425805 ], [ -126.3133095, 54.5426958 ], [ -126.3130803, 54.5428796 ], [ -126.312711, 54.54307750000001 ], [ -126.3124406, 54.5431972 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080845, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 226611.85715324499, "blue_line_key": 360873822, "length_metre": 291.76121337356, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2758966, 54.4931661 ], [ -126.2757296, 54.4930906 ], [ -126.275406100000012, 54.4928756 ], [ -126.275259199999979, 54.4927645 ], [ -126.2750091, 54.4925708 ], [ -126.274729799999989, 54.492348600000014 ], [ -126.2745992, 54.492219 ], [ -126.274522599999983, 54.4919925 ], [ -126.2744952, 54.4919384 ], [ -126.2743702, 54.4917376 ], [ -126.274120200000013, 54.4915439 ], [ -126.2738802, 54.4914115 ], [ -126.2737361, 54.4912648 ], [ -126.273694, 54.4912107 ], [ -126.273538800000011, 54.4909913 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17084562, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 231061.66627241601, "blue_line_key": 360873822, "length_metre": 151.01252590243701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.258457299999989, 54.4728754 ], [ -126.2583643, 54.4729096 ], [ -126.2582977, 54.4729523 ], [ -126.2582246, 54.473130299999987 ], [ -126.2581794, 54.4733539 ], [ -126.258145399999989, 54.473408 ], [ -126.2580504, 54.4734408 ], [ -126.2578646, 54.4734465 ], [ -126.257758399999986, 54.4734351 ], [ -126.257485300000013, 54.4733482 ], [ -126.2573066, 54.4732443 ], [ -126.2571115, 54.4731588 ], [ -126.257005299999989, 54.4731474 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17098321, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 28347.254476136499, "blue_line_key": 360880905, "length_metre": 76.215237968024596, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4269572, 54.306855299999988 ], [ -126.427047800000011, 54.3069023 ], [ -126.4273482, 54.3069977 ], [ -126.4275017, 54.3070191 ], [ -126.427522499999981, 54.3071458 ], [ -126.4275808, 54.3072014 ], [ -126.4276738, 54.3072213 ], [ -126.427667899999989, 54.3072925 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091092, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 273895.43625880597, "blue_line_key": 360873822, "length_metre": 171.09468123131899, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1221204, 54.4231762 ], [ -126.1223986, 54.4231648 ], [ -126.1227223, 54.4231634 ], [ -126.122873700000014, 54.4231847 ], [ -126.123191299999988, 54.4232816 ], [ -126.1234924, 54.4233969 ], [ -126.123744, 54.4235208 ], [ -126.1238513, 54.4235493 ], [ -126.1240358, 54.4235536 ], [ -126.1244319, 54.4236091 ], [ -126.124555099999981, 54.4236205 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091680, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 16799.6716736901, "blue_line_key": 360862508, "length_metre": 73.904903188384694, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3504285, 54.416956399999989 ], [ -126.349485800000011, 54.416583 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17070202, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 5519.3263371939802, "blue_line_key": 360856488, "length_metre": 896.05525165968697, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.433273399999976, 54.5462991 ], [ -126.4331113, 54.5464401 ], [ -126.4328663, 54.5466423 ], [ -126.4328616, 54.546705 ], [ -126.4328721, 54.5467947 ], [ -126.432899299999974, 54.5468574 ], [ -126.4330109, 54.5470582 ], [ -126.4330586, 54.5472661 ], [ -126.433068, 54.547365799999987 ], [ -126.433060099999977, 54.5475082 ], [ -126.433050099999988, 54.5476706 ], [ -126.4330548, 54.5478329 ], [ -126.433012800000014, 54.5480024 ], [ -126.433005399999985, 54.5481363 ], [ -126.433012299999987, 54.548236 ], [ -126.433019499999986, 54.5483984 ], [ -126.4330405, 54.5485422 ], [ -126.433036199999989, 54.5486319 ], [ -126.433036199999989, 54.548857 ], [ -126.4330404, 54.5490279 ], [ -126.433076500000013, 54.5491988 ], [ -126.433191400000013, 54.5493269 ], [ -126.433294699999976, 54.549411 ], [ -126.4336244, 54.5496061 ], [ -126.433950599999974, 54.5498112 ], [ -126.434111699999974, 54.5499408 ], [ -126.4341546, 54.550022 ], [ -126.4341085, 54.5502456 ], [ -126.4341325, 54.5503809 ], [ -126.4342458, 54.5505276 ], [ -126.4343916, 54.5506657 ], [ -126.434657, 54.5508694 ], [ -126.4348189, 54.5510246 ], [ -126.434921300000013, 54.5510901 ], [ -126.4352201, 54.5512681 ], [ -126.4353413, 54.5513151 ], [ -126.4355977, 54.5514106 ], [ -126.4358285, 54.5514248 ], [ -126.4359838, 54.5514091 ], [ -126.4363084, 54.5514077 ], [ -126.4364641, 54.5514191 ], [ -126.4366602, 54.5515046 ], [ -126.4368354, 54.5516427 ], [ -126.4370736, 54.5517837 ], [ -126.4372949, 54.5519589 ], [ -126.437575900000013, 54.5521811 ], [ -126.4378324, 54.5522765 ], [ -126.4381387, 54.5523278 ], [ -126.438319, 54.5524303 ], [ -126.438375799999989, 54.5524858 ], [ -126.4383883, 54.5525485 ], [ -126.438349, 54.5526824 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17070253, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 8615.3459555262998, "blue_line_key": 360875378, "length_metre": 323.28316364438302, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.543322499999988, 54.5456454 ], [ -126.5434117, 54.5456924 ], [ -126.5437871, 54.5458989 ], [ -126.543830199999988, 54.5459445 ], [ -126.5439576, 54.5461438 ], [ -126.544015, 54.5461908 ], [ -126.5442798, 54.5464116 ], [ -126.5444589, 54.5465326 ], [ -126.5445816, 54.5465611 ], [ -126.5448595, 54.5465668 ], [ -126.5449001, 54.5466765 ], [ -126.544892600000011, 54.5467833 ], [ -126.544899699999988, 54.5469186 ], [ -126.54488, 54.5469898 ], [ -126.5448532, 54.5471878 ], [ -126.544793899999988, 54.5474014 ], [ -126.544804700000014, 54.5474555 ], [ -126.544877199999988, 54.5475652 ], [ -126.545054799999988, 54.5476763 ], [ -126.545366300000012, 54.5478899 ], [ -126.5454708, 54.547964 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17066496, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 4812.9331553684297, "blue_line_key": 360851751, "length_metre": 266.46778968665598, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1735634, 54.5661122 ], [ -126.1698856, 54.5671994 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17083397, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 229322.720505887, "blue_line_key": 360873822, "length_metre": 317.59046485961602, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.257279200000013, 54.4819006 ], [ -126.2572628, 54.4817468 ], [ -126.257393799999988, 54.4815987 ], [ -126.2576678, 54.481434899999989 ], [ -126.2577295, 54.4812611 ], [ -126.257610199999988, 54.4810589 ], [ -126.2572846, 54.4807541 ], [ -126.256931099999989, 54.480569 ], [ -126.256446799999978, 54.480428 ], [ -126.256237399999975, 54.4802585 ], [ -126.256148199999984, 54.480123199999987 ], [ -126.2561366, 54.4798455 ], [ -126.256195800000015, 54.4796788 ], [ -126.25636, 54.4795549 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17083960, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 229752.80159110899, "blue_line_key": 360873822, "length_metre": 278.98338373501201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2572293, 54.4787987 ], [ -126.2572092, 54.4786278 ], [ -126.25716580000001, 54.4785637 ], [ -126.257102599999982, 54.478382800000013 ], [ -126.2570226, 54.4781734 ], [ -126.2569894, 54.477984 ], [ -126.2569715, 54.4777861 ], [ -126.256976, 54.4777319 ], [ -126.256988899999982, 54.477544 ], [ -126.257011399999982, 54.4774186 ], [ -126.257116900000014, 54.4772321 ], [ -126.257151, 54.477170799999989 ], [ -126.257235099999988, 54.4770996 ], [ -126.257505400000014, 54.4769529 ], [ -126.257662799999977, 54.4769031 ], [ -126.2577744, 54.4768788 ], [ -126.2580541, 54.4768575 ], [ -126.2581923, 54.476861700000015 ], [ -126.258297299999981, 54.4768902 ], [ -126.258356600000013, 54.4769372 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17085877, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 232962.09547438301, "blue_line_key": 360873822, "length_metre": 118.226876273488, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2519314, 54.4656959 ], [ -126.251825700000012, 54.465676 ], [ -126.251717700000015, 54.4656561 ], [ -126.251554500000012, 54.4655706 ], [ -126.2515125, 54.4655165 ], [ -126.2514743, 54.4653897 ], [ -126.251522400000013, 54.465337 ], [ -126.251619600000012, 54.4652844 ], [ -126.2516531, 54.4652317 ], [ -126.2516429, 54.4651775 ], [ -126.2516156, 54.4651234 ], [ -126.2514177, 54.4650736 ], [ -126.251235899999983, 54.4650337 ], [ -126.251113, 54.4650209 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092128, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 14453.3703169819, "blue_line_key": 360862508, "length_metre": 209.74954388739101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3798829, 54.4119904 ], [ -126.3796061, 54.4120118 ], [ -126.379497, 54.412009 ], [ -126.3791264, 54.4120189 ], [ -126.379018, 54.4120346 ], [ -126.3787991, 54.412093 ], [ -126.37868180000001, 54.4122169 ], [ -126.378674599999982, 54.4123337 ], [ -126.3787014, 54.4123963 ], [ -126.378859, 54.4125801 ], [ -126.3788871, 54.4126527 ], [ -126.3792439, 54.4128407 ], [ -126.3793013, 54.4129133 ], [ -126.379327, 54.412986 ], [ -126.3792936, 54.4130387 ], [ -126.379148, 54.4131526 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104200, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 3865.53093348228, "blue_line_key": 360882583, "length_metre": 83.470699761912499, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0053297, 54.2165633 ], [ -126.005068, 54.2165661 ], [ -126.004732799999985, 54.2165305 ], [ -126.0045486, 54.2165348 ], [ -126.0042377, 54.2165718 ], [ -126.004080500000015, 54.2166217 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17097875, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 14230.594000624, "blue_line_key": 360886221, "length_metre": 243.156870003374, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.635497199999989, 54.3155458 ], [ -126.636172300000013, 54.3156256 ], [ -126.6367744, 54.3155658 ], [ -126.6370162, 54.315496 ], [ -126.6379022, 54.3151072 ], [ -126.638273899999987, 54.314744 ], [ -126.63836280000001, 54.3145532 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17084745, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 0.0, "blue_line_key": 360239438, "length_metre": 81.708193945933601, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.258457299999989, 54.4728754 ], [ -126.258439700000011, 54.4727045 ], [ -126.2584308, 54.4725777 ], [ -126.2584837, 54.472498 ], [ -126.2585496, 54.4724367 ], [ -126.25865, 54.4723128 ], [ -126.2586688, 54.4722601 ], [ -126.2586295, 54.4721775 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17064156, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 21946.467037420902, "blue_line_key": 360875378, "length_metre": 75.778778509814501, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6755275, 54.5766884 ], [ -126.6765834, 54.5769862 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17062570, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 23179.2085995823, "blue_line_key": 360875378, "length_metre": 592.14662480793697, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6874824, 54.584611700000011 ], [ -126.6885715, 54.5875029 ], [ -126.6907122, 54.5894968 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092230, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 11458.015050444201, "blue_line_key": 360862508, "length_metre": 94.124126147131904, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.419908400000011, 54.4113396 ], [ -126.418572, 54.411007700000013 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100851, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 783.44182989251703, "blue_line_key": 360874778, "length_metre": 868.94770832512302, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.357636299999982, 54.2660759 ], [ -126.3574603, 54.2659278 ], [ -126.357369899999981, 54.2659079 ], [ -126.3571703, 54.2659136 ], [ -126.356902299999987, 54.2660147 ], [ -126.3565757, 54.2660617 ], [ -126.3562325, 54.2659378 ], [ -126.3561391, 54.2659264 ], [ -126.355926, 54.2659221 ], [ -126.3558044, 54.2659007 ], [ -126.3557153, 54.2658637 ], [ -126.355408200000014, 54.2658566 ], [ -126.3551047, 54.2658053 ], [ -126.35477, 54.2657526 ], [ -126.3544171, 54.2657441 ], [ -126.354342, 54.2657156 ], [ -126.3541789, 54.26561310000001 ], [ -126.3540561, 54.2656017 ], [ -126.353739800000014, 54.2655319 ], [ -126.353514499999989, 54.2654464 ], [ -126.3532128, 54.2653496 ], [ -126.35310770000001, 54.2653026 ], [ -126.3530173, 54.2652826 ], [ -126.352880500000012, 54.2652698 ], [ -126.352613, 54.2651388 ], [ -126.3524298, 54.2650989 ], [ -126.35216290000001, 54.2649665 ], [ -126.3520725, 54.2649465 ], [ -126.351874099999975, 54.2649152 ], [ -126.3515358, 54.2648995 ], [ -126.351186, 54.2648824 ], [ -126.350907599999985, 54.2649038 ], [ -126.350597399999984, 54.2649323 ], [ -126.350233100000011, 54.2651046 ], [ -126.3501403, 54.2651117 ], [ -126.349955900000012, 54.265116 ], [ -126.349644599999976, 54.2652086 ], [ -126.3493626, 54.2652741 ], [ -126.349174, 54.265351 ], [ -126.348843100000011, 54.2654778 ], [ -126.3487461, 54.2655304 ], [ -126.348629, 54.265707 ], [ -126.3485705, 54.2659036 ], [ -126.348529099999979, 54.2660731 ], [ -126.3485201, 54.2661998 ], [ -126.348553099999975, 54.2664063 ], [ -126.3485441, 54.2665331 ], [ -126.3485265, 54.2665957 ], [ -126.3483519, 54.2666541 ], [ -126.348272, 54.2667068 ], [ -126.3481255, 54.2668293 ], [ -126.3479522, 54.2669247 ], [ -126.3479162, 54.266977399999988 ], [ -126.3479114, 54.2670586 ], [ -126.3479084, 54.2671213 ], [ -126.347898199999989, 54.2672922 ], [ -126.3478475, 54.267344900000012 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17095320, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 8904.3920938310694, "blue_line_key": 360886524, "length_metre": 1177.57487376829, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.241040899999987, 54.3655982 ], [ -126.2413181, 54.3655954 ], [ -126.2415324, 54.3656182 ], [ -126.241793199999989, 54.3656068 ], [ -126.2420593, 54.3655669 ], [ -126.2423425, 54.3654658 ], [ -126.2426357, 54.3654729 ], [ -126.242786899999984, 54.3654943 ], [ -126.2429076, 54.3655327 ], [ -126.2430552, 54.3656253 ], [ -126.2431441, 54.3656908 ], [ -126.2432507, 54.3656937 ], [ -126.2433431, 54.3656951 ], [ -126.243680900000015, 54.3656937 ], [ -126.24379350000001, 54.3656524 ], [ -126.243923599999988, 54.3655285 ], [ -126.2440202, 54.3654772 ], [ -126.2441585, 54.36548 ], [ -126.244248, 54.3655099 ], [ -126.244444, 54.3655769 ], [ -126.244621200000012, 54.3656894 ], [ -126.2447582, 54.3657093 ], [ -126.2449731, 54.3657236 ], [ -126.2450974, 54.3657179 ], [ -126.245391699999985, 54.365688 ], [ -126.2457379, 54.3655612 ], [ -126.245897500000012, 54.3654843 ], [ -126.245977599999989, 54.3654587 ], [ -126.2462448, 54.3653476 ], [ -126.246545099999977, 54.3652465 ], [ -126.2468095, 54.3651909 ], [ -126.2471269, 54.3650627 ], [ -126.2474731, 54.364963 ], [ -126.2476014, 54.3648577 ], [ -126.24786, 54.3646754 ], [ -126.248073699999978, 54.3644817 ], [ -126.2481238, 54.3644375 ], [ -126.248188, 54.3643948 ], [ -126.24847, 54.3643108 ], [ -126.2486449, 54.3642253 ], [ -126.2488569, 54.3640501 ], [ -126.249160699999976, 54.3638778 ], [ -126.2492432, 54.363798 ], [ -126.2493615, 54.3636385 ], [ -126.2496954, 54.3634847 ], [ -126.249969299999975, 54.3633209 ], [ -126.250051699999986, 54.3632412 ], [ -126.2500883, 54.3631529 ], [ -126.2501866, 54.363056 ], [ -126.2503473, 54.3629421 ], [ -126.250506899999976, 54.3628652 ], [ -126.2506006, 54.3628495 ], [ -126.2508325, 54.3628367 ], [ -126.2510727, 54.3626986 ], [ -126.2511704, 54.3626103 ], [ -126.2512471, 54.3623966 ], [ -126.251311800000011, 54.3623254 ], [ -126.251635799999988, 54.3621175 ], [ -126.251759400000012, 54.3620933 ], [ -126.2520249, 54.3620548 ], [ -126.252401100000014, 54.3619466 ], [ -126.252590599999976, 54.3618611 ], [ -126.2528549, 54.3618127 ], [ -126.253061, 54.3617358 ], [ -126.2533331, 54.3615905 ], [ -126.2536174, 54.3614794 ], [ -126.2537316, 54.3613655 ], [ -126.253943, 54.3611989 ], [ -126.2540273, 54.3610935 ], [ -126.2541339, 54.3608984 ], [ -126.2543, 54.3607217 ], [ -126.254479, 54.3605637 ], [ -126.2545432, 54.3605209 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17090979, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 181969.64099119199, "blue_line_key": 360873822, "length_metre": 324.20157118593801, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6033064, 54.4227689 ], [ -126.603317800000013, 54.422925500000012 ], [ -126.603686, 54.4233371 ], [ -126.604431599999984, 54.4238598 ], [ -126.604337199999989, 54.4242429 ], [ -126.603626299999988, 54.4249693 ], [ -126.6035304, 54.4251601 ], [ -126.6035819, 54.4253424 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17104976, "stream_order": 4, "gnis_name": "Maxan Creek", "downstream_route_measure": 34712.883159611498, "blue_line_key": 360881038, "length_metre": 49.817097492515501, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.053455, 54.205379 ], [ -126.053429199999982, 54.2053234 ], [ -126.053445900000014, 54.2052978 ], [ -126.053604600000014, 54.2052109 ], [ -126.0536276, 54.2050955 ], [ -126.0535852, 54.2050585 ], [ -126.0534641, 54.2050372 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17083099, "stream_order": 4, "gnis_name": "Ailport Creek", "downstream_route_measure": 9677.9894837088304, "blue_line_key": 360878058, "length_metre": 827.92059351092701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1597976, 54.483596800000015 ], [ -126.159478100000015, 54.4835441 ], [ -126.159341, 54.4834957 ], [ -126.1592671, 54.4834487 ], [ -126.159229199999984, 54.483349 ], [ -126.1592158, 54.4831055 ], [ -126.159352399999989, 54.4829018 ], [ -126.159357500000013, 54.4828121 ], [ -126.1593009, 54.482758 ], [ -126.159285399999973, 54.4827395 ], [ -126.15901550000001, 54.4826512 ], [ -126.1585815, 54.4826512 ], [ -126.1581039, 54.4826569 ], [ -126.157655800000015, 54.4826554 ], [ -126.157254400000014, 54.4826469 ], [ -126.1568734, 54.4825743 ], [ -126.1564783, 54.4824931 ], [ -126.1560438, 54.4825016 ], [ -126.15597, 54.4824817 ], [ -126.155588900000012, 54.482382 ], [ -126.155619299999984, 54.4821669 ], [ -126.1556536, 54.4821327 ], [ -126.1558558, 54.4819035 ], [ -126.155891, 54.4818322 ], [ -126.1559361, 54.4816172 ], [ -126.1559518, 54.4814021 ], [ -126.1559337, 54.4812127 ], [ -126.155872800000012, 54.4811842 ], [ -126.1555505, 54.4811671 ], [ -126.1553794, 54.4811999 ], [ -126.1551357, 54.481346599999988 ], [ -126.1549689, 54.4815317 ], [ -126.1548033, 54.4817069 ], [ -126.1546655, 54.4818935 ], [ -126.1545896, 54.4820986 ], [ -126.1542615, 54.4821797 ], [ -126.1539759, 54.4822723 ], [ -126.1536022, 54.4823094 ], [ -126.1532448, 54.4821299 ], [ -126.153007800000012, 54.4819974 ], [ -126.1527254, 54.4818208 ], [ -126.1525026, 54.4816898 ], [ -126.1524435, 54.4816699 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17087406, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 235116.53269687301, "blue_line_key": 360873822, "length_metre": 90.313878041667095, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.235966100000013, 54.4545615 ], [ -126.2356971, 54.454409100000014 ], [ -126.235640699999976, 54.4542168 ], [ -126.2357478, 54.4541228 ], [ -126.2362186, 54.4540459 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17092953, "stream_order": 5, "gnis_name": "Bulkley River", "downstream_route_measure": 266352.956918362, "blue_line_key": 360873822, "length_metre": 1252.3154077700101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0442193, 54.4041644 ], [ -126.044375, 54.4041601 ], [ -126.044843199999988, 54.4040903 ], [ -126.0451252, 54.4040077 ], [ -126.0454818, 54.4039892 ], [ -126.0459604, 54.403965 ], [ -126.0460075, 54.4039565 ], [ -126.0462239, 54.4039536 ], [ -126.0465431, 54.4039978 ], [ -126.04706560000001, 54.4040277 ], [ -126.0473713, 54.404061899999988 ], [ -126.047704, 54.404143 ], [ -126.047973399999989, 54.404257 ], [ -126.0484267, 54.4043766 ], [ -126.0488181, 54.4045119 ], [ -126.0492113, 54.4046287 ], [ -126.0495782, 54.4046828 ], [ -126.049929299999988, 54.404727 ], [ -126.05025280000001, 54.4047255 ], [ -126.050567199999989, 54.404634400000013 ], [ -126.050841299999988, 54.4044792 ], [ -126.051113500000014, 54.4043154 ], [ -126.0514305, 54.4041972 ], [ -126.051477100000014, 54.40419 ], [ -126.0518202, 54.4041345 ], [ -126.0521928, 54.4040989 ], [ -126.0525336, 54.4040633 ], [ -126.0528767, 54.4040077 ], [ -126.053253099999978, 54.403928 ], [ -126.0536453, 54.4038383 ], [ -126.053931499999976, 54.4037101 ], [ -126.0542644, 54.4035748 ], [ -126.05465479999998, 54.4035036 ], [ -126.0549808, 54.4034751 ], [ -126.0553018, 54.4035007 ], [ -126.055608799999987, 54.4035449 ], [ -126.055931, 54.4035605 ], [ -126.0563311, 54.4035435 ], [ -126.0566149, 54.4034694 ], [ -126.05697210000001, 54.4034153 ], [ -126.0573416, 54.4034423 ], [ -126.0576767, 54.4034965 ], [ -126.058032, 54.403495 ], [ -126.05836, 54.4034138 ], [ -126.0586315, 54.4032857 ], [ -126.0589662, 54.4031319 ], [ -126.0592671, 54.4030037 ], [ -126.0595853, 54.4028954 ], [ -126.059974399999987, 54.4028413 ], [ -126.060141699999974, 54.4028456 ], [ -126.060464, 54.4028812 ], [ -126.0607659, 54.4029595 ], [ -126.0611273, 54.4030763 ], [ -126.061371099999988, 54.403119 ], [ -126.0614311, 54.403129 ], [ -126.0617699, 54.4031461 ], [ -126.0621045, 54.4032088 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17105561, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 9211.9813471915295, "blue_line_key": 360882583, "length_metre": 95.398530668414494, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.9589832, 54.1952813 ], [ -125.9588269, 54.1950335 ], [ -125.95857, 54.1948598 ], [ -125.9584146, 54.1948455 ], [ -125.958438199999975, 54.1947558 ], [ -125.958402, 54.194676 ], [ -125.958309699999987, 54.1946689 ], [ -125.9582963, 54.194678900000014 ], [ -125.958277099999975, 54.1946518 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17061655, "stream_order": 4, "gnis_name": "Richfield Creek", "downstream_route_measure": 17780.927311813699, "blue_line_key": 360788426, "length_metre": 103.01116986025799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2022125, 54.5909367 ], [ -126.2020728, 54.5909423 ], [ -126.201752500000012, 54.590854 ], [ -126.201628199999988, 54.5908512 ], [ -126.201521, 54.5908483 ], [ -126.201227, 54.5908597 ], [ -126.2009744, 54.5909067 ], [ -126.2008949, 54.5909509 ], [ -126.2008109, 54.5910563 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17084590, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 0.0, "blue_line_key": 360875052, "length_metre": 35.388091707347897, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.321914400000011, 54.4726383 ], [ -126.3222595, 54.4727126 ], [ -126.3224387, 54.4727102 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100135, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 22032.523040858901, "blue_line_key": 360880905, "length_metre": 131.64196048045599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3832631, 54.2758602 ], [ -126.3834657, 54.2758189 ], [ -126.3837771, 54.2757805 ], [ -126.3839915, 54.2757677 ], [ -126.3840837, 54.2757691 ], [ -126.3841771, 54.2757534 ], [ -126.3843088, 54.2756309 ], [ -126.3843703, 54.2755953 ], [ -126.3844791, 54.2755982 ], [ -126.3848333, 54.2755968 ], [ -126.3851234, 54.2756039 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104384, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 5942.1447966456999, "blue_line_key": 360880905, "length_metre": 1376.39963307473, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.425694600000014, 54.2135254 ], [ -126.4256758, 54.213571 ], [ -126.425641, 54.2136408 ], [ -126.425637399999985, 54.2137049 ], [ -126.4256911, 54.2138131 ], [ -126.4258095, 54.2138972 ], [ -126.4259436, 54.2139712 ], [ -126.426076599999988, 54.2140552 ], [ -126.4261651, 54.2140937 ], [ -126.4262541, 54.2141307 ], [ -126.426345, 54.2141692 ], [ -126.4264493, 54.2141977 ], [ -126.4265694, 54.2142361 ], [ -126.4266749, 54.2142746 ], [ -126.4268256, 54.214323 ], [ -126.4269464, 54.2143529 ], [ -126.427036, 54.2143814 ], [ -126.4271281, 54.2144099 ], [ -126.427218299999979, 54.2144298 ], [ -126.4272934, 54.2144583 ], [ -126.427412300000015, 54.2145067 ], [ -126.4275166, 54.2145623 ], [ -126.427635, 54.2146463 ], [ -126.427662500000011, 54.214691899999984 ], [ -126.4276863, 54.2147816 ], [ -126.427696700000013, 54.2148542 ], [ -126.427709, 54.2149354 ], [ -126.4277053, 54.2149796 ], [ -126.4277164, 54.2150436 ], [ -126.427728, 54.2151063 ], [ -126.427739099999982, 54.2151704 ], [ -126.4277964, 54.2152345 ], [ -126.427854899999986, 54.2152886 ], [ -126.4279434, 54.2153271 ], [ -126.428050700000014, 54.215347 ], [ -126.4281569, 54.2153769 ], [ -126.428353899999976, 54.2154253 ], [ -126.4285357, 54.2154481 ], [ -126.4286277, 54.2154495 ], [ -126.428720399999989, 54.2154424 ], [ -126.4288411, 54.2154453 ], [ -126.4289485, 54.2154652 ], [ -126.4290668, 54.215522199999988 ], [ -126.4291711, 54.2155777 ], [ -126.4292596, 54.2156432 ], [ -126.4293322, 54.2156988 ], [ -126.4293896, 54.2157629 ], [ -126.429447, 54.215827 ], [ -126.4294732, 54.2158896 ], [ -126.4294983, 54.2159893 ], [ -126.429510499999978, 54.2160434 ], [ -126.429505699999979, 54.2161246 ], [ -126.429517299999986, 54.2161873 ], [ -126.4295241, 54.2163041 ], [ -126.429537, 54.2163496 ], [ -126.4295486, 54.2164394 ], [ -126.4295584, 54.2165206 ], [ -126.4295835, 54.2165932 ], [ -126.4296867, 54.2166858 ], [ -126.4297434, 54.2167313 ], [ -126.429861100000011, 54.2168239 ], [ -126.4299978, 54.2168638 ], [ -126.4301527, 54.2168396 ], [ -126.430262399999975, 54.2167783 ], [ -126.4303129, 54.2167256 ], [ -126.430377, 54.2166558 ], [ -126.4304129, 54.2165761 ], [ -126.4304628, 54.2165049 ], [ -126.4304993, 54.2164237 ], [ -126.430551099999988, 54.2163539 ], [ -126.430601, 54.2162827 ], [ -126.4306516, 54.216203 ], [ -126.4307161, 54.2161588 ], [ -126.4308253, 54.216126 ], [ -126.4309918, 54.2161645 ], [ -126.4310796, 54.2162115 ], [ -126.4311699, 54.2162585 ], [ -126.431242499999982, 54.216314 ], [ -126.4313322, 54.2163696 ], [ -126.431418899999983, 54.2164266 ], [ -126.431508, 54.2164906 ], [ -126.43158, 54.2165547 ], [ -126.4316227, 54.2166188 ], [ -126.431648399999986, 54.216682899999988 ], [ -126.431675899999988, 54.2167555 ], [ -126.431702199999975, 54.2168182 ], [ -126.4316992, 54.2168809 ], [ -126.4317201, 54.2170261 ], [ -126.431699399999985, 54.2170974 ], [ -126.4316818, 54.21716 ], [ -126.4316177, 54.2172027 ], [ -126.4314764, 54.217264 ], [ -126.4313971, 54.2172882 ], [ -126.4312569, 54.2173395 ], [ -126.4311142, 54.2173907 ], [ -126.430974, 54.217442 ], [ -126.43089470000001, 54.2174662 ], [ -126.43080209999998, 54.2175004 ], [ -126.43064360000001, 54.2175688 ], [ -126.4305613, 54.2176485 ], [ -126.4305108, 54.2177283 ], [ -126.430536499999988, 54.2177924 ], [ -126.4306109, 54.2178565 ], [ -126.430714099999989, 54.217922 ], [ -126.430816, 54.2180046 ], [ -126.4309185, 54.2180786 ], [ -126.4310204, 54.2181612 ], [ -126.4310784, 54.2182168 ], [ -126.4311504, 54.2182809 ], [ -126.431238899999983, 54.2183464 ], [ -126.4313286, 54.2184019 ], [ -126.4314147, 54.2184674 ], [ -126.431519599999987, 54.2185144 ], [ -126.4316093, 54.21857 ], [ -126.4316684, 54.2186156 ], [ -126.431801499999978, 54.2186996 ], [ -126.4318747, 54.2187466 ], [ -126.4319474, 54.2188021 ], [ -126.43202, 54.2188577 ], [ -126.4320937, 54.2189033 ], [ -126.4321823, 54.2189688 ], [ -126.4322543, 54.219032899999988 ], [ -126.4323422, 54.2191069 ], [ -126.4324295, 54.2191895 ], [ -126.4325167, 54.2192721 ], [ -126.432618099999985, 54.2193561 ], [ -126.4327218, 54.2194202 ], [ -126.432811, 54.2194772 ], [ -126.432914599999975, 54.2195142 ], [ -126.4330208, 54.2195441 ], [ -126.4331104, 54.2195726 ], [ -126.4332178, 54.2195926 ], [ -126.433386700000014, 54.2195968 ], [ -126.4335873, 54.2195741 ], [ -126.43366540000001, 54.2195399 ], [ -126.433761100000012, 54.2194971 ], [ -126.4338702, 54.2194715 ], [ -126.433991599999985, 54.2194658 ], [ -126.4341159, 54.219458700000011 ], [ -126.4342081, 54.219453 ], [ -126.4343148, 54.2194544 ], [ -126.4343904, 54.2194744 ], [ -126.4344936, 54.2195399 ], [ -126.4345381, 54.2195855 ], [ -126.4346101, 54.2196495 ], [ -126.4346688, 54.2196965 ], [ -126.4347572, 54.2197692 ], [ -126.4348152, 54.2198247 ], [ -126.4348726, 54.2198888 ], [ -126.434943499999989, 54.2199629 ], [ -126.4349856, 54.2200355 ], [ -126.435043, 54.2200996 ], [ -126.435084499999988, 54.2201537 ], [ -126.4351127, 54.2202178 ], [ -126.4351395, 54.2202719 ], [ -126.435134099999985, 54.2203346 ], [ -126.43513, 54.2204072 ], [ -126.4351404, 54.2204799 ], [ -126.435184400000011, 54.220534 ], [ -126.435257, 54.2205895 ], [ -126.435332, 54.220618 ], [ -126.4354223, 54.2206379 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17099195, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 20582.363319158601, "blue_line_key": 360881038, "length_metre": 100.48010962659799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0881823, 54.2929069 ], [ -126.087945100000013, 54.2920173 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17095604, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 10515.605670998801, "blue_line_key": 360886524, "length_metre": 542.87969743024405, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.259403100000014, 54.3582849 ], [ -126.2597163, 54.3582023 ], [ -126.2597945, 54.3581681 ], [ -126.2601472, 54.3579688 ], [ -126.2602425, 54.3579346 ], [ -126.2603497, 54.3579289 ], [ -126.260473300000015, 54.3579317 ], [ -126.2607645, 54.3579374 ], [ -126.26089180000001, 54.3578961 ], [ -126.261239, 54.3577594 ], [ -126.2614898, 54.3576939 ], [ -126.261760099999989, 54.3575742 ], [ -126.262062, 54.357427599999987 ], [ -126.2621756, 54.3573222 ], [ -126.262337, 54.3572267 ], [ -126.262450499999986, 54.3571213 ], [ -126.262486599999974, 54.3570687 ], [ -126.2625779, 54.356855 ], [ -126.262772700000014, 54.3566798 ], [ -126.2631089, 54.356499 ], [ -126.2633126, 54.3564491 ], [ -126.2635273, 54.3564363 ], [ -126.263881099999978, 54.3564448 ], [ -126.263975800000011, 54.3564192 ], [ -126.264307300000013, 54.3562925 ], [ -126.2645403, 54.3562697 ], [ -126.2648388, 54.3561871 ], [ -126.264998299999988, 54.3560831 ], [ -126.2650489, 54.3560033 ], [ -126.2651862, 54.3557911 ], [ -126.265482800000015, 54.3557342 ], [ -126.2657812, 54.3556516 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17055056, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 27810.7742872204, "blue_line_key": 360856488, "length_metre": 15.9547332954337, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.590712699999983, 54.6259152 ], [ -126.590758099999974, 54.6259338 ], [ -126.590788599999982, 54.6259523 ], [ -126.590865900000011, 54.6259637 ], [ -126.590926, 54.6259822 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17062711, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 0.0, "blue_line_key": 360851751, "length_metre": 714.05749964968504, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2240026, 54.5869332 ], [ -126.2239777, 54.5868435 ], [ -126.2239291, 54.5866541 ], [ -126.2237588, 54.5864333 ], [ -126.223583, 54.5862766 ], [ -126.2234923, 54.5862482 ], [ -126.2231289, 54.5861499 ], [ -126.222790499999988, 54.5861057 ], [ -126.2226514, 54.5861029 ], [ -126.2222968, 54.5860772 ], [ -126.222097799999986, 54.586063 ], [ -126.221912499999974, 54.586058699999988 ], [ -126.221679099999974, 54.5860445 ], [ -126.221586800000011, 54.5860416 ], [ -126.221200400000015, 54.5860431 ], [ -126.220872199999988, 54.5860886 ], [ -126.220529199999987, 54.5861342 ], [ -126.220389499999982, 54.5861399 ], [ -126.2200157, 54.5861684 ], [ -126.2198277, 54.5861997 ], [ -126.2195132, 54.5862553 ], [ -126.219311, 54.5862781 ], [ -126.219045900000012, 54.586298 ], [ -126.218795799999981, 54.5863379 ], [ -126.2184974, 54.5864034 ], [ -126.2181208, 54.5864746 ], [ -126.2178399, 54.5865045 ], [ -126.217465, 54.5865501 ], [ -126.217249099999989, 54.5865629 ], [ -126.216952600000013, 54.5865743 ], [ -126.2168608, 54.586562900000011 ], [ -126.216771099999988, 54.5865245 ], [ -126.2164563, 54.5863649 ], [ -126.2162369, 54.5862069 ], [ -126.215927, 54.5859847 ], [ -126.215834899999976, 54.5859462 ], [ -126.215487900000014, 54.5858294 ], [ -126.215112699999978, 54.58566 ], [ -126.2148233, 54.585581600000012 ], [ -126.2147162, 54.5855788 ], [ -126.214575, 54.585603 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17077706, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 36.888690624545198, "blue_line_key": 360237077, "length_metre": 1398.66602062524, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.324009, 54.50681 ], [ -126.3240196, 54.5068912 ], [ -126.324189899999979, 54.5071105 ], [ -126.324308, 54.5071931 ], [ -126.324358100000012, 54.5073569 ], [ -126.3243384, 54.5074196 ], [ -126.3242601, 54.5074538 ], [ -126.324179399999977, 54.507488 ], [ -126.3238657, 54.5075706 ], [ -126.3236766, 54.5076475 ], [ -126.3234993, 54.5077329 ], [ -126.3232071, 54.5079423 ], [ -126.3231388, 54.5080662 ], [ -126.3231593, 54.5082029 ], [ -126.323199, 54.5083197 ], [ -126.323176600000011, 54.508418 ], [ -126.3231264, 54.5084977 ], [ -126.3229736, 54.5087014 ], [ -126.322842, 54.5088239 ], [ -126.3227627, 54.508868 ], [ -126.3226205, 54.5089093 ], [ -126.322510099999974, 54.5089164 ], [ -126.3221858, 54.5089179 ], [ -126.3220486, 54.5088965 ], [ -126.3219188, 54.5087498 ], [ -126.3218951, 54.5086501 ], [ -126.3218556, 54.5085604 ], [ -126.3217575, 54.5083866 ], [ -126.3216531, 54.5083211 ], [ -126.32156040000001, 54.5083197 ], [ -126.32146680000001, 54.5083624 ], [ -126.3213336, 54.5085034 ], [ -126.321213500000013, 54.5086629 ], [ -126.321154299999975, 54.5088865 ], [ -126.3212695, 54.5090047 ], [ -126.321503499999977, 54.5091899 ], [ -126.3216758, 54.5094106 ], [ -126.3218461, 54.50963 ], [ -126.3218687, 54.5097467 ], [ -126.3217539, 54.5098707 ], [ -126.3216073, 54.5099661 ], [ -126.321498800000015, 54.5099817 ], [ -126.321391799999986, 54.5099789 ], [ -126.3210965, 54.5099817 ], [ -126.3209004, 54.5099048 ], [ -126.320812, 54.5098493 ], [ -126.3206361, 54.5097012 ], [ -126.3205702, 54.5095474 ], [ -126.3205507, 54.5093665 ], [ -126.3205603, 54.5092141 ], [ -126.3205721, 54.5090346 ], [ -126.3205626, 54.5089364 ], [ -126.320507600000013, 54.5088353 ], [ -126.3203295, 54.5087142 ], [ -126.3202087, 54.5086672 ], [ -126.319951, 54.5086259 ], [ -126.3198285, 54.5086045 ], [ -126.3195067, 54.5085433 ], [ -126.3191819, 54.5085461 ], [ -126.318997, 54.5085419 ], [ -126.3187335, 54.5085447 ], [ -126.3186113, 54.5085504 ], [ -126.318485, 54.508574599999989 ], [ -126.3184045, 54.5086359 ], [ -126.318331599999979, 54.5087868 ], [ -126.31836939999998, 54.5089506 ], [ -126.3183498, 54.5090133 ], [ -126.318212699999989, 54.509207 ], [ -126.3180907, 54.5094206 ], [ -126.3179542, 54.5096058 ], [ -126.317811299999988, 54.509684099999987 ], [ -126.3175933, 54.5096969 ], [ -126.317284799999982, 54.5096812 ], [ -126.317056, 54.5096485 ], [ -126.3170143, 54.509585799999989 ], [ -126.3170062, 54.509442 ], [ -126.3170253, 54.5093878 ], [ -126.3171005, 54.5092098 ], [ -126.3172511, 54.5090332 ], [ -126.317430699999974, 54.508858 ], [ -126.3174728, 54.5086971 ], [ -126.3174704, 54.5085162 ], [ -126.317415399999973, 54.508408 ], [ -126.31716320000001, 54.5082399 ], [ -126.3169513, 54.508173 ], [ -126.3167075, 54.5081132 ], [ -126.3164354, 54.5080434 ], [ -126.3163293, 54.5079964 ], [ -126.316196, 54.5079223 ], [ -126.3160055, 54.5077742 ], [ -126.3158871, 54.5076717 ], [ -126.3158465, 54.507599 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17088699, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 187482.57550825601, "blue_line_key": 360873822, "length_metre": 193.40546300234999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.574811699999984, 54.4433273 ], [ -126.574784799999989, 54.4432006 ], [ -126.5746114, 54.4429955 ], [ -126.574045699999985, 54.4426864 ], [ -126.5738349, 54.4426238 ], [ -126.5734055, 54.4425839 ], [ -126.5731266, 54.4426109 ], [ -126.572827499999988, 54.4426893 ], [ -126.572589799999975, 54.4428089 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17087288, "stream_order": 4, "gnis_name": "Raspberry Creek", "downstream_route_measure": 2124.08076875291, "blue_line_key": 360817924, "length_metre": 1166.93021981384, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6021011, 54.453548899999987 ], [ -126.6021879, 54.4536585 ], [ -126.602361699999989, 54.4538138 ], [ -126.6023909, 54.4538779 ], [ -126.602381, 54.4540402 ], [ -126.602384199999989, 54.4542282 ], [ -126.602437, 54.4544005 ], [ -126.6026573, 54.4545843 ], [ -126.6027463, 54.4546313 ], [ -126.6031058, 54.4548093 ], [ -126.6033003, 54.4549474 ], [ -126.6035656, 54.4551426 ], [ -126.6037551, 54.4553163 ], [ -126.6038305, 54.4553533 ], [ -126.604177299999989, 54.4555043 ], [ -126.6043295, 54.4555527 ], [ -126.604554599999986, 54.4556382 ], [ -126.6048742, 54.4557336 ], [ -126.6052207, 54.4558575 ], [ -126.6055985, 54.4559828 ], [ -126.6056915, 54.4560113 ], [ -126.6060416, 54.4560897 ], [ -126.6063776, 54.4561238 ], [ -126.6065763, 54.4561723 ], [ -126.6067245, 54.4562748 ], [ -126.606905, 54.4563403 ], [ -126.6069975, 54.456370199999988 ], [ -126.607268699999977, 54.456464199999985 ], [ -126.607462799999979, 54.4565682 ], [ -126.6075544, 54.4565867 ], [ -126.607663100000011, 54.4565981 ], [ -126.6079096, 54.4565938 ], [ -126.6081587, 54.4565539 ], [ -126.608253800000014, 54.4565198 ], [ -126.6083654, 54.4564243 ], [ -126.6084777, 54.4563902 ], [ -126.608691799999988, 54.4563944 ], [ -126.608911, 54.4563631 ], [ -126.609125100000014, 54.4563674 ], [ -126.6092971, 54.4563517 ], [ -126.6096848, 54.4563147 ], [ -126.6099779, 54.4563033 ], [ -126.610102900000015, 54.4562962 ], [ -126.610334099999989, 54.4563004 ], [ -126.610440399999987, 54.4563118 ], [ -126.6105926, 54.4563603 ], [ -126.6108972, 54.4564286 ], [ -126.6109735, 54.4564486 ], [ -126.611292800000015, 54.4565169 ], [ -126.611351, 54.456554 ], [ -126.6114096, 54.456618 ], [ -126.6114964, 54.4567277 ], [ -126.611642, 54.4568659 ], [ -126.6116697, 54.45692 ], [ -126.611803099999989, 54.4570225 ], [ -126.611893199999983, 54.4570595 ], [ -126.6121161, 54.4572077 ], [ -126.612447399999979, 54.4573401 ], [ -126.6125693, 54.45737 ], [ -126.6129376, 54.4574313 ], [ -126.6132411, 54.4575096 ], [ -126.613605400000012, 54.4575965 ], [ -126.61388119999998, 54.4576207 ], [ -126.6141408, 54.4576705 ], [ -126.614418, 54.4577118 ], [ -126.6147884, 54.4577104 ], [ -126.615130099999988, 54.457672 ], [ -126.615484400000014, 54.4576606 ], [ -126.615576, 54.457672 ], [ -126.61565130000001, 54.457709 ], [ -126.615894099999977, 54.4577859 ], [ -126.61626459999998, 54.4577845 ], [ -126.6164159, 54.4578144 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17067296, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1006.51393239948, "blue_line_key": 360881574, "length_metre": 48.493059463471901, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.602851099999981, 54.5604785 ], [ -126.6029076, 54.5605426 ], [ -126.6030697, 54.5606708 ], [ -126.6031287, 54.5607349 ], [ -126.603218200000015, 54.5607819 ], [ -126.6032629, 54.5608374 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17089462, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 185441.33978957601, "blue_line_key": 360873822, "length_metre": 198.935612358116, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.589439899999988, 54.4357249 ], [ -126.588797899999989, 54.4360211 ], [ -126.587700899999987, 54.4362177 ], [ -126.5873504, 54.43638 ], [ -126.5869406, 54.4366777 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080604, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 224808.81804518201, "blue_line_key": 360873822, "length_metre": 471.79379152791103, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.291203599999989, 54.4938426 ], [ -126.2911948, 54.4937429 ], [ -126.291145799999981, 54.493535 ], [ -126.2910777, 54.4933812 ], [ -126.290923, 54.4931533 ], [ -126.2908237, 54.4930251 ], [ -126.2907843, 54.4929425 ], [ -126.290720599999986, 54.4927346 ], [ -126.290649899999977, 54.4926434 ], [ -126.2905292, 54.4925964 ], [ -126.290302, 54.4925181 ], [ -126.28998820000001, 54.4923586 ], [ -126.2898977, 54.4923301 ], [ -126.2897753, 54.4923087 ], [ -126.289636, 54.4923144 ], [ -126.2895552, 54.492348600000014 ], [ -126.2895191, 54.4924298 ], [ -126.289516, 54.492501 ], [ -126.2895257, 54.4925637 ], [ -126.2898225, 54.4927502 ], [ -126.289938400000011, 54.4928798 ], [ -126.2899755, 54.4929966 ], [ -126.289921299999989, 54.4931219 ], [ -126.289842499999978, 54.4931647 ], [ -126.289463500000011, 54.4933 ], [ -126.2892001, 54.4933028 ], [ -126.2888759, 54.4933042 ], [ -126.288781599999979, 54.4933213 ], [ -126.2884529, 54.4933769 ], [ -126.2883455, 54.4933826 ], [ -126.2880043, 54.493411099999989 ], [ -126.2878928, 54.4934353 ], [ -126.2877947, 54.4935321 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17084418, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 9679.8698756339309, "blue_line_key": 360875052, "length_metre": 473.73269266208302, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4137485, 54.4772805 ], [ -126.4136468, 54.4771794 ], [ -126.4134596, 54.4769586 ], [ -126.4133291, 54.4768489 ], [ -126.413105, 54.4767265 ], [ -126.4129269, 54.4766054 ], [ -126.412570100000011, 54.4764003 ], [ -126.4124521, 54.4763177 ], [ -126.41227760000001, 54.476124 ], [ -126.4122067, 54.4760329 ], [ -126.412122400000015, 54.4758961 ], [ -126.412112799999989, 54.4757979 ], [ -126.4120653, 54.4755985 ], [ -126.4121383, 54.4754119 ], [ -126.412187299999985, 54.4753492 ], [ -126.4124011, 54.4751385 ], [ -126.412438099999989, 54.4750402 ], [ -126.41245, 54.4748878 ], [ -126.4124467, 54.4746813 ], [ -126.412349299999988, 54.474526 ], [ -126.4122073, 54.4743167 ], [ -126.4121522, 54.4742156 ], [ -126.412065700000014, 54.4741059 ], [ -126.4120251, 54.4740333 ], [ -126.411961, 54.4738253 ], [ -126.4118887, 54.4737242 ], [ -126.4118898, 54.4737071 ], [ -126.4118762, 54.4736972 ], [ -126.411877300000015, 54.4736801 ], [ -126.411861799999983, 54.4736616 ], [ -126.411850300000012, 54.4736245 ], [ -126.4118358, 54.4735889 ], [ -126.411826, 54.4735263 ], [ -126.4117971, 54.4734622 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091263, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 11833.2703369966, "blue_line_key": 360846413, "length_metre": 489.29295682603498, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.286362700000012, 54.4246218 ], [ -126.2816002, 54.4212178 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17103525, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 8352.1966827994893, "blue_line_key": 360880905, "length_metre": 1166.3802137110099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4453425, 54.2254603 ], [ -126.445435199999977, 54.2254532 ], [ -126.4455438, 54.225429 ], [ -126.4456378, 54.2254048 ], [ -126.445747399999988, 54.2253706 ], [ -126.4458408, 54.2253549 ], [ -126.446042, 54.2253236 ], [ -126.4462408, 54.2253264 ], [ -126.446425100000013, 54.2253492 ], [ -126.4465721, 54.2254147 ], [ -126.446707, 54.2254803 ], [ -126.44680959999998, 54.2255543 ], [ -126.446853, 54.2256099 ], [ -126.4468788, 54.2256739 ], [ -126.446903299999988, 54.2257822 ], [ -126.446915, 54.2258448 ], [ -126.4469408, 54.2259089 ], [ -126.446951799999979, 54.2259801 ], [ -126.4469764, 54.2260884 ], [ -126.4469985, 54.2262237 ], [ -126.4470114, 54.2262693 ], [ -126.447037200000011, 54.2263334 ], [ -126.4470482, 54.2264046 ], [ -126.447088, 54.2265043 ], [ -126.447116199999982, 54.2265683 ], [ -126.447156600000014, 54.2266595 ], [ -126.4471835, 54.2267136 ], [ -126.4472257, 54.2267592 ], [ -126.4472685, 54.2268233 ], [ -126.4472814, 54.2268689 ], [ -126.4473053, 54.2269586 ], [ -126.4473006, 54.2270668 ], [ -126.447266, 54.2271295 ], [ -126.447214800000012, 54.2271907 ], [ -126.447181299999983, 54.2272434 ], [ -126.4471297, 54.2273332 ], [ -126.4470962, 54.2273858 ], [ -126.447063300000011, 54.22743 ], [ -126.4470416, 54.2275382 ], [ -126.4470491, 54.2276465 ], [ -126.4470761, 54.2277277 ], [ -126.4471036, 54.2277732 ], [ -126.4471574, 54.2278815 ], [ -126.447257, 54.2279911 ], [ -126.4473761, 54.2280666 ], [ -126.4474805, 54.2281222 ], [ -126.447618299999988, 54.228125 ], [ -126.4477269, 54.2281008 ], [ -126.44786830000001, 54.2280324 ], [ -126.447965200000013, 54.2279797 ], [ -126.448012699999978, 54.2279356 ], [ -126.4481114, 54.2278573 ], [ -126.448159499999988, 54.2278046 ], [ -126.4482264, 54.2277333 ], [ -126.448410599999988, 54.227702 ], [ -126.448535, 54.2276949 ], [ -126.4486242, 54.2277248 ], [ -126.448698, 54.2277704 ], [ -126.4487567, 54.2278174 ], [ -126.4488312, 54.2278815 ], [ -126.4488575, 54.2279441 ], [ -126.448883899999984, 54.2279997 ], [ -126.4489224, 54.2281165 ], [ -126.448919, 54.228180599999988 ], [ -126.4489282, 54.228270300000013 ], [ -126.4489369, 54.2283686 ], [ -126.44894810000001, 54.2284597 ], [ -126.4489615, 54.2285038 ], [ -126.4489873, 54.2285679 ], [ -126.449013099999988, 54.228632 ], [ -126.4490693, 54.2287403 ], [ -126.4490962, 54.2287944 ], [ -126.4492117, 54.228914 ], [ -126.449312600000013, 54.2290066 ], [ -126.4493853, 54.2290621 ], [ -126.4494896, 54.2291177 ], [ -126.449625200000014, 54.2291747 ], [ -126.4497314, 54.2292046 ], [ -126.449805200000014, 54.2292231 ], [ -126.449913200000012, 54.2292345 ], [ -126.450201799999988, 54.2292587 ], [ -126.4502781, 54.2292701 ], [ -126.4504147, 54.2293171 ], [ -126.4504698, 54.2294082 ], [ -126.4505103, 54.2294994 ], [ -126.4505366, 54.229562 ], [ -126.4505483, 54.2296176 ], [ -126.4505588, 54.2296973 ], [ -126.45057, 54.2297885 ], [ -126.450581, 54.229832599999988 ], [ -126.450605, 54.2299423 ], [ -126.4506319, 54.2299964 ], [ -126.4507792, 54.230116099999989 ], [ -126.4508689, 54.2301445 ], [ -126.4509768, 54.2301559 ], [ -126.4510525, 54.2301488 ], [ -126.4511446, 54.2301502 ], [ -126.451236799999975, 54.2301445 ], [ -126.4514087, 54.2301203 ], [ -126.4515472, 54.2301146 ], [ -126.451639899999989, 54.2301075 ], [ -126.4517947, 54.2300833 ], [ -126.451903300000012, 54.2300591 ], [ -126.4519953, 54.2300335 ], [ -126.452135, 54.2300107 ], [ -126.4522277, 54.2300035 ], [ -126.452367400000014, 54.2299879 ], [ -126.4524923, 54.2299722 ], [ -126.4526308, 54.2299665 ], [ -126.4529078, 54.2299551 ], [ -126.452998099999988, 54.229948 ], [ -126.4531218, 54.229949399999988 ], [ -126.4532121, 54.2299694 ], [ -126.4532872, 54.2299978 ], [ -126.45337880000001, 54.2300277 ], [ -126.453513699999974, 54.2300662 ], [ -126.4536181, 54.2301217 ], [ -126.453689, 54.2301958 ], [ -126.4536996, 54.2302955 ], [ -126.4537083, 54.2303938 ], [ -126.4537036, 54.230475 ], [ -126.4536982, 54.2305376 ], [ -126.4536783, 54.2306273 ], [ -126.4536883, 54.2307356 ], [ -126.4537427, 54.2308353 ], [ -126.453800199999975, 54.2308994 ], [ -126.4538576, 54.2309635 ], [ -126.453945, 54.231019 ], [ -126.4540336, 54.2310845 ], [ -126.454136199999979, 54.2311586 ], [ -126.45424, 54.2312227 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17103632, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 30522.437373028799, "blue_line_key": 360886221, "length_metre": 388.96392416095603, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6173439, 54.2232414 ], [ -126.617315800000014, 54.2232314 ], [ -126.617223599999988, 54.2232029 ], [ -126.6170903, 54.223146 ], [ -126.6169382, 54.2231075 ], [ -126.616802100000015, 54.2230862 ], [ -126.616663699999989, 54.2230847 ], [ -126.6165101, 54.223099 ], [ -126.61633830000001, 54.2231232 ], [ -126.6161694, 54.223146 ], [ -126.6160453, 54.2231802 ], [ -126.615933899999987, 54.22324 ], [ -126.6158227, 54.2232927 ], [ -126.6157267, 54.223371 ], [ -126.6156589, 54.2234593 ], [ -126.6156247, 54.223549 ], [ -126.615619099999989, 54.2236473 ], [ -126.6156145, 54.2237014 ], [ -126.615612399999975, 54.2237555 ], [ -126.615592100000015, 54.2238267 ], [ -126.6155277, 54.2238709 ], [ -126.615465199999988, 54.2239236 ], [ -126.6153691, 54.2239749 ], [ -126.6152432, 54.2240276 ], [ -126.6151653, 54.2240617 ], [ -126.615100399999989, 54.2241144 ], [ -126.615035600000013, 54.2241942 ], [ -126.6149983, 54.2242925 ], [ -126.6149768, 54.2243808 ], [ -126.615003500000014, 54.2244634 ], [ -126.615030800000014, 54.2245445 ], [ -126.6150228, 54.2246428 ], [ -126.614956299999989, 54.2247411 ], [ -126.6149061, 54.2248208 ], [ -126.6148406, 54.2248821 ], [ -126.6147475, 54.2249248 ], [ -126.6146096, 54.224922 ], [ -126.614532199999985, 54.2249205 ], [ -126.614455299999989, 54.2249106 ], [ -126.614273899999986, 54.2248792 ], [ -126.6140915, 54.2248579 ], [ -126.613984099999982, 54.2248379 ], [ -126.613909600000014, 54.224828 ], [ -126.6137264, 54.2247881 ], [ -126.6136677, 54.2247682 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17088836, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 8987.5617977913207, "blue_line_key": 360846413, "length_metre": 347.22999730532899, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.306923799999979, 54.445025 ], [ -126.306805399999988, 54.4449239 ], [ -126.306618399999977, 54.4447401 ], [ -126.3065773, 54.444649 ], [ -126.3065425, 54.4444781 ], [ -126.3065218, 54.4443157 ], [ -126.3066426, 54.4441206 ], [ -126.306700299999974, 54.4439511 ], [ -126.3068001, 54.4438358 ], [ -126.3070145, 54.443625 ], [ -126.3072422, 54.4434598 ], [ -126.3073852, 54.4433814 ], [ -126.3076997, 54.4432889 ], [ -126.3079547, 54.4431778 ], [ -126.3080352, 54.4431165 ], [ -126.308106, 54.4429656 ], [ -126.308086699999976, 54.4428132 ], [ -126.308052199999977, 54.4426138 ], [ -126.308034499999977, 54.4424429 ], [ -126.3080219, 54.442388799999989 ], [ -126.307963300000011, 54.4423332 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17073298, "stream_order": 4, "gnis_name": "Cesford Creek", "downstream_route_measure": 5785.0566671307997, "blue_line_key": 360765936, "length_metre": 740.42945636387196, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2466271, 54.5301457 ], [ -126.24639590000001, 54.53014 ], [ -126.2460376, 54.5301955 ], [ -126.2457036, 54.5303138 ], [ -126.245420299999978, 54.5303793 ], [ -126.2451557, 54.5304263 ], [ -126.244794, 54.530526 ], [ -126.2446232, 54.5305231 ], [ -126.2442526, 54.5305231 ], [ -126.2439434, 54.530516 ], [ -126.243755600000014, 54.5305473 ], [ -126.2433972, 54.5306029 ], [ -126.243067700000012, 54.530667 ], [ -126.2428952, 54.5306897 ], [ -126.242647099999985, 54.5307111 ], [ -126.242316699999989, 54.5308122 ], [ -126.2422353, 54.530855 ], [ -126.2419005, 54.5310173 ], [ -126.24159370000001, 54.5312181 ], [ -126.241395900000015, 54.5313748 ], [ -126.2413169, 54.5314175 ], [ -126.2410865, 54.5316383 ], [ -126.240843099999978, 54.531785 ], [ -126.2407114, 54.5319074 ], [ -126.240611, 54.532031400000015 ], [ -126.2405238, 54.5321738 ], [ -126.2404195, 54.5323504 ], [ -126.2403361, 54.5324472 ], [ -126.240298599999974, 54.5325184 ], [ -126.240223499999985, 54.5327235 ], [ -126.240170399999982, 54.5328389 ], [ -126.2401001, 54.5329542 ], [ -126.2400078, 54.5331593 ], [ -126.239996300000016, 54.5333302 ], [ -126.2399871, 54.5334741 ], [ -126.2399926, 54.53361790000001 ], [ -126.239958699999988, 54.5336792 ], [ -126.2398978, 54.5338857 ], [ -126.2397177, 54.5340338 ], [ -126.2394432, 54.534199 ], [ -126.2393467, 54.5342773 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17086180, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 14.3051098568708, "blue_line_key": 360236038, "length_metre": 128.83534691522399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.521348499999988, 54.462473 ], [ -126.5215319, 54.4625299 ], [ -126.52163539999998, 54.4626125 ], [ -126.521675699999989, 54.4626866 ], [ -126.5216989, 54.4628304 ], [ -126.5216942, 54.4628931 ], [ -126.52169, 54.4629472 ], [ -126.52170289999998, 54.4630013 ], [ -126.5217153, 54.463064 ], [ -126.5218633, 54.4631666 ], [ -126.5220117, 54.4632677 ], [ -126.522134099999974, 54.463289 ], [ -126.522366, 54.4632848 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17066018, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 2129.7870444975501, "blue_line_key": 360881574, "length_metre": 163.36846569029299, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6135066, 54.5671082 ], [ -126.613703199999989, 54.5672008 ], [ -126.613762699999981, 54.5672563 ], [ -126.61399870000001, 54.5674415 ], [ -126.6142996, 54.567581 ], [ -126.6144904, 54.5677477 ], [ -126.6144865, 54.5678374 ], [ -126.614430199999987, 54.5679798 ], [ -126.6144573, 54.5680439 ], [ -126.6145876, 54.5682077 ], [ -126.6145966, 54.5683245 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102211, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 13450.100246243601, "blue_line_key": 360880905, "length_metre": 189.56129766914799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4196344, 54.2423087 ], [ -126.419585099999978, 54.2423443 ], [ -126.419537600000012, 54.2423885 ], [ -126.419517599999978, 54.2424511 ], [ -126.4194993, 54.242495299999987 ], [ -126.41948, 54.2425765 ], [ -126.4194934, 54.2426206 ], [ -126.4195039, 54.2426932 ], [ -126.419466899999975, 54.242783 ], [ -126.4193546, 54.2428513 ], [ -126.419260799999975, 54.2428684 ], [ -126.4191698, 54.2428841 ], [ -126.419075799999987, 54.2428812 ], [ -126.418862800000014, 54.2428499 ], [ -126.4187878, 54.2428485 ], [ -126.4186968, 54.2428371 ], [ -126.4185589, 54.2428342 ], [ -126.4184808, 54.2428414 ], [ -126.4182813, 54.2428471 ], [ -126.4181258, 54.2428798 ], [ -126.4179989, 54.2429211 ], [ -126.417889800000012, 54.2429738 ], [ -126.417823299999981, 54.2430436 ], [ -126.41775819999998, 54.243123399999988 ], [ -126.4177405, 54.243159 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17102671, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 14336.560997034599, "blue_line_key": 360877225, "length_metre": 609.68651037832501, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2056605, 54.2410511 ], [ -126.2056848, 54.2409173 ], [ -126.205659499999982, 54.2408261 ], [ -126.2055921, 54.2407164 ], [ -126.2054354, 54.240524199999989 ], [ -126.205425299999987, 54.2404515 ], [ -126.205417900000015, 54.2403177 ], [ -126.2054885, 54.2401838 ], [ -126.205512899999988, 54.24004990000001 ], [ -126.205512399999989, 54.2398434 ], [ -126.2054896, 54.2397252 ], [ -126.205362099999988, 54.23956 ], [ -126.2052161, 54.2394589 ], [ -126.2048579, 54.2392979 ], [ -126.204619799999989, 54.2391755 ], [ -126.204308399999988, 54.239033 ], [ -126.2040417, 54.2388821 ], [ -126.2039834, 54.2388279 ], [ -126.2038722, 54.2386713 ], [ -126.2038318, 54.2385816 ], [ -126.2037398, 54.238372199999986 ], [ -126.20359, 54.2382882 ], [ -126.2034446, 54.2381856 ], [ -126.2031963, 54.2379905 ], [ -126.203097299999982, 54.2378808 ], [ -126.2030707, 54.2378267 ], [ -126.2030374, 54.2376102 ], [ -126.2030331, 54.2374479 ], [ -126.2030554, 54.2373396 ], [ -126.2031273, 54.2372157 ], [ -126.2032743, 54.2370662 ], [ -126.2035466, 54.2368939 ], [ -126.203674299999975, 54.2368241 ], [ -126.20382450000001, 54.236666 ], [ -126.203923800000013, 54.2365335 ], [ -126.203893, 54.2363171 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101176, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 25526.783642706301, "blue_line_key": 360881038, "length_metre": 31.159962538298998, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.070260800000014, 54.2600145 ], [ -126.070280900000014, 54.2599262 ], [ -126.070363799999981, 54.2598464 ], [ -126.0704115, 54.2598293 ], [ -126.0705192, 54.2598151 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099803, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 23534.082839135699, "blue_line_key": 360880905, "length_metre": 20.8776118268547, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.392654299999975, 54.2818618 ], [ -126.392757100000011, 54.281963 ], [ -126.3928452, 54.28201 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17084604, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 35.388091707347897, "blue_line_key": 360875052, "length_metre": 44.7026134712928, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3224387, 54.4727102 ], [ -126.3225175, 54.4726675 ], [ -126.3227084, 54.4725991 ], [ -126.323064, 54.4725706 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076323, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 19.930551329179501, "blue_line_key": 360875378, "length_metre": 74.988968038698104, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4631142, 54.5132346 ], [ -126.463111900000015, 54.5132973 ], [ -126.463107199999982, 54.51336 ], [ -126.463129699999982, 54.5134782 ], [ -126.463195, 54.5136776 ], [ -126.4632833, 54.513768700000014 ], [ -126.4633253, 54.5138243 ], [ -126.4633677, 54.5138784 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17085543, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 197421.006848316, "blue_line_key": 360873822, "length_metre": 109.836410443811, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.511950399999989, 54.46671 ], [ -126.512358, 54.4671914 ], [ -126.5128237, 54.467548799999989 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17082279, "stream_order": 4, "gnis_name": "Ailport Creek", "downstream_route_measure": 12119.0175771341, "blue_line_key": 360878058, "length_metre": 92.426294605812899, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1362528, 54.4853144 ], [ -126.1358117, 54.4853686 ], [ -126.1351134, 54.4856329 ], [ -126.135052399999978, 54.4857089 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17063986, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1895.50678469996, "blue_line_key": 360851751, "length_metre": 160.40612623292299, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2034511, 54.5807735 ], [ -126.20320430000001, 54.580547 ], [ -126.2026231, 54.5795501 ], [ -126.2026895, 54.579439 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093564, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 218.72343393344499, "blue_line_key": 360802599, "length_metre": 80.323137066288993, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.521525200000013, 54.3939457 ], [ -126.5213245, 54.39396 ], [ -126.520998399999982, 54.393997 ], [ -126.5206864, 54.3940354 ], [ -126.5204251, 54.3940483 ], [ -126.520300799999987, 54.3940468 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17097568, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 12664.155280813, "blue_line_key": 360886221, "length_metre": 197.748993935031, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6251829, 54.3207214 ], [ -126.625345, 54.3203639 ], [ -126.625617799999986, 54.3193228 ], [ -126.6258817, 54.3190095 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17057911, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 16842.689954666901, "blue_line_key": 360856488, "length_metre": 455.924309999581, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.500574500000013, 54.6114837 ], [ -126.5006792, 54.6115222 ], [ -126.500856299999981, 54.6116788 ], [ -126.5010973, 54.6117999 ], [ -126.5012345, 54.6118298 ], [ -126.501402200000015, 54.6118426 ], [ -126.5017746, 54.6118683 ], [ -126.501895499999989, 54.6118882 ], [ -126.5019865, 54.6119167 ], [ -126.502321, 54.6120235 ], [ -126.502625, 54.6121189 ], [ -126.502684500000015, 54.6121745 ], [ -126.5026732, 54.6123354 ], [ -126.5027165, 54.6124095 ], [ -126.5027907, 54.612465 ], [ -126.5028817, 54.6124935 ], [ -126.5031449, 54.6125077 ], [ -126.5035167, 54.6125063 ], [ -126.5037508, 54.6124479 ], [ -126.5038487, 54.6123781 ], [ -126.5039181, 54.612262799999989 ], [ -126.5040155, 54.6122015 ], [ -126.5041232, 54.6121958 ], [ -126.5042481, 54.6121972 ], [ -126.50459930000001, 54.612277 ], [ -126.5048851, 54.612418 ], [ -126.5049407, 54.6124992 ], [ -126.5049441, 54.6126886 ], [ -126.5049013, 54.6129122 ], [ -126.504813299999981, 54.6130817 ], [ -126.504748400000011, 54.6131344 ], [ -126.5045713, 54.6132198 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17082756, "stream_order": 5, "gnis_name": "Ailport Creek", "downstream_route_measure": 5722.6462240974497, "blue_line_key": 360878058, "length_metre": 3038.4835729023898, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.198834799999986, 54.4829075 ], [ -126.198677699999976, 54.4829218 ], [ -126.198213700000011, 54.4829374 ], [ -126.197905600000013, 54.48294880000001 ], [ -126.1975462, 54.4829944 ], [ -126.1972182, 54.4830685 ], [ -126.1968831, 54.4832038 ], [ -126.1966995, 54.483416 ], [ -126.1964886, 54.4835812 ], [ -126.196215599999988, 54.4837279 ], [ -126.1958142, 54.4839529 ], [ -126.1956447, 54.4841736 ], [ -126.195705499999988, 54.4844086 ], [ -126.1956696, 54.4844613 ], [ -126.1954945, 54.4845468 ], [ -126.1951653, 54.4846379 ], [ -126.195057799999987, 54.484843 ], [ -126.1949663, 54.4850652 ], [ -126.194797900000012, 54.4852418 ], [ -126.1943946, 54.4854925 ], [ -126.193910699999989, 54.4855708 ], [ -126.1934161, 54.4855964 ], [ -126.1930753, 54.4855964 ], [ -126.192673199999987, 54.4855964 ], [ -126.1921825, 54.4855494 ], [ -126.1918299, 54.4855138 ], [ -126.191384199999987, 54.4855124 ], [ -126.190964899999983, 54.4855124 ], [ -126.1905363, 54.4854839 ], [ -126.190489099999979, 54.4854925 ], [ -126.1900351, 54.4855622 ], [ -126.1899749, 54.4855523 ], [ -126.1896475, 54.4853913 ], [ -126.189345399999979, 54.485276 ], [ -126.1889615, 54.4852318 ], [ -126.1886074, 54.4852418 ], [ -126.1882666, 54.4852418 ], [ -126.1878498, 54.4852418 ], [ -126.1877105, 54.4852475 ], [ -126.187616, 54.4852717 ], [ -126.187502899999984, 54.4853415 ], [ -126.1873061, 54.4855081 ], [ -126.1871418, 54.4856662 ], [ -126.1871064, 54.4857104 ], [ -126.186989299999979, 54.4858599 ], [ -126.18688, 54.4860906 ], [ -126.1866918, 54.486357 ], [ -126.1864454, 54.4865663 ], [ -126.1862738, 54.4866076 ], [ -126.186227699999989, 54.4866062 ], [ -126.1858676, 54.4866603 ], [ -126.1858235, 54.4866603 ], [ -126.1855868, 54.4867258 ], [ -126.1855208, 54.4867871 ], [ -126.185547, 54.4868512 ], [ -126.18559590000001, 54.4870505 ], [ -126.1855759, 54.4870861 ], [ -126.185530599999979, 54.487103200000014 ], [ -126.185188599999975, 54.4871132 ], [ -126.185084099999983, 54.4870833 ], [ -126.1848252, 54.487005 ], [ -126.1844989, 54.4868269 ], [ -126.184436299999987, 54.486817 ], [ -126.1840962, 54.4868355 ], [ -126.1840501, 54.4868341 ], [ -126.1838841, 54.4867771 ], [ -126.1836453, 54.4866632 ], [ -126.1836157, 54.4866361 ], [ -126.1832682, 54.4865108 ], [ -126.182944, 54.4865122 ], [ -126.1825665, 54.486629 ], [ -126.182548200000014, 54.4866731 ], [ -126.1824823, 54.4867344 ], [ -126.18227, 54.4868825 ], [ -126.1822501, 54.4869452 ], [ -126.1823308, 54.4871175 ], [ -126.1823484, 54.4873154 ], [ -126.182211900000013, 54.4875191 ], [ -126.181951500000011, 54.4877199 ], [ -126.1819565, 54.4878638 ], [ -126.1820162, 54.4881087 ], [ -126.181833, 54.4883195 ], [ -126.1815623, 54.4884391 ], [ -126.181246699999988, 54.4885403 ], [ -126.1809145, 54.48864 ], [ -126.1805344, 54.4887568 ], [ -126.180330399999988, 54.4888337 ], [ -126.1800744, 54.4889533 ], [ -126.1798485, 54.4890914 ], [ -126.1795914, 54.489221 ], [ -126.179279799999989, 54.4892766 ], [ -126.179204199999987, 54.4892481 ], [ -126.1791627, 54.4891926 ], [ -126.1791292, 54.4890117 ], [ -126.179173600000013, 54.488798 ], [ -126.179299300000011, 54.4885488 ], [ -126.179452900000015, 54.4883452 ], [ -126.1794381, 54.4883181 ], [ -126.1792539, 54.4883053 ], [ -126.178908, 54.488161399999989 ], [ -126.178832499999984, 54.48816 ], [ -126.1786915, 54.4881842 ], [ -126.1783764, 54.4882839 ], [ -126.177999199999988, 54.4883651 ], [ -126.1776989, 54.4884577 ], [ -126.1776, 54.4885631 ], [ -126.1774328, 54.4887567 ], [ -126.177385, 54.4887738 ], [ -126.1773223, 54.4887639 ], [ -126.177199, 54.4885531 ], [ -126.1771381, 54.4885246 ], [ -126.1770301, 54.4885317 ], [ -126.1766529, 54.4886129 ], [ -126.1763361, 54.4887311 ], [ -126.1761968, 54.4887368 ], [ -126.1760013, 54.488687 ], [ -126.1758318, 54.4886741 ], [ -126.175490400000015, 54.4886756 ], [ -126.175368299999988, 54.4886813 ], [ -126.175319899999977, 54.4887069 ], [ -126.175091199999983, 54.4888735 ], [ -126.174982, 54.4888977 ], [ -126.1746772, 54.488845 ], [ -126.174408199999988, 54.4887126 ], [ -126.174410499999979, 54.488452 ], [ -126.174686499999979, 54.4882697 ], [ -126.174704, 54.488207 ], [ -126.1746631, 54.4881429 ], [ -126.1743197, 54.4879649 ], [ -126.174033099999974, 54.487868 ], [ -126.1737978, 54.48771 ], [ -126.1735977, 54.4874807 ], [ -126.1733412, 54.4873753 ], [ -126.1732179, 54.4873909 ], [ -126.1731689, 54.4874251 ], [ -126.173164899999989, 54.487470699999989 ], [ -126.173182399999988, 54.4876686 ], [ -126.1731005, 54.487747 ], [ -126.1729463, 54.4877256 ], [ -126.1726234, 54.48771 ], [ -126.172326499999983, 54.4877655 ], [ -126.1721747, 54.4877441 ], [ -126.172131400000012, 54.4876801 ], [ -126.172068400000015, 54.4874721 ], [ -126.171919, 54.4874237 ], [ -126.1716829, 54.4874807 ], [ -126.1713011, 54.487616 ], [ -126.1709411, 54.4876971 ], [ -126.1705219, 54.4877313 ], [ -126.1704617, 54.4877214 ], [ -126.170071, 54.487559 ], [ -126.169744, 54.4873625 ], [ -126.169412599999987, 54.4872471 ], [ -126.169274500000014, 54.4872357 ], [ -126.168832599999988, 54.4871616 ], [ -126.168425500000012, 54.4870178 ], [ -126.1682522, 54.4868512 ], [ -126.168093, 54.4866859 ], [ -126.1678092, 54.4865264 ], [ -126.167473299999983, 54.4864923 ], [ -126.1674102, 54.4865179 ], [ -126.1673748, 54.486562 ], [ -126.167316099999979, 54.4867401 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17064761, "stream_order": 5, "gnis_name": "Richfield Creek", "downstream_route_measure": 12352.7740168083, "blue_line_key": 360788426, "length_metre": 124.317262956566, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.27242840000001, 54.5752874 ], [ -126.272138200000015, 54.5754697 ], [ -126.272006, 54.5756008 ], [ -126.2719545, 54.5756634 ], [ -126.271835200000012, 54.5758486 ], [ -126.2716868, 54.5759981 ], [ -126.271574500000014, 54.5760238 ], [ -126.2714521, 54.5760294 ], [ -126.2712196, 54.5760337 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17072337, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 751.63104947564705, "blue_line_key": 360881632, "length_metre": 250.240060885883, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6415174, 54.5361657 ], [ -126.6444191, 54.5346791 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17063295, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1255.2731395196699, "blue_line_key": 360851751, "length_metre": 303.62782750339301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.207172499999984, 54.5851714 ], [ -126.2070525, 54.5851145 ], [ -126.206798399999983, 54.584992 ], [ -126.2066323, 54.5849336 ], [ -126.2063154, 54.5848012 ], [ -126.206138899999985, 54.5846886 ], [ -126.205843300000012, 54.584475 ], [ -126.205670399999974, 54.5842827 ], [ -126.2056142, 54.5841916 ], [ -126.205606, 54.5841104 ], [ -126.205588, 54.583911 ], [ -126.2055856, 54.583723 ], [ -126.2055444, 54.5836589 ], [ -126.205416, 54.5834937 ], [ -126.2052282, 54.5832744 ], [ -126.2051722, 54.5832103 ], [ -126.2050124, 54.5830437 ], [ -126.2048974, 54.582924 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17075072, "stream_order": 4, "gnis_name": "Johnny David Creek", "downstream_route_measure": 793.68311553049796, "blue_line_key": 360866287, "length_metre": 386.76837583007699, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3689199, 54.5205081 ], [ -126.369256799999988, 54.5203172 ], [ -126.369413099999989, 54.5202845 ], [ -126.369504799999987, 54.5202959 ], [ -126.3696388, 54.5203614 ], [ -126.369696300000015, 54.5204354 ], [ -126.369754699999987, 54.5204995 ], [ -126.3697678, 54.520518 ], [ -126.369783899999987, 54.5205351 ], [ -126.3697231, 54.5207502 ], [ -126.3696209, 54.5209012 ], [ -126.369561699999977, 54.5210977 ], [ -126.3695992, 54.5212145 ], [ -126.3696521, 54.5213783 ], [ -126.369662199999979, 54.521468 ], [ -126.3696638, 54.521666 ], [ -126.3696443, 54.5217286 ], [ -126.3695732, 54.5218611 ], [ -126.3695395, 54.5219152 ], [ -126.369450199999989, 54.5221203 ], [ -126.3694529, 54.5223083 ], [ -126.3696108, 54.5224735 ], [ -126.3699387, 54.5226786 ], [ -126.3700439, 54.5227355 ], [ -126.370342799999989, 54.5228765 ], [ -126.370432099999974, 54.5229506 ], [ -126.3705058, 54.5230061 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17064106, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 22022.245815930699, "blue_line_key": 360875378, "length_metre": 356.19196997587198, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6765834, 54.5769862 ], [ -126.681340299999988, 54.5786081 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17084564, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 230511.29426847299, "blue_line_key": 360873822, "length_metre": 550.372003943604, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2602596, 54.4748038 ], [ -126.259931599999973, 54.4748508 ], [ -126.2598082, 54.4748394 ], [ -126.2595017, 54.4748052 ], [ -126.259167299999987, 54.4747254 ], [ -126.259061100000011, 54.474714 ], [ -126.2589365, 54.4747197 ], [ -126.2587017, 54.4747596 ], [ -126.2583592, 54.4748337 ], [ -126.2581106, 54.4748365 ], [ -126.2580197, 54.4748166 ], [ -126.257825099999977, 54.4747226 ], [ -126.2577249, 54.4746115 ], [ -126.2576982, 54.4745488 ], [ -126.2576752, 54.4744135 ], [ -126.257719400000013, 54.4742341 ], [ -126.257787, 54.4741543 ], [ -126.257992, 54.4740603 ], [ -126.2581018, 54.4740546 ], [ -126.258191599999989, 54.4740917 ], [ -126.258472700000013, 54.4742868 ], [ -126.258562, 54.4743252 ], [ -126.258761099999987, 54.4743651 ], [ -126.2588826, 54.474368 ], [ -126.2590696, 54.4743452 ], [ -126.259151, 54.4743024 ], [ -126.2593611, 54.4741458 ], [ -126.259544, 54.4739692 ], [ -126.259613699999989, 54.4738282 ], [ -126.2596183, 54.4737741 ], [ -126.2596067, 54.47371 ], [ -126.2596037, 54.4735391 ], [ -126.2595365, 54.4733767 ], [ -126.2594676, 54.473267 ], [ -126.2593361, 54.4731474 ], [ -126.2592308, 54.473099 ], [ -126.2588576, 54.4728939 ], [ -126.2587206, 54.4728725 ], [ -126.258457299999989, 54.4728754 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092011, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 15778.936805257101, "blue_line_key": 360862508, "length_metre": 26.577200767967199, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.36362530000001, 54.4130671 ], [ -126.363327399999989, 54.4132309 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104510, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 33631.963881790201, "blue_line_key": 360881038, "length_metre": 11.268887863921099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0564823, 54.2130683 ], [ -126.05660970000001, 54.2129999 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17093004, "stream_order": 5, "gnis_name": "Bulkley River", "downstream_route_measure": 267605.27232613199, "blue_line_key": 360873822, "length_metre": 1088.81797771214, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0621045, 54.4032088 ], [ -126.0621192, 54.4032088 ], [ -126.062470099999985, 54.40328 ], [ -126.0629253, 54.403354 ], [ -126.063370100000014, 54.4034096 ], [ -126.063792799999987, 54.403519199999984 ], [ -126.0641082, 54.4036346 ], [ -126.0644268, 54.4037144 ], [ -126.0645192, 54.4037158 ], [ -126.0649029, 54.4037172 ], [ -126.0653232, 54.4036916 ], [ -126.065562799999981, 54.4035435 ], [ -126.0655991, 54.4034637 ], [ -126.065633, 54.4032216 ], [ -126.065753199999989, 54.403045 ], [ -126.066067, 54.4029624 ], [ -126.0661914, 54.4029567 ], [ -126.066513, 54.4029738 ], [ -126.066797799999989, 54.4030792 ], [ -126.0672401, 54.4031618 ], [ -126.067638399999979, 54.4031902 ], [ -126.0679484, 54.4031789 ], [ -126.0683032, 54.4031789 ], [ -126.068744299999977, 54.4032444 ], [ -126.06905, 54.4032785 ], [ -126.0694813, 54.40327 ], [ -126.0698992, 54.4032444 ], [ -126.070363699999987, 54.4032387 ], [ -126.0706688, 54.4032814 ], [ -126.071032, 54.4033526 ], [ -126.071385, 54.4033711 ], [ -126.0717005, 54.40327 ], [ -126.071912700000013, 54.4031233 ], [ -126.072155400000014, 54.4029666 ], [ -126.072438, 54.4028755 ], [ -126.072737, 54.402792899999987 ], [ -126.0732039, 54.4027402 ], [ -126.0735318, 54.402659 ], [ -126.0738204, 54.4025038 ], [ -126.074046, 54.4023742 ], [ -126.074345, 54.4022916 ], [ -126.074749399999988, 54.402256 ], [ -126.0750638, 54.4021648 ], [ -126.075141, 54.4021677 ], [ -126.0751679, 54.402194699999988 ], [ -126.075177, 54.4022845 ], [ -126.0752051, 54.402538 ], [ -126.075231399999979, 54.4026006 ], [ -126.0754641, 54.4027957 ], [ -126.0756398, 54.4029524 ], [ -126.075647100000012, 54.4030606 ], [ -126.075487200000012, 54.4031376 ], [ -126.0754829, 54.4031831 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093275, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 19033.818284629699, "blue_line_key": 360862508, "length_metre": 410.443108406232, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.34216, 54.4009087 ], [ -126.3420429, 54.4007976 ], [ -126.3420168, 54.4007335 ], [ -126.3419669, 54.4005711 ], [ -126.3418937, 54.4005156 ], [ -126.341710299999988, 54.4004672 ], [ -126.341606500000012, 54.4004287 ], [ -126.341305600000013, 54.4003048 ], [ -126.341150599999978, 54.400094 ], [ -126.3411386, 54.40003140000001 ], [ -126.3411238, 54.4000043 ], [ -126.3410727, 54.399859 ], [ -126.3409319, 54.3996497 ], [ -126.340842, 54.3995927 ], [ -126.340618, 54.3995072 ], [ -126.3404545, 54.3993962 ], [ -126.3401292, 54.3991825 ], [ -126.339987799999989, 54.3989817 ], [ -126.339914, 54.3989347 ], [ -126.3398759, 54.398808 ], [ -126.339886100000015, 54.3986556 ], [ -126.339756099999974, 54.398526 ], [ -126.339608, 54.3984334 ], [ -126.3392959, 54.3982653 ], [ -126.339168699999988, 54.3981001 ], [ -126.3389631, 54.397915 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17055304, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 25843.949792213902, "blue_line_key": 360856488, "length_metre": 416.69569869201399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5649251, 54.624491 ], [ -126.5654153, 54.624427 ], [ -126.5666682, 54.6244369 ], [ -126.5690382, 54.625394 ], [ -126.5708559, 54.6254553 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17052430, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1447.5736353151501, "blue_line_key": 360851779, "length_metre": 550.79078026404898, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.522955700000011, 54.6445952 ], [ -126.522950900000012, 54.6446664 ], [ -126.522960399999988, 54.6447746 ], [ -126.5231049, 54.6449484 ], [ -126.523282400000014, 54.6450694 ], [ -126.5236277, 54.645246 ], [ -126.5238582, 54.6453058 ], [ -126.5240705, 54.6453899 ], [ -126.5241425, 54.6454454 ], [ -126.524362, 54.6456662 ], [ -126.5244626, 54.6458029 ], [ -126.524590499999988, 54.6460037 ], [ -126.524721199999973, 54.6461319 ], [ -126.5248238, 54.6462415 ], [ -126.5248786, 54.6463683 ], [ -126.524904400000011, 54.6464509 ], [ -126.5249396, 54.6466133 ], [ -126.5249301, 54.6467842 ], [ -126.5249473, 54.6469992 ], [ -126.5250141, 54.6471986 ], [ -126.525037, 54.6473254 ], [ -126.525027399999985, 54.6474963 ], [ -126.5250842, 54.647560399999982 ], [ -126.52520389999998, 54.6476344 ], [ -126.5254411, 54.6478182 ], [ -126.5255537, 54.6479919 ], [ -126.5255785, 54.6480916 ], [ -126.525631, 54.648254 ], [ -126.525684399999989, 54.6483992 ], [ -126.5257526, 54.6485445 ], [ -126.5257774, 54.6486442 ], [ -126.5257999, 54.6487795 ], [ -126.5258653, 54.6490045 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17056515, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 17982.641947533, "blue_line_key": 360856488, "length_metre": 31.5236942105544, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5059755, 54.6178514 ], [ -126.5059853, 54.6179511 ], [ -126.506147700000014, 54.6181077 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17067435, "stream_order": 4, "gnis_name": "Johnny David Creek", "downstream_route_measure": 6963.7460116842803, "blue_line_key": 360866287, "length_metre": 272.33639120288098, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4186361, 54.5604087 ], [ -126.4189193, 54.5605754 ], [ -126.4190961, 54.560723499999987 ], [ -126.4193453, 54.5609172 ], [ -126.4195834, 54.5610938 ], [ -126.4196563, 54.5611664 ], [ -126.4197681, 54.5613316 ], [ -126.4198063, 54.5614755 ], [ -126.4198699, 54.5616663 ], [ -126.419878700000012, 54.5618101 ], [ -126.4198367, 54.5619796 ], [ -126.41980070000001, 54.5620337 ], [ -126.419712499999989, 54.5622018 ], [ -126.4197026, 54.5623642 ], [ -126.4197387, 54.5625351 ], [ -126.4197797, 54.5626077 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17089485, "stream_order": 4, "gnis_name": "McKilligan Creek", "downstream_route_measure": 0.0, "blue_line_key": 360770255, "length_metre": 18.631064388634599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.589439899999988, 54.4357249 ], [ -126.5892858, 54.4355839 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17067738, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 443.08707265447703, "blue_line_key": 360881574, "length_metre": 91.450525890490695, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5956873, 54.5581243 ], [ -126.595860699999989, 54.5580915 ], [ -126.596121, 54.5581058 ], [ -126.5963991, 54.5581115 ], [ -126.596522799999988, 54.5581229 ], [ -126.5967778, 54.5582453 ], [ -126.5968382, 54.5582909 ], [ -126.5969773, 54.5582938 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17092633, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 250412.258317906, "blue_line_key": 360873822, "length_metre": 842.667521607975, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1950778, 54.4078731 ], [ -126.194859299999976, 54.4076708 ], [ -126.1947178, 54.407478499999989 ], [ -126.1947008, 54.4072806 ], [ -126.1946738, 54.4072265 ], [ -126.1946149, 54.4072065 ], [ -126.1942607, 54.407198 ], [ -126.194165200000015, 54.4072322 ], [ -126.193984199999989, 54.4074159 ], [ -126.193873899999986, 54.407648 ], [ -126.1938132, 54.4078716 ], [ -126.1937967, 54.4078973 ], [ -126.1936358, 54.4079841 ], [ -126.193291599999981, 54.4080568 ], [ -126.1929904, 54.4081664 ], [ -126.192778899999979, 54.4083601 ], [ -126.1926408, 54.4085538 ], [ -126.19249, 54.4087489 ], [ -126.192393899999985, 54.4087917 ], [ -126.1922083, 54.4088045 ], [ -126.1921806, 54.4087589 ], [ -126.1921865, 54.4086606 ], [ -126.1922473, 54.4084641 ], [ -126.192189500000012, 54.4084 ], [ -126.1918513, 54.4083744 ], [ -126.1915389, 54.408447 ], [ -126.1914734, 54.4084997 ], [ -126.191437499999978, 54.4085795 ], [ -126.191438699999978, 54.4087874 ], [ -126.191387299999988, 54.4088486 ], [ -126.191293, 54.4088728 ], [ -126.1911422, 54.4088429 ], [ -126.1910238, 54.4087774 ], [ -126.19089169999998, 54.4086749 ], [ -126.190624899999989, 54.4085253 ], [ -126.190491099999988, 54.4084413 ], [ -126.1902554, 54.4082733 ], [ -126.1900693, 54.4080895 ], [ -126.1900363, 54.4078816 ], [ -126.190160799999987, 54.4076509 ], [ -126.190188499999977, 54.4074714 ], [ -126.1901738, 54.4074444 ], [ -126.1900707, 54.4073974 ], [ -126.1899323, 54.4073945 ], [ -126.1895597, 54.4074031 ], [ -126.1893476, 54.4073532 ], [ -126.1891108, 54.4072222 ], [ -126.1889854, 54.4070399 ], [ -126.1889053, 54.4068405 ], [ -126.1886879, 54.4066283 ], [ -126.1886296, 54.4065998 ], [ -126.1885665, 54.4065984 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17092736, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 175539.684642081, "blue_line_key": 360873822, "length_metre": 470.03758591030902, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.659128, 54.4033227 ], [ -126.6577443, 54.4042057 ], [ -126.6570795, 54.4043723 ], [ -126.655264100000011, 54.4044492 ], [ -126.6543174, 54.4042726 ], [ -126.6526673, 54.4041559 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101118, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 25225.150825806199, "blue_line_key": 360881038, "length_metre": 82.924850768609502, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0698442, 54.2613176 ], [ -126.0698959, 54.2612564 ], [ -126.0700227, 54.2611966 ], [ -126.0700878, 54.2611254 ], [ -126.070268899999988, 54.2609772 ], [ -126.0703803, 54.260926 ], [ -126.0704129, 54.2608904 ], [ -126.0704356, 54.260775 ], [ -126.070470599999979, 54.2607394 ], [ -126.0705166, 54.2607138 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17075846, "stream_order": 4, "gnis_name": "Perow Creek", "downstream_route_measure": 260.435586647555, "blue_line_key": 360836816, "length_metre": 4002.3910229039702, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4419385, 54.5160702 ], [ -126.441806199999988, 54.5162383 ], [ -126.4418009, 54.5163095 ], [ -126.441839399999978, 54.5164448 ], [ -126.4419373, 54.5166 ], [ -126.441979199999977, 54.5166556 ], [ -126.442009, 54.5166826 ], [ -126.442024, 54.5167097 ], [ -126.442036699999989, 54.5167368 ], [ -126.44205119999998, 54.5167652 ], [ -126.4420654, 54.5167738 ], [ -126.4420649, 54.5167823 ], [ -126.442223899999988, 54.5169661 ], [ -126.442265299999988, 54.5170302 ], [ -126.4423945, 54.5171939 ], [ -126.4425667, 54.5173962 ], [ -126.4426571, 54.5174603 ], [ -126.4426864, 54.5174888 ], [ -126.442699, 54.5175158 ], [ -126.442759200000012, 54.5175614 ], [ -126.442826700000012, 54.5176981 ], [ -126.442881, 54.5178163 ], [ -126.4428845, 54.5179958 ], [ -126.4428156, 54.5181296 ], [ -126.442815099999976, 54.5181382 ], [ -126.442799799999975, 54.5181467 ], [ -126.4427983, 54.5181652 ], [ -126.442779500000015, 54.5181909 ], [ -126.4427683, 54.5183703 ], [ -126.4428487, 54.5185612 ], [ -126.443041799999989, 54.5187178 ], [ -126.4431114, 54.5188275 ], [ -126.443100199999989, 54.519007 ], [ -126.44311110000001, 54.5190881 ], [ -126.443130900000014, 54.5192419 ], [ -126.4431118, 54.5193317 ], [ -126.44301990000001, 54.5195453 ], [ -126.4430438, 54.5196806 ], [ -126.443069, 54.5197347 ], [ -126.443096700000012, 54.5197888 ], [ -126.4431814, 54.5199256 ], [ -126.443239, 54.5199996 ], [ -126.4434881, 54.5202204 ], [ -126.4435462, 54.520293 ], [ -126.4437033, 54.5204682 ], [ -126.443745600000014, 54.5205579 ], [ -126.443794200000013, 54.5207488 ], [ -126.4438019, 54.5208741 ], [ -126.4438084, 54.521045 ], [ -126.4438, 54.5211532 ], [ -126.4438146, 54.5211888 ], [ -126.443810899999974, 54.5212344 ], [ -126.4438381, 54.5212971 ], [ -126.443950500000014, 54.5214879 ], [ -126.4440342, 54.5216346 ], [ -126.444105400000012, 54.5217258 ], [ -126.4442043, 54.521871 ], [ -126.4443283, 54.5220989 ], [ -126.444355, 54.522163 ], [ -126.4444197, 54.5223709 ], [ -126.4444557, 54.5225418 ], [ -126.4444777, 54.52266860000001 ], [ -126.4444859, 54.5227854 ], [ -126.4445277, 54.52287650000001 ], [ -126.4446113, 54.5230304 ], [ -126.4446815, 54.5231315 ], [ -126.444813400000015, 54.523259599999989 ], [ -126.4450507, 54.5234092 ], [ -126.4452566, 54.5235573 ], [ -126.4455232, 54.5237425 ], [ -126.4457777, 54.523892 ], [ -126.446029599999989, 54.524077099999985 ], [ -126.446252300000012, 54.5241982 ], [ -126.4463718, 54.5242637 ], [ -126.446614299999979, 54.5243492 ], [ -126.4468123, 54.5244076 ], [ -126.446964900000012, 54.5244204 ], [ -126.447194400000015, 54.5244517 ], [ -126.4474337, 54.5246098 ], [ -126.4476438, 54.5247038 ], [ -126.447985300000013, 54.5249274 ], [ -126.448205800000011, 54.5251111 ], [ -126.4482477, 54.5251667 ], [ -126.4484661, 54.5253774 ], [ -126.44862950000001, 54.5255071 ], [ -126.4488339, 54.5256737 ], [ -126.4491171, 54.5258674 ], [ -126.4493854, 54.5260269 ], [ -126.449476, 54.5260554 ], [ -126.4498082, 54.5261793 ], [ -126.450065, 54.5262661 ], [ -126.450276699999975, 54.5263416 ], [ -126.4505188, 54.5264285 ], [ -126.450778199999988, 54.5264869 ], [ -126.451144399999976, 54.5265766 ], [ -126.451326799999975, 54.5266165 ], [ -126.4516323, 54.5266763 ], [ -126.451753, 54.5266963 ], [ -126.452124399999988, 54.5267219 ], [ -126.4523524, 54.5267717 ], [ -126.452717599999986, 54.5268786 ], [ -126.4527926, 54.526917 ], [ -126.4531234, 54.527031 ], [ -126.4532737, 54.5271064 ], [ -126.453558199999989, 54.5272474 ], [ -126.453784, 54.5273599 ], [ -126.45399, 54.5275081 ], [ -126.454332600000015, 54.5277217 ], [ -126.45454, 54.5278798 ], [ -126.4547927, 54.5280279 ], [ -126.454996900000012, 54.5282301 ], [ -126.4550414, 54.5282857 ], [ -126.455150899999978, 54.5284851 ], [ -126.4551771, 54.5285577 ], [ -126.4552446, 54.52873 ], [ -126.45531, 54.528929399999988 ], [ -126.4553268, 54.5291274 ], [ -126.4553349, 54.5292798 ], [ -126.4553748, 54.5293624 ], [ -126.455534500000013, 54.5295447 ], [ -126.455692199999987, 54.5297469 ], [ -126.4558668, 54.5298936 ], [ -126.456026, 54.5300773 ], [ -126.4561533, 54.5302682 ], [ -126.4562539, 54.5303878 ], [ -126.456414200000012, 54.530561600000013 ], [ -126.4565725, 54.5307268 ], [ -126.456720800000014, 54.5308293 ], [ -126.4570504, 54.5310244 ], [ -126.4572684, 54.5312366 ], [ -126.457335500000013, 54.5313819 ], [ -126.4573999, 54.5315984 ], [ -126.4574795, 54.5318063 ], [ -126.457575299999988, 54.532024199999988 ], [ -126.4577052, 54.5321795 ], [ -126.457821599999988, 54.532282 ], [ -126.458015, 54.5324031 ], [ -126.458120400000013, 54.5324315 ], [ -126.4584416, 54.5325099 ], [ -126.458698, 54.5326053 ], [ -126.4587871, 54.5326523 ], [ -126.458904, 54.5327534 ], [ -126.4590345, 54.5329001 ], [ -126.4591341, 54.5330368 ], [ -126.4592802, 54.5332021 ], [ -126.459636100000012, 54.5334342 ], [ -126.4598882, 54.5336193 ], [ -126.460066, 54.5337219 ], [ -126.460291399999988, 54.5338073 ], [ -126.4606358, 54.5339953 ], [ -126.460696, 54.5340409 ], [ -126.460993699999989, 54.534236 ], [ -126.4610929, 54.5343457 ], [ -126.4611673, 54.5343927 ], [ -126.4614655, 54.5345793 ], [ -126.4615866, 54.5346263 ], [ -126.461860699999988, 54.5347131 ], [ -126.4621266, 54.5348798 ], [ -126.462307899999985, 54.5349652 ], [ -126.462639700000011, 54.5350977 ], [ -126.4627613, 54.5351361 ], [ -126.463079099999987, 54.5352244 ], [ -126.4632023, 54.5352444 ], [ -126.46354190000001, 54.53527 ], [ -126.463829299999986, 54.5353469 ], [ -126.464195600000011, 54.5354366 ], [ -126.4644683, 54.5355135 ], [ -126.4645772, 54.5355249 ], [ -126.464853, 54.5355577 ], [ -126.46511409999998, 54.5355904 ], [ -126.4654046, 54.5356232 ], [ -126.4654974, 54.5356246 ], [ -126.465885199999974, 54.5356246 ], [ -126.466130100000015, 54.5356474 ], [ -126.466251699999987, 54.5356859 ], [ -126.4665405, 54.5357727 ], [ -126.4668578, 54.5358696 ], [ -126.4672231, 54.5359764 ], [ -126.467459600000012, 54.536143 ], [ -126.4676215, 54.5362983 ], [ -126.4677999, 54.5363923 ], [ -126.467948299999989, 54.5364948 ], [ -126.4681601, 54.5365703 ], [ -126.4683126, 54.5366187 ], [ -126.4686304, 54.536707 ], [ -126.4687058, 54.5367441 ], [ -126.4690813, 54.5369135 ], [ -126.4691557, 54.5369605 ], [ -126.4691982, 54.5370147 ], [ -126.469311499999989, 54.537197 ], [ -126.469337700000011, 54.537269599999988 ], [ -126.469372899999982, 54.5374505 ], [ -126.4694012, 54.537496 ], [ -126.4695343, 54.5376071 ], [ -126.4696549, 54.5376627 ], [ -126.4699857, 54.5378051 ], [ -126.470073899999988, 54.5378692 ], [ -126.47016619999998, 54.537872 ], [ -126.4705195, 54.5379148 ], [ -126.4708262, 54.5379575 ], [ -126.4709468, 54.538013 ], [ -126.471123, 54.5381697 ], [ -126.471284, 54.5382993 ], [ -126.4714964, 54.5383662 ], [ -126.4716343, 54.538379 ], [ -126.4719907, 54.5383776 ], [ -126.4723619, 54.5383762 ], [ -126.47273, 54.5384189 ], [ -126.4730225, 54.5384531 ], [ -126.4731904, 54.5384645 ], [ -126.47342350000001, 54.5384787 ], [ -126.4737617, 54.5384944 ], [ -126.4738976, 54.5385343 ], [ -126.474003499999981, 54.5385898 ], [ -126.4742076, 54.538765 ], [ -126.4742819, 54.5388476 ], [ -126.474378, 54.5390299 ], [ -126.474460399999984, 54.5392022 ], [ -126.4746036, 54.539376 ], [ -126.474903, 54.5395526 ], [ -126.4750697, 54.5396096 ], [ -126.4753876, 54.5396979 ], [ -126.4756607, 54.5398018 ], [ -126.4757636, 54.5398588 ], [ -126.4760305, 54.540044 ], [ -126.476120799999975, 54.540081 ], [ -126.4764395, 54.5401878 ], [ -126.476697, 54.5402733 ], [ -126.476999100000015, 54.5403786 ], [ -126.4770923, 54.5404071 ], [ -126.4774254, 54.5404869 ], [ -126.477729400000015, 54.5406008 ], [ -126.4779423, 54.5406592 ], [ -126.4781836, 54.5407632 ], [ -126.478302700000015, 54.5408016 ], [ -126.4786068, 54.540915600000012 ], [ -126.478771499999979, 54.5409996 ], [ -126.4788465, 54.541038 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17081701, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 8327.4741903056492, "blue_line_key": 360875052, "length_metre": 43.078779870143599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.410798899999975, 54.487087599999988 ], [ -126.41093020000001, 54.4869651 ], [ -126.411093600000015, 54.486807 ], [ -126.4111274, 54.4867529 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17069491, "stream_order": 4, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 18039.325932728399, "blue_line_key": 360875378, "length_metre": 33.8742594898196, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6482742, 54.5487672 ], [ -126.6482704, 54.548857 ], [ -126.6482803, 54.5489282 ], [ -126.6484135, 54.5490478 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17089888, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 241639.27097949799, "blue_line_key": 360873822, "length_metre": 225.17361897960299, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.20425920000001, 54.434393299999989 ], [ -126.2043361, 54.4344317 ], [ -126.2044924, 54.4345969 ], [ -126.204504300000011, 54.4346596 ], [ -126.204583, 54.4348775 ], [ -126.20469460000001, 54.4350512 ], [ -126.204800100000014, 54.4350712 ], [ -126.2048933, 54.4350641 ], [ -126.2052888, 54.4349031 ], [ -126.2054651, 54.4348348 ], [ -126.2055918, 54.4347749 ], [ -126.205877, 54.4346553 ], [ -126.2059578, 54.4346211 ], [ -126.206086899999988, 54.4345343 ], [ -126.2061523, 54.4344815 ], [ -126.2061858, 54.4344289 ], [ -126.2062512, 54.434376199999988 ], [ -126.206357900000015, 54.434379 ], [ -126.206451199999989, 54.434399 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17092080, "stream_order": 5, "gnis_name": "Bulkley River", "downstream_route_measure": 270126.65592715301, "blue_line_key": 360873822, "length_metre": 295.16232424736199, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.079266, 54.4130557 ], [ -126.0794009, 54.4131227 ], [ -126.0796858, 54.4132281 ], [ -126.0799892, 54.4132893 ], [ -126.0801136, 54.4132836 ], [ -126.0805009, 54.413248 ], [ -126.080748499999984, 54.4132267 ], [ -126.080901199999985, 54.413258 ], [ -126.08102, 54.413315 ], [ -126.0811788, 54.4134716 ], [ -126.081223499999979, 54.4134901 ], [ -126.081469899999988, 54.4135058 ], [ -126.0815459, 54.4135257 ], [ -126.0816028, 54.4135713 ], [ -126.081612, 54.413661 ], [ -126.081629799999988, 54.4138419 ], [ -126.081688700000015, 54.4138889 ], [ -126.082022, 54.4139687 ], [ -126.0824038, 54.4140228 ], [ -126.0825368, 54.4140883 ], [ -126.0826441, 54.4141097 ], [ -126.082797899999989, 54.414104 ], [ -126.0828745, 54.4141154 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17096171, "stream_order": 4, "gnis_name": "Dungate Creek", "downstream_route_measure": 5762.0328122045603, "blue_line_key": 360760898, "length_metre": 316.30555829881501, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5678896, 54.3443291 ], [ -126.5679608, 54.3441682 ], [ -126.5679639, 54.344097 ], [ -126.567989799999978, 54.343926 ], [ -126.568047, 54.3437566 ], [ -126.56809650000001, 54.3436854 ], [ -126.568167300000013, 54.3435258 ], [ -126.5681747, 54.3434005 ], [ -126.568109400000012, 54.3432182 ], [ -126.567951799999989, 54.3430274 ], [ -126.56785, 54.3429348 ], [ -126.5677037, 54.3427881 ], [ -126.567544399999989, 54.3426229 ], [ -126.5674744, 54.3425232 ], [ -126.5673298, 54.342358 ], [ -126.5671403, 54.3421743 ], [ -126.5670411, 54.342019 ], [ -126.5668494, 54.3418624 ], [ -126.566704, 54.3417342 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17096433, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 11021.9364563986, "blue_line_key": 360881038, "length_metre": 334.11656299948697, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1595218, 54.338072499999981 ], [ -126.159337, 54.3380768 ], [ -126.159118, 54.3381352 ], [ -126.1588837, 54.3381751 ], [ -126.1587683, 54.3380555 ], [ -126.158775, 54.3379558 ], [ -126.158716899999988, 54.3379002 ], [ -126.1584412, 54.337886 ], [ -126.158208699999989, 54.3379344 ], [ -126.15803360000001, 54.3380199 ], [ -126.1579013, 54.3381423 ], [ -126.1576106, 54.3383517 ], [ -126.1574502, 54.3384371 ], [ -126.1572006, 54.3384856 ], [ -126.1569363, 54.3385069 ], [ -126.156612699999982, 54.3385169 ], [ -126.1563392, 54.3384827 ], [ -126.1561436, 54.338415800000014 ], [ -126.155785299999977, 54.3382449 ], [ -126.1556392, 54.3381423 ], [ -126.155540300000013, 54.3380241 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17093452, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 254699.20735158501, "blue_line_key": 360873822, "length_metre": 265.18783624552401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1601569, 54.396223 ], [ -126.1601085, 54.3962487 ], [ -126.160007, 54.3963811 ], [ -126.160025, 54.396562 ], [ -126.1600589, 54.3967329 ], [ -126.1600456, 54.3969123 ], [ -126.1600495, 54.3970918 ], [ -126.1600528, 54.3972727 ], [ -126.1600873, 54.397435 ], [ -126.1602032, 54.3975546 ], [ -126.1605134, 54.3977327 ], [ -126.16072, 54.3978723 ], [ -126.160809, 54.3979378 ], [ -126.1609236, 54.398047399999989 ], [ -126.1609011, 54.3981642 ], [ -126.1608981, 54.3981998 ], [ -126.1607873, 54.3982425 ], [ -126.1606789, 54.3982582 ], [ -126.1605845, 54.3982554 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099497, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 24727.806087109599, "blue_line_key": 360880905, "length_metre": 146.330569758964, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.403458, 54.2867426 ], [ -126.4034873, 54.2867355 ], [ -126.403596600000014, 54.2867369 ], [ -126.403698299999988, 54.2867939 ], [ -126.4037406, 54.2868665 ], [ -126.4036578, 54.2869548 ], [ -126.4037165, 54.2870089 ], [ -126.4038053, 54.28707450000001 ], [ -126.403769399999987, 54.2871272 ], [ -126.403797700000013, 54.2871912 ], [ -126.4039052, 54.2871841 ], [ -126.4040004, 54.2871499 ], [ -126.4041226, 54.2871357 ], [ -126.404152, 54.2871898 ], [ -126.404177899999979, 54.2872539 ], [ -126.4042026, 54.2873351 ], [ -126.404212, 54.2874248 ], [ -126.4042067, 54.2875145 ], [ -126.4041569, 54.2875857 ], [ -126.4041392, 54.2876214 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17097901, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 13684.557264520799, "blue_line_key": 360886221, "length_metre": 339.50608300165902, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6322216, 54.3165442 ], [ -126.6323742, 54.3164018 ], [ -126.632961, 54.3161839 ], [ -126.6330577, 54.3161169 ], [ -126.633083399999975, 54.3159603 ], [ -126.6329308, 54.3157552 ], [ -126.6323949, 54.3154946 ], [ -126.632067100000015, 54.3152738 ], [ -126.6319517, 54.3149975 ], [ -126.632108899999977, 54.3147654 ], [ -126.632548199999974, 54.3144321 ], [ -126.6327533, 54.3143694 ], [ -126.6331219, 54.3143766 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17066405, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 5432.3514248128404, "blue_line_key": 360851751, "length_metre": 101.903160332658, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.164550100000014, 54.5664982 ], [ -126.1629716, 54.5665347 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17077796, "stream_order": 4, "gnis_name": "Cesford Creek", "downstream_route_measure": 0.0, "blue_line_key": 360765936, "length_metre": 933.34895058227903, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.314389800000015, 54.5064796 ], [ -126.3140494, 54.5064711 ], [ -126.3139415, 54.506478200000011 ], [ -126.313603, 54.5064711 ], [ -126.3132946, 54.5064554 ], [ -126.3129542, 54.5064469 ], [ -126.3126909, 54.5064768 ], [ -126.3125636, 54.5065109 ], [ -126.3123129, 54.5065679 ], [ -126.3120347, 54.5065708 ], [ -126.3116496, 54.5065708 ], [ -126.311278699999974, 54.5065722 ], [ -126.3109691, 54.5065736 ], [ -126.3105982, 54.506575 ], [ -126.3103497, 54.5066049 ], [ -126.3102228, 54.5066377 ], [ -126.309952, 54.5067588 ], [ -126.3098209, 54.5068727 ], [ -126.309641899999988, 54.507039299999988 ], [ -126.3095101, 54.5071347 ], [ -126.3092655, 54.507327 ], [ -126.3091182, 54.5074595 ], [ -126.3088747, 54.5076418 ], [ -126.3087964, 54.5076759 ], [ -126.3086862, 54.5077101 ], [ -126.30837, 54.507792699999989 ], [ -126.3081815, 54.5078611 ], [ -126.3077848, 54.5080049 ], [ -126.3076099, 54.5080904 ], [ -126.3075007, 54.5081146 ], [ -126.3071396, 54.5081787 ], [ -126.3069827, 54.50822 ], [ -126.3068425, 54.5082627 ], [ -126.3065566, 54.5083638 ], [ -126.3063211, 54.5084123 ], [ -126.306196700000015, 54.508445 ], [ -126.305866400000014, 54.5085191 ], [ -126.3056645, 54.5085419 ], [ -126.3054335, 54.5085362 ], [ -126.3050773, 54.5085376 ], [ -126.3049093, 54.5085063 ], [ -126.304788, 54.5084678 ], [ -126.3045164, 54.5083895 ], [ -126.304284599999988, 54.508358099999981 ], [ -126.3040388, 54.5083524 ], [ -126.3037759, 54.5083468 ], [ -126.303514899999982, 54.5083496 ], [ -126.3033106, 54.5083724 ], [ -126.3031068, 54.5084493 ], [ -126.302863, 54.5086045 ], [ -126.302767799999984, 54.5086658 ], [ -126.302607099999989, 54.5087527 ], [ -126.302243399999981, 54.5088794 ], [ -126.30195470000001, 54.5090161 ], [ -126.3017798, 54.5091016 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17072905, "stream_order": 5, "gnis_name": "Richfield Creek", "downstream_route_measure": 4189.7319090541596, "blue_line_key": 360788426, "length_metre": 624.130693612095, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3220828, 54.5326865 ], [ -126.3220001, 54.5327748 ], [ -126.321776899999989, 54.5328859 ], [ -126.321644299999988, 54.5330183 ], [ -126.3215715, 54.5331693 ], [ -126.3215277, 54.5333843 ], [ -126.321483, 54.5335809 ], [ -126.3213655, 54.5337404 ], [ -126.321232400000014, 54.5338814 ], [ -126.321121, 54.5339327 ], [ -126.32075039999998, 54.5339327 ], [ -126.3204157, 54.5338444 ], [ -126.3200907, 54.5338472 ], [ -126.3199458, 54.5339241 ], [ -126.319894299999987, 54.5339868 ], [ -126.319836, 54.5341734 ], [ -126.319811699999974, 54.5343258 ], [ -126.3198006, 54.5344967 ], [ -126.319791099999989, 54.534649 ], [ -126.3198052, 54.53487410000001 ], [ -126.319839699999989, 54.5350549 ], [ -126.3198578, 54.5352615 ], [ -126.3198775, 54.5354423 ], [ -126.3198779, 54.5356574 ], [ -126.319880200000014, 54.5358739 ], [ -126.3198854, 54.5360263 ], [ -126.319904099999974, 54.5362242 ], [ -126.3198774, 54.5363766 ], [ -126.3198272, 54.5364564 ], [ -126.3196601, 54.5366244 ], [ -126.3195646, 54.5366586 ], [ -126.3194423, 54.5366643 ], [ -126.3191183, 54.5366572 ], [ -126.3189029, 54.5366344 ], [ -126.3187001, 54.5366387 ], [ -126.318606300000013, 54.5366543 ], [ -126.318511, 54.5367156 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17077017, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 216593.48526548999, "blue_line_key": 360873822, "length_metre": 16.653687054186801, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3561105, 54.510232399999985 ], [ -126.355852899999988, 54.5102253 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092222, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 17632.788040772699, "blue_line_key": 360862508, "length_metre": 18.015952928846101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3487072, 54.411445 ], [ -126.3488325, 54.4114022 ], [ -126.3489431, 54.4113595 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17103463, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 15731.9752050098, "blue_line_key": 360877225, "length_metre": 672.31700849627805, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2005205, 54.2308082 ], [ -126.2005725, 54.2307456 ], [ -126.2007176, 54.2306416 ], [ -126.2007812, 54.2306074 ], [ -126.2011683, 54.2305348 ], [ -126.201262399999976, 54.2305106 ], [ -126.2013413, 54.2304678 ], [ -126.2013966, 54.2303425 ], [ -126.2014064, 54.2302086 ], [ -126.2015077, 54.230057699999989 ], [ -126.2015885, 54.2299964 ], [ -126.2018415, 54.2298768 ], [ -126.2020513, 54.2297557 ], [ -126.202153900000013, 54.2295877 ], [ -126.2021617, 54.2294794 ], [ -126.202158199999985, 54.2292815 ], [ -126.2022143, 54.2291476 ], [ -126.2022641, 54.2290778 ], [ -126.2024797, 54.228867 ], [ -126.2026692, 54.2287816 ], [ -126.2028223, 54.2287759 ], [ -126.203114, 54.2287645 ], [ -126.203223899999983, 54.2287303 ], [ -126.2033052, 54.2286876 ], [ -126.2033245, 54.2286078 ], [ -126.2033125, 54.2285537 ], [ -126.2032718, 54.2284982 ], [ -126.2030897, 54.2284497 ], [ -126.2029372, 54.2284269 ], [ -126.2028636, 54.228381400000011 ], [ -126.2028415, 54.2282817 ], [ -126.2028366, 54.2281279 ], [ -126.202887499999989, 54.2280481 ], [ -126.2031553, 54.2279285 ], [ -126.203511800000015, 54.2278929 ], [ -126.2036223, 54.2278501 ], [ -126.2037064, 54.2277262 ], [ -126.2036951, 54.2276636 ], [ -126.203568800000014, 54.2275154 ], [ -126.2034946, 54.2274784 ], [ -126.2032812, 54.2274556 ], [ -126.20297429999998, 54.2274485 ], [ -126.2027875, 54.2274798 ], [ -126.202649, 54.2274855 ], [ -126.202543499999976, 54.2274741 ], [ -126.202456699999985, 54.2273915 ], [ -126.2023299, 54.2272178 ], [ -126.202307800000014, 54.227091 ], [ -126.2023271, 54.2270113 ], [ -126.2024276, 54.2268959 ], [ -126.202621, 54.2267663 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17105695, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 40458.771373989701, "blue_line_key": 360886221, "length_metre": 2694.0677418034502, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.561642299999988, 54.1961002 ], [ -126.5616264, 54.196090299999987 ], [ -126.5614786, 54.1960062 ], [ -126.561359, 54.195959200000011 ], [ -126.5613167, 54.1958866 ], [ -126.5613102, 54.1957342 ], [ -126.5612691, 54.1956787 ], [ -126.5611477, 54.1956231 ], [ -126.56101, 54.1956203 ], [ -126.560869399999987, 54.1956801 ], [ -126.5608366, 54.1957242 ], [ -126.5608155, 54.195804 ], [ -126.5607963, 54.1958852 ], [ -126.560791099999989, 54.1959749 ], [ -126.560723700000011, 54.1960547 ], [ -126.560628799999989, 54.1961159 ], [ -126.5605198, 54.1961487 ], [ -126.5603803, 54.196164300000014 ], [ -126.560256099999975, 54.1961985 ], [ -126.560144699999981, 54.1962583 ], [ -126.56006330000001, 54.1963295 ], [ -126.5600124, 54.1964178 ], [ -126.5600095, 54.1964805 ], [ -126.5600641, 54.1965802 ], [ -126.5601216, 54.1966713 ], [ -126.5601616, 54.196771 ], [ -126.560200400000014, 54.196880699999987 ], [ -126.560194599999974, 54.196979 ], [ -126.560189399999985, 54.1970687 ], [ -126.5601237, 54.1971299 ], [ -126.5600136, 54.1971727 ], [ -126.559907, 54.1971983 ], [ -126.559797899999978, 54.197204 ], [ -126.5596767, 54.1972026 ], [ -126.559568099999979, 54.1971997 ], [ -126.5594931, 54.1971712 ], [ -126.5594064, 54.1971072 ], [ -126.5593323, 54.1970416 ], [ -126.55917, 54.1969576 ], [ -126.559081399999982, 54.196885 ], [ -126.5589951, 54.1967924 ], [ -126.558968799999988, 54.1967297 ], [ -126.55891, 54.1966557 ], [ -126.558820900000015, 54.1966187 ], [ -126.5586832, 54.1966158 ], [ -126.5585301, 54.196594399999988 ], [ -126.558395899999979, 54.1965474 ], [ -126.5582475, 54.196472 ], [ -126.5581014, 54.1963424 ], [ -126.55805740000001, 54.1962882 ], [ -126.558016899999984, 54.1961971 ], [ -126.558021599999989, 54.196143 ], [ -126.5580556, 54.1960817 ], [ -126.558604, 54.1958681 ], [ -126.5587119, 54.1958524 ], [ -126.5588232, 54.1957997 ], [ -126.558996, 54.1957314 ], [ -126.559029400000014, 54.1956787 ], [ -126.559063900000012, 54.195616 ], [ -126.5590668, 54.1955533 ], [ -126.5590879, 54.1954736 ], [ -126.559031499999989, 54.1953725 ], [ -126.5589606, 54.1952913 ], [ -126.558844399999984, 54.1951802 ], [ -126.5587722, 54.195089 ], [ -126.558732299999988, 54.1949893 ], [ -126.558675400000013, 54.1949167 ], [ -126.558554599999979, 54.1948868 ], [ -126.558431500000012, 54.194884 ], [ -126.558263299999979, 54.1948982 ], [ -126.558105699999984, 54.194958 ], [ -126.5579785, 54.1950278 ], [ -126.557913, 54.1951161 ], [ -126.5578615, 54.1952058 ], [ -126.5577812, 54.1952671 ], [ -126.557685600000013, 54.1953098 ], [ -126.5575925, 54.1953525 ], [ -126.5574847, 54.195368200000011 ], [ -126.5573927, 54.1953668 ], [ -126.5573001, 54.1953739 ], [ -126.5571928, 54.195381 ], [ -126.557069700000014, 54.1953782 ], [ -126.556932, 54.1953753 ], [ -126.5567947, 54.1953369 ], [ -126.5567689, 54.1952728 ], [ -126.5567448, 54.195156 ], [ -126.5567377, 54.1950121 ], [ -126.5567423, 54.194931 ], [ -126.556742899999989, 54.1949224 ], [ -126.556747, 54.194876799999989 ], [ -126.556799699999985, 54.19477 ], [ -126.5568798, 54.194681699999983 ], [ -126.5569625, 54.1945934 ], [ -126.55702740000001, 54.1945137 ], [ -126.5570479, 54.1944425 ], [ -126.557021, 54.1943883 ], [ -126.5568838, 54.1943499 ], [ -126.5567783, 54.1943385 ], [ -126.5565802, 54.1943342 ], [ -126.556394900000015, 54.1943485 ], [ -126.5562397, 54.1943812 ], [ -126.556098899999981, 54.194414 ], [ -126.5559595, 54.1944567 ], [ -126.555819500000013, 54.1944809 ], [ -126.5556969, 54.1944695 ], [ -126.555605399999976, 54.1944667 ], [ -126.5555134, 54.1944652 ], [ -126.555378, 54.1944083 ], [ -126.5553656, 54.1943542 ], [ -126.5553557, 54.1943 ], [ -126.5553608, 54.1941832 ], [ -126.5553837, 54.194085 ], [ -126.5554164, 54.1940138 ], [ -126.5554827, 54.193944 ], [ -126.5555822, 54.193828599999982 ], [ -126.555664799999974, 54.1937133 ], [ -126.5557158, 54.193652 ], [ -126.5558464, 54.193484 ], [ -126.5559331, 54.1933501 ], [ -126.5559388, 54.1932248 ], [ -126.5558226, 54.1931137 ], [ -126.5557489, 54.1930952 ], [ -126.555593500000015, 54.1931009 ], [ -126.5554675, 54.1931607 ], [ -126.5553557, 54.193249 ], [ -126.555241900000013, 54.1933358 ], [ -126.5551002, 54.1934056 ], [ -126.554961299999988, 54.1934469 ], [ -126.554807200000013, 54.1934626 ], [ -126.554668799999988, 54.1934412 ], [ -126.5545533, 54.1933487 ], [ -126.5544835, 54.1932305 ], [ -126.5544401, 54.1931678 ], [ -126.5544289, 54.1931037 ], [ -126.554437, 54.1929513 ], [ -126.5544774, 54.1927904 ], [ -126.554547, 54.1926565 ], [ -126.554521799999989, 54.1925839 ], [ -126.5544467, 54.1925283 ], [ -126.5543424, 54.1924998 ], [ -126.554187699999986, 54.192497 ], [ -126.5540049, 54.1925112 ], [ -126.5538336, 54.192534 ], [ -126.553679, 54.1925582 ], [ -126.5534779, 54.1925896 ], [ -126.553383, 54.1926237 ], [ -126.5531656, 54.1927006 ], [ -126.553022, 54.192769 ], [ -126.552879599999983, 54.1928473 ], [ -126.5527519, 54.1929257 ], [ -126.55264, 54.193014 ], [ -126.5525751, 54.1930937 ], [ -126.5525229, 54.1934241 ], [ -126.552519, 54.1935238 ], [ -126.5525137, 54.1935865 ], [ -126.5525537, 54.1937133 ], [ -126.552686799999989, 54.1937973 ], [ -126.5528034, 54.1938799 ], [ -126.5528615, 54.1939354 ], [ -126.552889, 54.193981 ], [ -126.5529125, 54.1941063 ], [ -126.552892700000015, 54.1941961 ], [ -126.5528734, 54.1942502 ], [ -126.552855899999983, 54.1943129 ], [ -126.552758, 54.1943826 ], [ -126.5526033, 54.1944339 ], [ -126.5524942, 54.194439599999988 ], [ -126.552418100000011, 54.1944482 ], [ -126.552234599999977, 54.1944439 ], [ -126.5520347, 54.1944311 ], [ -126.551792, 54.1943812 ], [ -126.551718099999988, 54.1943428 ], [ -126.5515258, 54.1942402 ], [ -126.551409199999981, 54.1941306 ], [ -126.5513822, 54.1940764 ], [ -126.551353299999988, 54.1940209 ], [ -126.5513463, 54.1939041 ], [ -126.5513662, 54.1938144 ], [ -126.5513597, 54.1936891 ], [ -126.5513298, 54.1936435 ], [ -126.551274, 54.1935609 ], [ -126.5511562, 54.1934954 ], [ -126.5509287, 54.193437 ], [ -126.550792199999989, 54.193417 ], [ -126.550547199999983, 54.1933942 ], [ -126.550289299999989, 54.19338 ], [ -126.5501351, 54.1933757 ], [ -126.5500139, 54.1933743 ], [ -126.5497676, 54.193368600000014 ], [ -126.5495532, 54.1933828 ], [ -126.54943, 54.19338 ], [ -126.5493215, 54.1933771 ], [ -126.5490918, 54.1933729 ], [ -126.5488808, 54.1933501 ], [ -126.5486832, 54.1933102 ], [ -126.5485314, 54.1932718 ], [ -126.5482887, 54.1932219 ], [ -126.5480454, 54.1931806 ], [ -126.5478791, 54.1931692 ], [ -126.5477237, 54.1931749 ], [ -126.5476458, 54.1932091 ], [ -126.5475972, 54.1932703 ], [ -126.547591900000015, 54.1933601 ], [ -126.547632299999989, 54.1934241 ], [ -126.5477075, 54.193479700000012 ], [ -126.547813, 54.1935181 ], [ -126.547902, 54.1935552 ], [ -126.548007, 54.1936022 ], [ -126.54810950000001, 54.1936492 ], [ -126.5482151, 54.1936876 ], [ -126.5483212, 54.1937175 ], [ -126.5484115, 54.1937375 ], [ -126.548716399999989, 54.1937973 ], [ -126.5488189, 54.1938443 ], [ -126.548863499999982, 54.1938899 ], [ -126.5488582, 54.1939525 ], [ -126.548793800000013, 54.1940237 ], [ -126.548668400000011, 54.194075 ], [ -126.5485125, 54.1941163 ], [ -126.548387699999978, 54.194159 ], [ -126.5482792, 54.1941832 ], [ -126.5481404, 54.1941904 ], [ -126.5480014, 54.1942046 ], [ -126.5478314, 54.1942103 ], [ -126.547646199999988, 54.1942246 ], [ -126.5475395, 54.1942231 ], [ -126.5474481, 54.1942203 ], [ -126.547310299999978, 54.1942174 ], [ -126.5471439, 54.194179 ], [ -126.546948699999987, 54.194112 ], [ -126.546842499999983, 54.1940821 ], [ -126.5466918, 54.1940337 ], [ -126.5465417, 54.1939767 ], [ -126.5464405, 54.1939126 ], [ -126.546350100000012, 54.193865599999988 ], [ -126.5462774, 54.1938101 ], [ -126.5462023, 54.1937546 ], [ -126.5461173, 54.1936449 ], [ -126.5460598, 54.1935808 ], [ -126.5459579, 54.1934982 ], [ -126.5458394, 54.1934142 ], [ -126.5457245, 54.1933131 ], [ -126.5456079, 54.1932034 ], [ -126.5455059, 54.1931208 ], [ -126.545391, 54.1929926 ], [ -126.545349299999984, 54.1929186 ], [ -126.545307, 54.1928459 ], [ -126.5452232, 54.1926921 ], [ -126.5451405, 54.1925554 ], [ -126.5449798, 54.1923987 ], [ -126.544437, 54.1920099 ], [ -126.54426, 54.1918988 ], [ -126.5441568, 54.191833300000013 ], [ -126.5441269, 54.1918148 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17094223, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 258083.057567098, "blue_line_key": 360873822, "length_metre": 164.34152967555301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1297174, 54.3852894 ], [ -126.1274893, 54.3845858 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100134, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 22164.165001339301, "blue_line_key": 360880905, "length_metre": 168.866952701852, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3851234, 54.2756039 ], [ -126.385339, 54.2756082 ], [ -126.3855362, 54.2756295 ], [ -126.385747599999988, 54.2756794 ], [ -126.3858804, 54.275799 ], [ -126.3860207, 54.2759998 ], [ -126.3861592, 54.2762191 ], [ -126.386334100000013, 54.276384299999989 ], [ -126.386490299999977, 54.2765681 ], [ -126.3866529, 54.2766792 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104186, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 3949.0016332442001, "blue_line_key": 360882583, "length_metre": 156.962041002219, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.004080500000015, 54.2166217 ], [ -126.0039722, 54.2166644 ], [ -126.003912500000013, 54.216852400000015 ], [ -126.003909100000016, 54.216888 ], [ -126.0039928, 54.216997700000015 ], [ -126.0039748, 54.2170333 ], [ -126.0039865, 54.2170874 ], [ -126.0039828, 54.2171501 ], [ -126.0039947, 54.2171771 ], [ -126.003985699999987, 54.2172939 ], [ -126.003970799999976, 54.217321 ], [ -126.0039051, 54.2173736 ], [ -126.003857899999986, 54.2173893 ], [ -126.0037498, 54.217405 ], [ -126.0035332, 54.2174178 ], [ -126.0034377, 54.217452 ], [ -126.0033245, 54.2175474 ], [ -126.003189400000011, 54.2177155 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17104534, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 21378.329287229499, "blue_line_key": 360877225, "length_metre": 327.23222513036001, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.255755099999988, 54.214125 ], [ -126.255877, 54.214145 ], [ -126.2559685, 54.2141478 ], [ -126.2560631, 54.2141222 ], [ -126.256142599999976, 54.2140709 ], [ -126.2562423, 54.2139641 ], [ -126.256311599999989, 54.2138402 ], [ -126.2567082, 54.2136337 ], [ -126.2569757, 54.213514 ], [ -126.2571992, 54.2134015 ], [ -126.2573085, 54.2133688 ], [ -126.257431699999984, 54.2133716 ], [ -126.2577061, 54.2133873 ], [ -126.2578294, 54.2133631 ], [ -126.258018, 54.2133132 ], [ -126.2583476, 54.2132036 ], [ -126.2584912, 54.2131167 ], [ -126.2586838, 54.2129686 ], [ -126.25890480000001, 54.2128831 ], [ -126.2589703, 54.2128304 ], [ -126.259021800000014, 54.2127421 ], [ -126.259036, 54.2125356 ], [ -126.2591351, 54.2124302 ], [ -126.2592584, 54.212406 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17095433, "stream_order": 4, "gnis_name": "Dungate Creek", "downstream_route_measure": 3447.1423420081401, "blue_line_key": 360760898, "length_metre": 668.69537205017195, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5786419, 54.3608713 ], [ -126.578488100000015, 54.3608499 ], [ -126.5783525, 54.3608115 ], [ -126.5782332, 54.3607545 ], [ -126.578043, 54.3605722 ], [ -126.577776899999975, 54.3604042 ], [ -126.5777182, 54.3603486 ], [ -126.577660599999987, 54.360276 ], [ -126.5775492, 54.3600851 ], [ -126.5774905, 54.3600296 ], [ -126.5772717, 54.3598103 ], [ -126.577264899999989, 54.3596835 ], [ -126.5772576, 54.3595582 ], [ -126.577259500000011, 54.359504 ], [ -126.577311400000013, 54.3594328 ], [ -126.577391, 54.3593801 ], [ -126.5775331, 54.3593303 ], [ -126.5777965, 54.3592904 ], [ -126.5779062, 54.3592562 ], [ -126.5780054, 54.3591409 ], [ -126.5780078, 54.3590782 ], [ -126.5779975, 54.3590241 ], [ -126.577938800000013, 54.358968499999989 ], [ -126.577829900000012, 54.3589586 ], [ -126.5775212, 54.3589885 ], [ -126.577184, 54.3589814 ], [ -126.577017399999988, 54.3589059 ], [ -126.576926599999979, 54.3588859 ], [ -126.5768516, 54.3588489 ], [ -126.576523900000012, 54.3586894 ], [ -126.576340500000015, 54.358641 ], [ -126.576033699999982, 54.3586168 ], [ -126.5759125, 54.3586139 ], [ -126.575603, 54.3586253 ], [ -126.575232399999976, 54.3586367 ], [ -126.5750941, 54.3586339 ], [ -126.574803800000012, 54.3586182 ], [ -126.5746965, 54.3585897 ], [ -126.574533, 54.3585057 ], [ -126.5743851, 54.3584117 ], [ -126.574340600000014, 54.3583576 ], [ -126.5741531, 54.3581468 ], [ -126.573991099999986, 54.3580442 ], [ -126.5738146, 54.357879 ], [ -126.5736263, 54.3577053 ], [ -126.5733554, 54.3575999 ], [ -126.57327979999998, 54.3575714 ], [ -126.5730565, 54.3574418 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17077762, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 10.870968063656299, "blue_line_key": 360237077, "length_metre": 14.820722363877699, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.324053600000013, 54.5065864 ], [ -126.3240377, 54.5066035 ], [ -126.3240208, 54.5066306 ], [ -126.3240202, 54.5066391 ], [ -126.3240025, 54.5066477 ], [ -126.324002799999988, 54.5066747 ], [ -126.324000599999977, 54.5067018 ], [ -126.324, 54.5067103 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17077786, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 0.0, "blue_line_key": 360237077, "length_metre": 10.870968063656299, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3240872, 54.506491 ], [ -126.324053600000013, 54.5065864 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092247, "stream_order": 4, "gnis_name": "McKilligan Creek", "downstream_route_measure": 3034.0779780521202, "blue_line_key": 360770255, "length_metre": 1801.1981983221301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5598507, 54.4217676 ], [ -126.559871199999989, 54.4216879 ], [ -126.559929299999979, 54.4214728 ], [ -126.5599822, 54.4213845 ], [ -126.5600992, 54.421225 ], [ -126.560229, 54.4211196 ], [ -126.5604343, 54.4210157 ], [ -126.5607377, 54.420869 ], [ -126.5608508, 54.4207906 ], [ -126.5610929, 54.4205884 ], [ -126.561348900000013, 54.4204232 ], [ -126.5616048, 54.4202936 ], [ -126.5619701, 54.4201027 ], [ -126.5622062, 54.4200087 ], [ -126.56252, 54.4199162 ], [ -126.5628024, 54.4198507 ], [ -126.5629427, 54.4197994 ], [ -126.563199599999976, 54.4196598 ], [ -126.56335940000001, 54.4195459 ], [ -126.5635055, 54.4194148 ], [ -126.5637025, 54.4192297 ], [ -126.5638607, 54.4191343 ], [ -126.5641046, 54.4189406 ], [ -126.5644387, 54.4187412 ], [ -126.5645673, 54.4186814 ], [ -126.5649463, 54.4185005 ], [ -126.5652352, 54.4183253 ], [ -126.5653159, 54.4182555 ], [ -126.565515499999975, 54.4180348 ], [ -126.565662199999977, 54.4179023 ], [ -126.5658425, 54.4177086 ], [ -126.5660509, 54.4175605 ], [ -126.5661482, 54.417499299999989 ], [ -126.566416099999984, 54.4174053 ], [ -126.566711, 54.4173668 ], [ -126.5669725, 54.417354 ], [ -126.5673441, 54.417334100000012 ], [ -126.567608299999989, 54.4172856 ], [ -126.5679534, 54.4171945 ], [ -126.5682825, 54.4170934 ], [ -126.5686607, 54.4169567 ], [ -126.568927, 54.4168812 ], [ -126.56926030000001, 54.4167259 ], [ -126.569341, 54.4166561 ], [ -126.5695394, 54.4164525 ], [ -126.569674299999988, 54.4162488 ], [ -126.5698859, 54.4160637 ], [ -126.570064099999982, 54.415897 ], [ -126.5701829, 54.4157461 ], [ -126.570202599999988, 54.4156478 ], [ -126.5701772, 54.4155666 ], [ -126.5701209, 54.4154755 ], [ -126.569988400000014, 54.4153644 ], [ -126.569859099999988, 54.4152092 ], [ -126.569749300000012, 54.4149912 ], [ -126.5697391, 54.4149015 ], [ -126.569718099999989, 54.4147306 ], [ -126.569617600000015, 54.4145839 ], [ -126.569623, 54.4145127 ], [ -126.5696343, 54.4143333 ], [ -126.569628, 54.4141624 ], [ -126.5696367, 54.4140185 ], [ -126.5696112, 54.4139373 ], [ -126.569479300000012, 54.4138177 ], [ -126.5694042, 54.4137807 ], [ -126.569206799999989, 54.4137223 ], [ -126.568857799999975, 54.4136425 ], [ -126.5686144, 54.4135756 ], [ -126.568388899999988, 54.4134716 ], [ -126.568105899999978, 54.4133221 ], [ -126.567988700000015, 54.4132024 ], [ -126.5679784, 54.4131127 ], [ -126.567944900000015, 54.4129148 ], [ -126.567885499999988, 54.4128678 ], [ -126.567599300000012, 54.4127552 ], [ -126.567268799999979, 54.4126228 ], [ -126.567209299999988, 54.4125758 ], [ -126.5669448, 54.4123735 ], [ -126.5667388, 54.4122069 ], [ -126.566637700000015, 54.4120973 ], [ -126.5665237, 54.4119335 ], [ -126.566344199999975, 54.4118309 ], [ -126.5660412, 54.4117526 ], [ -126.5659347, 54.4117141 ], [ -126.565619199999986, 54.4116087 ], [ -126.5654354, 54.4115603 ], [ -126.5653122, 54.4115489 ], [ -126.5650363, 54.4115261 ], [ -126.564916200000013, 54.4114777 ], [ -126.564769, 54.4113666 ], [ -126.56467, 54.4112299 ], [ -126.5644002, 54.4110989 ], [ -126.5641958, 54.4109066 ], [ -126.5640511, 54.4107329 ], [ -126.56391, 54.4105135 ], [ -126.5638825, 54.4104594 ], [ -126.5637727, 54.4102415 ], [ -126.563728499999982, 54.410186 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092349, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 12376.4524176084, "blue_line_key": 360862508, "length_metre": 434.72258989137703, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.407230399999975, 54.4097587 ], [ -126.406883, 54.4096305 ], [ -126.4053041, 54.4095109 ], [ -126.400699099999983, 54.4100834 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17094384, "stream_order": 5, "gnis_name": "Bulkley River", "downstream_route_measure": 260202.274187381, "blue_line_key": 360873822, "length_metre": 331.67455335313798, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.099561099999988, 54.3810837 ], [ -126.094459399999977, 54.3813255 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17098735, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 27261.368616308999, "blue_line_key": 360880905, "length_metre": 929.77007262761003, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4254472, 54.2990549 ], [ -126.4254295, 54.2990635 ], [ -126.425365, 54.2991076 ], [ -126.4252852, 54.2991603 ], [ -126.4252059, 54.2992116 ], [ -126.4251859, 54.2992742 ], [ -126.425197200000014, 54.2993383 ], [ -126.425179199999988, 54.2994095 ], [ -126.4250822, 54.2994694 ], [ -126.42498759999998, 54.299495 ], [ -126.4248949, 54.2995292 ], [ -126.4248438, 54.2995904 ], [ -126.4248685, 54.2996716 ], [ -126.4248193, 54.2997343 ], [ -126.424754100000015, 54.2997869 ], [ -126.424780599999977, 54.2998496 ], [ -126.424732, 54.2999037 ], [ -126.424652099999989, 54.2999636 ], [ -126.4246345, 54.2999992 ], [ -126.424582899999976, 54.3000618 ], [ -126.424653, 54.30018 ], [ -126.424595700000012, 54.300368 ], [ -126.42464889999998, 54.3005133 ], [ -126.4248095, 54.3006514 ], [ -126.4250681, 54.3006928 ], [ -126.425182799999988, 54.3008024 ], [ -126.4253694, 54.3010047 ], [ -126.4254594, 54.3010602 ], [ -126.4255877, 54.3012069 ], [ -126.425642599999975, 54.3013336 ], [ -126.425578, 54.3013778 ], [ -126.4255446, 54.3014305 ], [ -126.425657499999986, 54.3015587 ], [ -126.425574900000015, 54.301674 ], [ -126.4255244, 54.3017267 ], [ -126.425192, 54.3018991 ], [ -126.4250606, 54.3020144 ], [ -126.4250226, 54.3021483 ], [ -126.425059800000014, 54.3022836 ], [ -126.4250506, 54.3024189 ], [ -126.4251947, 54.3025827 ], [ -126.425331899999989, 54.3026226 ], [ -126.4254534, 54.302624 ], [ -126.425558200000012, 54.3026724 ], [ -126.42577390000001, 54.3026767 ], [ -126.4259091, 54.3027151 ], [ -126.426115, 54.3028632 ], [ -126.4263296, 54.3028775 ], [ -126.4264341, 54.302906 ], [ -126.426510099999987, 54.302953 ], [ -126.4265608, 54.3030982 ], [ -126.4265721, 54.3031694 ], [ -126.4266213, 54.3033874 ], [ -126.4266103, 54.3035483 ], [ -126.4266351, 54.3036295 ], [ -126.4267358, 54.3037577 ], [ -126.4268411, 54.3038046 ], [ -126.426862, 54.3039585 ], [ -126.427080800000013, 54.3041251 ], [ -126.4274155, 54.3042134 ], [ -126.4274426, 54.3042675 ], [ -126.427385199999989, 54.3044284 ], [ -126.4271836, 54.3044598 ], [ -126.4271179, 54.304521 ], [ -126.427186400000011, 54.3046848 ], [ -126.427407, 54.3048329 ], [ -126.427433, 54.304897 ], [ -126.427425500000012, 54.3050138 ], [ -126.4274615, 54.3051662 ], [ -126.427547, 54.3053029 ], [ -126.4275418, 54.3053656 ], [ -126.4275232, 54.3054382 ], [ -126.42745, 54.3056162 ], [ -126.427399499999979, 54.3056689 ], [ -126.4272891, 54.3057117 ], [ -126.427165699999989, 54.3057359 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17104876, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 0.0, "blue_line_key": 360747189, "length_metre": 179.96456436429401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.9751963, 54.2075067 ], [ -125.975224399999988, 54.2074968 ], [ -125.97527070000001, 54.2074768 ], [ -125.975315799999976, 54.2074668 ], [ -125.975359199999986, 54.2074483 ], [ -125.975406, 54.2074469 ], [ -125.9755412, 54.207417 ], [ -125.975676799999988, 54.20736 ], [ -125.97572, 54.2073486 ], [ -125.975813, 54.2073472 ], [ -125.975858100000011, 54.2073373 ], [ -125.975919499999989, 54.207335799999989 ], [ -125.975964600000012, 54.2073259 ], [ -125.976267900000011, 54.2072632 ], [ -125.9764791, 54.2072319 ], [ -125.976797, 54.2071692 ], [ -125.9771275, 54.2070723 ], [ -125.977217200000013, 54.2070339 ], [ -125.977262299999978, 54.2070239 ], [ -125.9773503, 54.2069769 ], [ -125.977411300000014, 54.206957 ], [ -125.977498900000015, 54.2068915 ], [ -125.9775113, 54.2068644 ], [ -125.9775542, 54.2068274 ], [ -125.9775838, 54.2068003 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17093821, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 173254.96929843299, "blue_line_key": 360873822, "length_metre": 124.762364636105, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.68002, 54.3906615 ], [ -126.6795578, 54.3905205 ], [ -126.6791708, 54.3905362 ], [ -126.678839700000012, 54.3906301 ], [ -126.678332900000015, 54.3908637 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17086823, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 194535.45705045, "blue_line_key": 360873822, "length_metre": 825.08897826563498, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.52155, 54.457662 ], [ -126.5211566, 54.4578201 ], [ -126.5209281, 54.4580323 ], [ -126.5209693, 54.4581946 ], [ -126.521344899999988, 54.4586974 ], [ -126.5213043, 54.4589395 ], [ -126.5211801, 54.4590705 ], [ -126.5208737, 54.4591902 ], [ -126.5203145, 54.4592899 ], [ -126.5196819, 54.4592842 ], [ -126.519075699999988, 54.4592172 ], [ -126.5188065, 54.4592514 ], [ -126.5183178, 54.4594508 ], [ -126.5180643, 54.4596502 ], [ -126.5179918, 54.4598296 ], [ -126.5180393, 54.460002 ], [ -126.5181549, 54.4600988 ], [ -126.5189394, 54.4603779 ], [ -126.519592, 54.4606699 ], [ -126.5204509, 54.4608907 ], [ -126.5209051, 54.4611755 ], [ -126.5210401, 54.461392 ], [ -126.5210248, 54.46196170000001 ], [ -126.5211275, 54.4624673 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17087896, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 237156.82003362101, "blue_line_key": 360873822, "length_metre": 58.159716969650297, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.22253, 54.4504412 ], [ -126.2221422, 54.4504227 ], [ -126.2221861, 54.450286 ], [ -126.2223631, 54.4501678 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091030, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 2543.3989973016401, "blue_line_key": 360841027, "length_metre": 302.49884603205402, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0605742, 54.423716 ], [ -126.0605423, 54.4237501 ], [ -126.060338699999988, 54.424015 ], [ -126.060324, 54.4242045 ], [ -126.060373599999977, 54.4243853 ], [ -126.060536700000014, 54.4246858 ], [ -126.0605899, 54.4250191 ], [ -126.06058440000001, 54.4253253 ], [ -126.060461100000012, 54.4255105 ], [ -126.0602815, 54.4256685 ], [ -126.060022799999984, 54.4258152 ], [ -126.059768299999988, 54.4259434 ], [ -126.0595734, 54.426083 ], [ -126.0595065, 54.4261528 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17093736, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 171076.665561926, "blue_line_key": 360873822, "length_metre": 653.42120765683501, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.7021542, 54.3912881 ], [ -126.7015964, 54.3911827 ], [ -126.700795500000012, 54.3911998 ], [ -126.70028880000001, 54.3913066 ], [ -126.699651599999981, 54.39162 ], [ -126.699060499999987, 54.3920686 ], [ -126.6987609, 54.3926283 ], [ -126.6981996, 54.393336100000013 ], [ -126.6974483, 54.3938375 ], [ -126.69674280000001, 54.3939528 ], [ -126.695362, 54.3937378 ], [ -126.69467779999998, 54.3936794 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099674, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 24095.9039243853, "blue_line_key": 360880905, "length_metre": 33.366773841126999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.397100200000011, 54.2844838 ], [ -126.397178899999986, 54.284441099999988 ], [ -126.3971137, 54.2842688 ], [ -126.397207799999975, 54.2842446 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17076038, "stream_order": 4, "gnis_name": "Johnny David Creek", "downstream_route_measure": 15.3063604257749, "blue_line_key": 360866287, "length_metre": 690.46675740077296, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.372012500000011, 54.514948 ], [ -126.3720532, 54.5150206 ], [ -126.3720612, 54.5151374 ], [ -126.3720559, 54.5152086 ], [ -126.3720457, 54.515398 ], [ -126.372033, 54.5155945 ], [ -126.3720424, 54.5156586 ], [ -126.372137, 54.5158851 ], [ -126.3721174, 54.5159478 ], [ -126.3719826, 54.5161429 ], [ -126.3718861, 54.5161941 ], [ -126.3717928, 54.5162013 ], [ -126.371684, 54.5161899 ], [ -126.3714577, 54.5161215 ], [ -126.3713347, 54.5161016 ], [ -126.37119580000001, 54.5160987 ], [ -126.371072, 54.5161229 ], [ -126.3709902, 54.5161742 ], [ -126.3709251, 54.5162269 ], [ -126.37087219999998, 54.5163423 ], [ -126.370770400000012, 54.5164576 ], [ -126.3707001, 54.5166086 ], [ -126.370628, 54.516751 ], [ -126.370477900000012, 54.5169547 ], [ -126.370451899999978, 54.5170985 ], [ -126.3704181, 54.5171598 ], [ -126.370265, 54.517372 ], [ -126.3701835, 54.5174432 ], [ -126.370087, 54.5174944 ], [ -126.3697669, 54.5176582 ], [ -126.36943740000001, 54.5177508 ], [ -126.369275199999976, 54.5178633 ], [ -126.369074900000015, 54.5180841 ], [ -126.3690173, 54.5182621 ], [ -126.36902640000001, 54.5183618 ], [ -126.3690328, 54.5184971 ], [ -126.3691617, 54.5186609 ], [ -126.3691805, 54.5188588 ], [ -126.3691821, 54.5190568 ], [ -126.369184, 54.5192818 ], [ -126.3690944, 54.5194599 ], [ -126.3690748, 54.5195225 ], [ -126.369041599999989, 54.5195752 ], [ -126.368904299999983, 54.5197703 ], [ -126.368660600000013, 54.5199541 ], [ -126.3685818, 54.5199968 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17086006, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 5375.3341005399498, "blue_line_key": 360846413, "length_metre": 986.29931403155399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3220949, 54.4708772 ], [ -126.322053900000014, 54.4708131 ], [ -126.3219633, 54.4707576 ], [ -126.321635, 54.4705981 ], [ -126.3215171, 54.4705226 ], [ -126.3213208, 54.4704471 ], [ -126.3211711, 54.4703716 ], [ -126.320826200000013, 54.4702107 ], [ -126.3205544, 54.4701338 ], [ -126.3203131, 54.4700469 ], [ -126.320084900000012, 54.4699785 ], [ -126.3197987, 54.4698732 ], [ -126.3195763, 54.4697606 ], [ -126.319427800000014, 54.4696681 ], [ -126.31934050000001, 54.4695755 ], [ -126.319195600000015, 54.4694103 ], [ -126.3189941, 54.469218 ], [ -126.3188031, 54.4690514 ], [ -126.3185379, 54.4688662 ], [ -126.3183344, 54.4686725 ], [ -126.3182336, 54.4685629 ], [ -126.3181087, 54.4683621 ], [ -126.3181174, 54.4682268 ], [ -126.3181205, 54.4681556 ], [ -126.3181298, 54.4680117 ], [ -126.318119599999989, 54.467957600000013 ], [ -126.3181744, 54.4678237 ], [ -126.3181766, 54.4677967 ], [ -126.3181758, 54.4677781 ], [ -126.318178599999982, 54.4677425 ], [ -126.3181662, 54.4677155 ], [ -126.3181577, 54.4675802 ], [ -126.3181486, 54.467509 ], [ -126.318110199999978, 54.4673822 ], [ -126.3180992, 54.467309600000014 ], [ -126.318059299999987, 54.4672284 ], [ -126.3179155, 54.4670532 ], [ -126.317726, 54.4668966 ], [ -126.317552099999986, 54.4666957 ], [ -126.3172726, 54.4665092 ], [ -126.3171354, 54.466460700000013 ], [ -126.3168204, 54.4663468 ], [ -126.3165041, 54.4662229 ], [ -126.316273900000013, 54.4662087 ], [ -126.3159039, 54.4662087 ], [ -126.315737299999981, 54.4661602 ], [ -126.315661600000013, 54.4661318 ], [ -126.3155727, 54.4660577 ], [ -126.3154867, 54.4659751 ], [ -126.3154893, 54.4659124 ], [ -126.3155619, 54.46577 ], [ -126.315564499999979, 54.4657073 ], [ -126.315524, 54.4656347 ], [ -126.3154139, 54.4654339 ], [ -126.3154232, 54.46529 ], [ -126.3154345, 54.4650921 ], [ -126.3154418, 54.4650024 ], [ -126.3154227, 54.46481439999998 ], [ -126.3154184, 54.4646606 ], [ -126.315400899999986, 54.464454 ], [ -126.315357400000011, 54.4643899 ], [ -126.315284, 54.4643344 ], [ -126.3150205, 54.4641307 ], [ -126.314876499999983, 54.4639841 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092111, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 13186.302965512201, "blue_line_key": 360862508, "length_metre": 199.59809831450099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.396126399999986, 54.4121471 ], [ -126.3939421, 54.413409 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17090650, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 275289.94664823299, "blue_line_key": 360873822, "length_metre": 157.07097703683701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1415462, 54.4270643 ], [ -126.14259, 54.4283347 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17093002, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 174719.55273246299, "blue_line_key": 360873822, "length_metre": 820.13190961823705, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.670011, 54.4003532 ], [ -126.6695834, 54.4005768 ], [ -126.668501100000015, 54.4010226 ], [ -126.6677825, 54.4012177 ], [ -126.667288199999987, 54.401232 ], [ -126.666199400000011, 54.401133699999988 ], [ -126.664985, 54.4011081 ], [ -126.6643751, 54.4011451 ], [ -126.6635741, 54.4012676 ], [ -126.662648499999989, 54.401551 ], [ -126.6622122, 54.4017361 ], [ -126.659788299999974, 54.4030421 ], [ -126.659128, 54.4033227 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17097611, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 12863.4191735598, "blue_line_key": 360886221, "length_metre": 139.557171083192, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.625898699999979, 54.3190002 ], [ -126.6261358, 54.3188699 ], [ -126.6264358, 54.3187318 ], [ -126.6267676, 54.318586499999988 ], [ -126.6269257, 54.3184911 ], [ -126.627020699999989, 54.3184569 ], [ -126.6273766, 54.3184099 ], [ -126.627486300000015, 54.3183757 ], [ -126.6276446, 54.3183074 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17077792, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 219625.08257539399, "blue_line_key": 360873822, "length_metre": 109.94997245045499, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3322542, 54.5064184 ], [ -126.3312988, 54.5065052 ], [ -126.3305639, 54.5065024 ] ] } }, @@ -186,9 +405,14 @@ { "type": "Feature", "properties": { "linear_feature_id": 17077016, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 216610.13895254399, "blue_line_key": 360873822, "length_metre": 123.251375148189, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.355852899999988, 54.5102253 ], [ -126.355168, 54.5105471 ], [ -126.3541485, 54.5104816 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17075597, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 211200.74295618699, "blue_line_key": 360873822, "length_metre": 98.275552772195198, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4051928, 54.5177266 ], [ -126.404823, 54.5179274 ], [ -126.404592, 54.5182365 ], [ -126.404318, 54.5184301 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080852, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 202903.60564710101, "blue_line_key": 360873822, "length_metre": 152.833166868533, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.486077599999987, 54.4903034 ], [ -126.486153, 54.4905997 ], [ -126.485992, 54.4911167 ], [ -126.4859005, 54.4912805 ], [ -126.4855531, 54.4915938 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100798, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 594.68684578779096, "blue_line_key": 360874778, "length_metre": 188.75498410472599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3600825, 54.2657697 ], [ -126.359878599999988, 54.2658281 ], [ -126.359620600000014, 54.2660303 ], [ -126.359512, 54.2660546 ], [ -126.3593893, 54.2660432 ], [ -126.359162, 54.2659833 ], [ -126.3590552, 54.2659819 ], [ -126.3589112, 54.2660773 ], [ -126.358802499999982, 54.2660745 ], [ -126.3585924, 54.266007599999988 ], [ -126.3584861, 54.2660047 ], [ -126.3584501, 54.2660574 ], [ -126.3582482, 54.2660902 ], [ -126.358018499999986, 54.2660845 ], [ -126.3579404, 54.2661186 ], [ -126.3578324, 54.266134300000012 ], [ -126.3577243, 54.2661229 ], [ -126.357636299999982, 54.2660759 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17097397, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 15295.0329833375, "blue_line_key": 360886524, "length_metre": 318.861724049516, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.262867599999979, 54.3247021 ], [ -126.2628278, 54.3246294 ], [ -126.2626774, 54.3245725 ], [ -126.2625104, 54.3245411 ], [ -126.2624052, 54.3244941 ], [ -126.262065, 54.3242791 ], [ -126.2618864, 54.3241851 ], [ -126.2615597, 54.3240071 ], [ -126.2613927, 54.3239757 ], [ -126.2611494, 54.3239529 ], [ -126.2610759, 54.3239059 ], [ -126.2610984, 54.3237892 ], [ -126.261228, 54.3236937 ], [ -126.2612542, 54.3235328 ], [ -126.261246700000015, 54.3234246 ], [ -126.2610993, 54.3233049 ], [ -126.2610106, 54.3232665 ], [ -126.2609017, 54.3232636 ], [ -126.2607013, 54.3232779 ], [ -126.2605166, 54.3232821 ], [ -126.2602243, 54.3232935 ], [ -126.260165500000014, 54.3232465 ], [ -126.260094, 54.3231739 ], [ -126.260043700000011, 54.3230016 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17085104, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 197970.196547106, "blue_line_key": 360873822, "length_metre": 388.69607322670601, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5102531, 54.4696239 ], [ -126.5099558, 54.4696681 ], [ -126.5094327, 54.46951 ], [ -126.509101499999986, 54.4694829 ], [ -126.508866399999974, 54.4696367 ], [ -126.5085506, 54.4701124 ], [ -126.5081587, 54.4704414 ], [ -126.5077986, 54.4705952 ], [ -126.5075832, 54.4706294 ], [ -126.5071023, 54.4706451 ], [ -126.5063389, 54.4705995 ], [ -126.5054897, 54.4703716 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17068287, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 12207.371103828, "blue_line_key": 360875378, "length_metre": 311.97121086046599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5863732, 54.5555564 ], [ -126.586545199999989, 54.5555066 ], [ -126.5868305, 54.5554126 ], [ -126.5871744, 54.5553485 ], [ -126.5874539, 54.5553357 ], [ -126.5877486, 54.5553143 ], [ -126.5879347, 54.5553086 ], [ -126.5881985, 54.5553058 ], [ -126.588430300000013, 54.5552744 ], [ -126.5886072, 54.5551961 ], [ -126.588893, 54.555058 ], [ -126.589210400000013, 54.5549212 ], [ -126.5893837, 54.5548529 ], [ -126.5896372, 54.5547589 ], [ -126.5897816, 54.5546891 ], [ -126.5901466, 54.5544997 ], [ -126.590464399999988, 54.5543615 ], [ -126.5905724, 54.5543544 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091087, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 273777.40546434303, "blue_line_key": 360873822, "length_metre": 118.030794463172, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.120369599999989, 54.4234718 ], [ -126.1221204, 54.4231762 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17103081, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 9518.5768965105108, "blue_line_key": 360880905, "length_metre": 107.594752021133, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.45424, 54.2312227 ], [ -126.4542834, 54.2312511 ], [ -126.454433599999987, 54.2313352 ], [ -126.4545673, 54.2313836 ], [ -126.4547205, 54.231405 ], [ -126.4548718, 54.2314249 ], [ -126.4550249, 54.2314463 ], [ -126.4551152, 54.2314662 ], [ -126.4552667, 54.2315061 ], [ -126.455341699999977, 54.2315346 ], [ -126.4554749, 54.2315915 ], [ -126.4555634, 54.2316642 ], [ -126.4555909, 54.2317097 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17055555, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 24380.1978639761, "blue_line_key": 360856488, "length_metre": 118.13411405854799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5443401, 54.6234704 ], [ -126.5460266, 54.6230547 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17054657, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 23457.141994511599, "blue_line_key": 360856488, "length_metre": 294.295531982287, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5440276, 54.631135 ], [ -126.5440013, 54.6310182 ], [ -126.5439504, 54.6308729 ], [ -126.543906, 54.6308088 ], [ -126.543794, 54.6306265 ], [ -126.5437849, 54.6305097 ], [ -126.543837400000015, 54.6304214 ], [ -126.5439023, 54.6303687 ], [ -126.543998699999989, 54.630324599999987 ], [ -126.5443945, 54.6301537 ], [ -126.5444775, 54.6300839 ], [ -126.5444814, 54.6300298 ], [ -126.544425100000012, 54.6299287 ], [ -126.544364500000015, 54.6298831 ], [ -126.544153699999981, 54.6297805 ], [ -126.5437765, 54.6296111 ], [ -126.5435672, 54.62949 ], [ -126.543563, 54.6293091 ], [ -126.5435978, 54.6292294 ], [ -126.54375, 54.6290442 ], [ -126.543772, 54.62894450000001 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17072914, "stream_order": 5, "gnis_name": "Richfield Creek", "downstream_route_measure": 4188.1385842535601, "blue_line_key": 360788426, "length_metre": 1.59332480059366, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3220924, 54.5326733 ], [ -126.3220828, 54.5326865 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17069471, "stream_order": 5, "gnis_name": "Richfield Creek", "downstream_route_measure": 7641.9429360887198, "blue_line_key": 360788426, "length_metre": 1383.6021650749201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.303104199999979, 54.5501729 ], [ -126.3032539, 54.550257 ], [ -126.3035686, 54.5504165 ], [ -126.3038111, 54.5504948 ], [ -126.3039001, 54.5505418 ], [ -126.304003099999974, 54.550633 ], [ -126.3040687, 54.5507882 ], [ -126.3040663, 54.5508509 ], [ -126.3040354, 54.5510574 ], [ -126.303951, 54.5511713 ], [ -126.3037218, 54.551355 ], [ -126.3034328, 54.5515202 ], [ -126.3031487, 54.5516299 ], [ -126.302895599999985, 54.5517139 ], [ -126.302769200000014, 54.5517381 ], [ -126.3025036, 54.5517951 ], [ -126.302298799999988, 54.5518535 ], [ -126.3019205, 54.5519446 ], [ -126.301823899999988, 54.5519959 ], [ -126.3016781, 54.5521099 ], [ -126.3016271, 54.5521711 ], [ -126.3016228, 54.5522252 ], [ -126.3016453, 54.5523705 ], [ -126.3016855, 54.5524517 ], [ -126.3018317, 54.5526083 ], [ -126.3019566, 54.5527906 ], [ -126.3021588, 54.5530114 ], [ -126.302507600000013, 54.5531438 ], [ -126.302674199999984, 54.5531937 ], [ -126.302888, 54.5532421 ], [ -126.303161100000011, 54.5533033 ], [ -126.3032821, 54.5533503 ], [ -126.3036472, 54.5534572 ], [ -126.3037207, 54.5534856 ], [ -126.3038379, 54.5535782 ], [ -126.3039691, 54.5537078 ], [ -126.30399460000001, 54.553789 ], [ -126.304014900000013, 54.5539684 ], [ -126.303988800000013, 54.5541123 ], [ -126.3040164, 54.5541664 ], [ -126.304101499999973, 54.5542946 ], [ -126.3042637, 54.5544057 ], [ -126.3043539, 54.5544356 ], [ -126.3044639, 54.554437 ], [ -126.304803299999989, 54.5544356 ], [ -126.305024499999988, 54.5543516 ], [ -126.305257900000015, 54.5543302 ], [ -126.3054141, 54.554333 ], [ -126.3055348, 54.554353 ], [ -126.3056553, 54.5544014 ], [ -126.3056887, 54.5545994 ], [ -126.3056978, 54.5546991 ], [ -126.305684099999979, 54.5549056 ], [ -126.30561320000001, 54.5550651 ], [ -126.305547, 54.5551278 ], [ -126.3054503, 54.555179 ], [ -126.3053234, 54.5552118 ], [ -126.305215300000015, 54.5552189 ], [ -126.3048737, 54.5552474 ], [ -126.304747299999988, 54.5552716 ], [ -126.3046984, 54.5553058 ], [ -126.3046319, 54.555404 ], [ -126.3045466, 54.555528 ], [ -126.30454060000001, 54.5556077 ], [ -126.3046345, 54.5558085 ], [ -126.3047211, 54.5559182 ], [ -126.3047944, 54.5559823 ], [ -126.3050055, 54.5560592 ], [ -126.3050798, 54.5561062 ], [ -126.3051515, 54.5561888 ], [ -126.3053392, 54.5563811 ], [ -126.3054232, 54.5565263 ], [ -126.3055187, 54.5567086 ], [ -126.3055428, 54.5568354 ], [ -126.3055151, 54.5570049 ], [ -126.3054786, 54.5570946 ], [ -126.30539060000001, 54.5572541 ], [ -126.3053047, 54.5573866 ], [ -126.3051673, 54.5575817 ], [ -126.3051308, 54.5576714 ], [ -126.3050714, 54.5578679 ], [ -126.305140399999985, 54.5579861 ], [ -126.305242299999989, 54.5580873 ], [ -126.30545, 54.5582439 ], [ -126.3055179, 54.5583721 ], [ -126.3056464, 54.5585373 ], [ -126.3056974, 54.5586997 ], [ -126.3057011, 54.5588706 ], [ -126.3057057, 54.55906 ], [ -126.30568550000001, 54.5591312 ], [ -126.3056101, 54.5593178 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17087752, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 235469.20011678099, "blue_line_key": 360873822, "length_metre": 377.61869286626597, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.235736399999979, 54.4525063 ], [ -126.2356482, 54.4524237 ], [ -126.235606100000012, 54.4523497 ], [ -126.2355681, 54.45225 ], [ -126.2355545, 54.4522058 ], [ -126.2355261, 54.4521688 ], [ -126.235471099999984, 54.4520962 ], [ -126.2353869, 54.4519409 ], [ -126.2352858, 54.4518398 ], [ -126.2351978, 54.4517843 ], [ -126.2349648, 54.4518056 ], [ -126.2345721, 54.4519039 ], [ -126.2344642, 54.451911 ], [ -126.234109, 54.451911 ], [ -126.233988, 54.4518726 ], [ -126.2339124, 54.4518441 ], [ -126.233626699999988, 54.4517387 ], [ -126.2335211, 54.4517188 ], [ -126.2332898, 54.4517216 ], [ -126.233163600000012, 54.4517458 ], [ -126.232863099999975, 54.451874 ], [ -126.2327687, 54.4518982 ], [ -126.2326761, 54.4518968 ], [ -126.2326006, 54.4518683 ], [ -126.2325426, 54.4518042 ], [ -126.2325217, 54.4516775 ], [ -126.2327431, 54.4515649 ], [ -126.2331029, 54.4515108 ], [ -126.2333387, 54.4514268 ], [ -126.233469899999989, 54.4513129 ], [ -126.2334899, 54.4512502 ] ] } }, @@ -199,68 +423,159 @@ { "type": "Feature", "properties": { "linear_feature_id": 17093468, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 173997.76182985201, "blue_line_key": 360873822, "length_metre": 721.79090261055103, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.672576100000015, 54.3943132 ], [ -126.6717932, 54.3961917 ], [ -126.6717016, 54.3965534 ], [ -126.671681, 54.3970348 ], [ -126.6719767, 54.398056 ], [ -126.6719186, 54.3984904 ], [ -126.671755499999989, 54.3989034 ], [ -126.671554500000013, 54.399221 ], [ -126.6712627, 54.3995186 ], [ -126.6705691, 54.400057 ], [ -126.670011, 54.4003532 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17068060, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 12012.3587804704, "blue_line_key": 360875378, "length_metre": 81.509420901196606, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5835557, 54.5561204 ], [ -126.583682400000015, 54.5560877 ], [ -126.584044, 54.5559866 ], [ -126.5844143, 54.5559666 ], [ -126.584664799999985, 54.5559453 ], [ -126.5847587, 54.5559296 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17068262, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 10267.7709322348, "blue_line_key": 360875378, "length_metre": 486.41934737767201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5601783, 54.554662 ], [ -126.560223, 54.5547176 ], [ -126.5603688, 54.5548643 ], [ -126.5606939, 54.5548614 ], [ -126.5610191, 54.5548586 ], [ -126.5611566, 54.5548799 ], [ -126.5612237, 54.5550338 ], [ -126.561233, 54.555142 ], [ -126.5612762, 54.5551876 ], [ -126.5613818, 54.5552445 ], [ -126.56159980000001, 54.5552388 ], [ -126.5619392, 54.5552374 ], [ -126.5622325, 54.5552346 ], [ -126.562542400000012, 54.5552403 ], [ -126.5626342, 54.5552517 ], [ -126.5629422, 54.5552844 ], [ -126.5630468, 54.5553229 ], [ -126.563381699999979, 54.5554197 ], [ -126.5635776, 54.5555137 ], [ -126.5637009, 54.5555337 ], [ -126.5639794, 54.5555308 ], [ -126.564334, 54.555528 ], [ -126.5645162, 54.5555764 ], [ -126.56464050000001, 54.5555792 ], [ -126.5649971, 54.5555778 ], [ -126.565150299999985, 54.5555892 ], [ -126.5652426, 54.555592 ], [ -126.565585, 54.5555892 ], [ -126.565893, 54.5555863 ], [ -126.5661907, 54.5555208 ], [ -126.566283499999983, 54.5555223 ], [ -126.566608199999976, 54.5555208 ], [ -126.566716699999986, 54.5555408 ], [ -126.5668552, 54.5555522 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091017, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 274634.69660493801, "blue_line_key": 360873822, "length_metre": 655.25004329551803, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1332988, 54.4237444 ], [ -126.1400344, 54.4260744 ], [ -126.1415462, 54.4270643 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099115, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 4354.5557832939903, "blue_line_key": 360877225, "length_metre": 1038.65205608929, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1544611, 54.2979711 ], [ -126.1545317, 54.2978372 ], [ -126.154621400000011, 54.2976506 ], [ -126.1547703, 54.2974826 ], [ -126.15502619999998, 54.2973359 ], [ -126.155296100000015, 54.2972177 ], [ -126.155455100000012, 54.2971493 ], [ -126.1555665, 54.297098 ], [ -126.1558192, 54.296987 ], [ -126.1561042, 54.2968673 ], [ -126.1563874, 54.2967933 ], [ -126.1566846, 54.2967007 ], [ -126.1567318, 54.296685 ], [ -126.1569653, 54.2966266 ], [ -126.1572764, 54.2965896 ], [ -126.1576151, 54.2965711 ], [ -126.1579695, 54.2965697 ], [ -126.15828, 54.2965412 ], [ -126.1586034, 54.2965041 ], [ -126.158888399999981, 54.2964116 ], [ -126.1591118, 54.2962734 ], [ -126.1591874, 54.2960854 ], [ -126.159283499999987, 54.2960156 ], [ -126.1593141, 54.2959986 ], [ -126.159601099999989, 54.2958803 ], [ -126.15985689999998, 54.2957336 ], [ -126.1600517, 54.295567 ], [ -126.160276200000013, 54.295446 ], [ -126.1606034, 54.2953648 ], [ -126.160885900000011, 54.2952993 ], [ -126.161199, 54.2952167 ], [ -126.1615694, 54.2951711 ], [ -126.1618901, 54.2952152 ], [ -126.162191799999988, 54.295285 ], [ -126.162478100000016, 54.2953904 ], [ -126.162744800000013, 54.2955229 ], [ -126.1630992, 54.2955214 ], [ -126.163409699999988, 54.2954659 ], [ -126.163678899999979, 54.295356200000015 ], [ -126.1639195, 54.2952181 ], [ -126.164186699999988, 54.2951341 ], [ -126.1645119, 54.2950785 ], [ -126.1648395, 54.295023 ], [ -126.1651514, 54.2949503 ], [ -126.165479800000014, 54.2948592 ], [ -126.1657349, 54.2947481 ], [ -126.1659435, 54.2946171 ], [ -126.1661371, 54.2944604 ], [ -126.1663196, 54.2942938 ], [ -126.1665296, 54.2941186 ], [ -126.1667256, 54.2939619 ], [ -126.1668598, 54.2937939 ], [ -126.166973, 54.2937241 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093923, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 17039.512543361499, "blue_line_key": 360846413, "length_metre": 69.671297114993493, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2651059, 54.3908359 ], [ -126.2661634, 54.3907224 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17052896, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1003.28846980308, "blue_line_key": 360851779, "length_metre": 152.28926608291101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.524386799999988, 54.6411714 ], [ -126.524280300000015, 54.641395 ], [ -126.52426029999998, 54.6414747 ], [ -126.5242621, 54.6416912 ], [ -126.5243131, 54.6418721 ], [ -126.5243417, 54.6419176 ], [ -126.5243561, 54.6419618 ], [ -126.5243985, 54.6420173 ], [ -126.524471, 54.642099900000012 ], [ -126.5246584, 54.6423278 ], [ -126.5247733, 54.642466 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17090456, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 10216.2467857467, "blue_line_key": 360846413, "length_metre": 1110.91516727354, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3026243, 54.4352236 ], [ -126.2944972, 54.4320647 ], [ -126.2904323, 54.4284922 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17089683, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 9717.5315220935408, "blue_line_key": 360846413, "length_metre": 498.71526365314401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.305099399999975, 54.439454899999987 ], [ -126.3026243, 54.4352236 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17096181, "stream_order": 4, "gnis_name": "Dungate Creek", "downstream_route_measure": 6078.3383705033802, "blue_line_key": 360760898, "length_metre": 27.767682167800999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.566704, 54.3417342 ], [ -126.5666147, 54.3416687 ], [ -126.566455099999985, 54.341531900000014 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17106320, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 10242.730337585301, "blue_line_key": 360882583, "length_metre": 649.02565978081998, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.959448899999984, 54.1880777 ], [ -125.9595358, 54.1880207 ], [ -125.9596036, 54.187884 ], [ -125.9596215, 54.1877045 ], [ -125.959593599999977, 54.1875436 ], [ -125.959612499999977, 54.1873812 ], [ -125.959664, 54.187236 ], [ -125.9597779, 54.1871064 ], [ -125.959818500000011, 54.1870166 ], [ -125.9597975, 54.1869354 ], [ -125.959652800000015, 54.18684 ], [ -125.9593018, 54.1866777 ], [ -125.9591571, 54.1865822 ], [ -125.958971800000015, 54.1863273 ], [ -125.9588271, 54.1862319 ], [ -125.9586225, 54.1861735 ], [ -125.9583593, 54.186135 ], [ -125.9580666, 54.1861237 ], [ -125.957833899999983, 54.1860752 ], [ -125.9574272, 54.1859513 ], [ -125.957092, 54.185779 ], [ -125.9569627, 54.185675 ], [ -125.956615, 54.1853332 ], [ -125.9563111, 54.1851424 ], [ -125.9559167, 54.1849985 ], [ -125.9558161, 54.184876 ], [ -125.955759499999985, 54.1847336 ], [ -125.955634099999983, 54.1844488 ], [ -125.9554311, 54.1842024 ], [ -125.955435, 54.1840215 ], [ -125.9554506, 54.1838421 ], [ -125.9554394, 54.1836626 ], [ -125.955385399999983, 54.1835458 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17100831, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 24323.119814988, "blue_line_key": 360881038, "length_metre": 27.213588416187299, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.070959699999975, 54.2659477 ], [ -126.0708855, 54.2659107 ], [ -126.070815, 54.2658366 ], [ -126.070776, 54.265737 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17095444, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 10081.966967599399, "blue_line_key": 360886524, "length_metre": 433.63870339942201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2545432, 54.3605209 ], [ -126.254752199999984, 54.3603814 ], [ -126.2550065, 54.3602788 ], [ -126.2551001, 54.3602361 ], [ -126.255403899999976, 54.3600638 ], [ -126.255487, 54.360002499999986 ], [ -126.255540599999989, 54.3598872 ], [ -126.2557136, 54.3598274 ], [ -126.2558126, 54.359722 ], [ -126.2558869, 54.3595354 ], [ -126.255936299999988, 54.3594727 ], [ -126.2561342, 54.359289 ], [ -126.2563867, 54.3591779 ], [ -126.2565004, 54.3590996 ], [ -126.2568195, 54.3589187 ], [ -126.2569673, 54.3588133 ], [ -126.2570857, 54.3586538 ], [ -126.2571805, 54.358594 ], [ -126.257510099999976, 54.3584929 ], [ -126.257621399999977, 54.3584686 ], [ -126.257916200000011, 54.3584031 ], [ -126.2580882, 54.3583804 ], [ -126.2583513, 54.358369 ], [ -126.2586272, 54.358356099999988 ], [ -126.258782700000012, 54.3583519 ], [ -126.259104600000015, 54.3583675 ], [ -126.2592306, 54.3583433 ], [ -126.259403100000014, 54.3582849 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17070385, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 8510.8074874742997, "blue_line_key": 360875378, "length_metre": 104.538468051998, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5422, 54.5449945 ], [ -126.5422907, 54.5450586 ], [ -126.542466699999977, 54.5452238 ], [ -126.542808600000015, 54.5454559 ], [ -126.5430471, 54.5455685 ], [ -126.543322499999988, 54.5456454 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17072869, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1226.6853136493401, "blue_line_key": 360881632, "length_metre": 358.46391829650202, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6465917, 54.5331465 ], [ -126.646792499999989, 54.5331408 ], [ -126.6471636, 54.5331394 ], [ -126.647288800000013, 54.5331323 ], [ -126.6476751, 54.5331223 ], [ -126.648032, 54.5330838 ], [ -126.64821809999998, 54.5330781 ], [ -126.648561199999989, 54.5330226 ], [ -126.648704, 54.5329713 ], [ -126.6488115, 54.5329728 ], [ -126.6491836, 54.5329542 ], [ -126.6493907, 54.5328588 ], [ -126.6496754, 54.5327378 ], [ -126.6498491, 54.5326608 ], [ -126.649915900000011, 54.5326167 ], [ -126.6500655, 54.5323959 ], [ -126.6502417, 54.5322906 ], [ -126.6505302, 54.5321439 ], [ -126.650626399999979, 54.5320641 ], [ -126.6507299, 54.5318775 ], [ -126.650756299999983, 54.5317081 ], [ -126.650744499999988, 54.5316354 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17080055, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 6759.1179360932101, "blue_line_key": 360875052, "length_metre": 243.573153291164, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3933697, 54.4954876 ], [ -126.394521399999974, 54.4951201 ], [ -126.395347699999988, 54.4950717 ], [ -126.396836, 54.4946957 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17071619, "stream_order": 4, "gnis_name": "Johnny David Creek", "downstream_route_measure": 3405.9328676755999, "blue_line_key": 360866287, "length_metre": 95.591130869127497, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3864034, 54.5390385 ], [ -126.3865158, 54.5392293 ], [ -126.3866283, 54.5393845 ], [ -126.386635399999989, 54.5395113 ], [ -126.3866257, 54.5396722 ], [ -126.3865981, 54.5398702 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092041, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 14832.8650108162, "blue_line_key": 360862508, "length_metre": 149.69726011805599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.376635, 54.4133862 ], [ -126.376528099999987, 54.4133563 ], [ -126.3764401, 54.4133007 ], [ -126.3763499, 54.4132722 ], [ -126.3763236, 54.4132081 ], [ -126.376165799999981, 54.4129974 ], [ -126.3760636, 54.4129062 ], [ -126.3759465, 54.4128222 ], [ -126.3758573, 54.4127837 ], [ -126.37575, 54.4127552 ], [ -126.3756433, 54.4127524 ], [ -126.375302600000012, 54.4127538 ], [ -126.3750236, 54.4128022 ], [ -126.374914499999988, 54.4127994 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17094054, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 254964.39518783, "blue_line_key": 360873822, "length_metre": 1712.21155150607, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1605845, 54.3982554 ], [ -126.160400700000011, 54.3982425 ], [ -126.1601905, 54.3981742 ], [ -126.1599797, 54.3981072 ], [ -126.159784800000011, 54.3980303 ], [ -126.1596205, 54.3979363 ], [ -126.159506400000012, 54.3978252 ], [ -126.1594818, 54.3977441 ], [ -126.1594878, 54.3976458 ], [ -126.1594203, 54.3975005 ], [ -126.1592884, 54.397398 ], [ -126.1590771, 54.3973396 ], [ -126.1588497, 54.397271200000013 ], [ -126.158671899999987, 54.3971943 ], [ -126.1585071, 54.397101799999987 ], [ -126.1582617, 54.3968796 ], [ -126.1582641, 54.3968255 ], [ -126.1581942, 54.3967343 ], [ -126.158014, 54.3966574 ], [ -126.1577867, 54.3966161 ], [ -126.1575122, 54.39658330000001 ], [ -126.1572525, 54.3965506 ], [ -126.157106, 54.396448 ], [ -126.1570384, 54.3963028 ], [ -126.1570493, 54.3961233 ], [ -126.1570619, 54.3959524 ], [ -126.1570268, 54.3957986 ], [ -126.156880299999983, 54.3956961 ], [ -126.156596, 54.3955821 ], [ -126.1562791, 54.3954839 ], [ -126.156013899999977, 54.3955138 ], [ -126.1557371, 54.3955081 ], [ -126.1553786, 54.3953557 ], [ -126.1552296, 54.3952531 ], [ -126.155116199999981, 54.3951335 ], [ -126.155032100000014, 54.3950139 ], [ -126.1549009, 54.3949028 ], [ -126.1547532, 54.3948102 ], [ -126.1545736, 54.3947248 ], [ -126.1542158, 54.3945638 ], [ -126.1539032, 54.3943858 ], [ -126.1537077, 54.3943174 ], [ -126.1535294, 54.3942419 ], [ -126.153471799999977, 54.3941779 ], [ -126.1533835, 54.3941309 ], [ -126.1530766, 54.3941138 ], [ -126.1527678, 54.3941152 ], [ -126.152508099999977, 54.3940824 ], [ -126.1523728, 54.394044 ], [ -126.1521012, 54.3939286 ], [ -126.1517581, 54.3937677 ], [ -126.151626899999982, 54.3936566 ], [ -126.151561799999982, 54.3935113 ], [ -126.1516751, 54.3934074 ], [ -126.151693400000013, 54.3933974 ], [ -126.151944500000013, 54.3933319 ], [ -126.152057199999973, 54.3932365 ], [ -126.1522648, 54.3931425 ], [ -126.152289099999976, 54.3930072 ], [ -126.152221, 54.3928704 ], [ -126.152122799999987, 54.3927423 ], [ -126.152007, 54.3926226 ], [ -126.151877699999986, 54.392513 ], [ -126.151581, 54.392325 ], [ -126.1512875, 54.3921213 ], [ -126.1509952, 54.3919077 ], [ -126.150894, 54.391788 ], [ -126.15078, 54.3916769 ], [ -126.1506495, 54.3915573 ], [ -126.150503, 54.3914548 ], [ -126.1502553, 54.3912326 ], [ -126.1499918, 54.3910204 ], [ -126.1498171, 54.3908808 ], [ -126.149714800000012, 54.3907982 ], [ -126.149469599999989, 54.390576 ], [ -126.149417499999984, 54.3904222 ], [ -126.149382499999973, 54.390268399999989 ], [ -126.1492997, 54.3901317 ], [ -126.149248199999988, 54.3899964 ], [ -126.1493491, 54.3898725 ], [ -126.1494636, 54.3897585 ], [ -126.1494439, 54.3895962 ], [ -126.1493605, 54.389468 ], [ -126.149229399999982, 54.3893569 ], [ -126.148934700000012, 54.3891703 ], [ -126.1488035, 54.3890592 ], [ -126.1486417, 54.3889652 ], [ -126.148461099999977, 54.3888898 ], [ -126.1482356, 54.3888299 ], [ -126.1479753, 54.3888057 ], [ -126.1476672, 54.3887986 ], [ -126.1473714, 54.3888186 ], [ -126.147094, 54.3888214 ], [ -126.1468679, 54.3887701 ], [ -126.146638900000013, 54.3887203 ], [ -126.1464276, 54.3886619 ], [ -126.1462156, 54.388612 ], [ -126.1460049, 54.3885522 ], [ -126.14581, 54.3884753 ], [ -126.1456294, 54.3883998 ], [ -126.1453157, 54.388266 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104471, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 33265.4201591581, "blue_line_key": 360881038, "length_metre": 239.78040405846701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0573692, 54.2154823 ], [ -126.0573872, 54.2154467 ], [ -126.0574169, 54.2152402 ], [ -126.057477, 54.2150436 ], [ -126.0576704, 54.2148955 ], [ -126.057927299999989, 54.2147403 ], [ -126.058062199999981, 54.2145722 ], [ -126.0580651, 54.2145181 ], [ -126.0580025, 54.2143372 ], [ -126.057907199999988, 54.2141464 ], [ -126.0578763, 54.2139655 ], [ -126.057819799999976, 54.2138744 ], [ -126.0577774, 54.2138373 ], [ -126.0577352, 54.2137733 ], [ -126.057718, 54.2135753 ], [ -126.0576921, 54.2135197 ], [ -126.057663099999985, 54.2134927 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099197, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 25974.8469432194, "blue_line_key": 360880905, "length_metre": 193.18035134789599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4171951, 54.2912289 ], [ -126.4177051, 54.2919396 ], [ -126.417651699999979, 54.2922942 ], [ -126.417469299999979, 54.2927571 ], [ -126.4175041, 54.2928852 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093797, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 16638.7248228403, "blue_line_key": 360846413, "length_metre": 125.613897933006, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2621884, 54.393474499999989 ], [ -126.2624101, 54.3923565 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17091904, "stream_order": 5, "gnis_name": "Bulkley River", "downstream_route_measure": 270476.94702086598, "blue_line_key": 360873822, "length_metre": 843.63228616105096, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0835829, 54.414356 ], [ -126.094827099999989, 54.4181758 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17097934, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 14473.7508706274, "blue_line_key": 360886221, "length_metre": 84.882274060645599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.63836280000001, 54.3145532 ], [ -126.638582700000015, 54.3144762 ], [ -126.6386628, 54.314415 ], [ -126.6389354, 54.3142227 ], [ -126.6390144, 54.3141786 ], [ -126.639164, 54.3139749 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17059242, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 15639.0720696277, "blue_line_key": 360856488, "length_metre": 888.36102303477799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4963122, 54.6041861 ], [ -126.49644, 54.6041433 ], [ -126.4965635, 54.6041277 ], [ -126.4966726, 54.6041391 ], [ -126.4967779, 54.604169 ], [ -126.4968836, 54.604233099999988 ], [ -126.4971018, 54.6044624 ], [ -126.4971042, 54.6046689 ], [ -126.4970697, 54.6047401 ], [ -126.496963400000013, 54.6049267 ], [ -126.4970022, 54.6050634 ], [ -126.4970779, 54.6051004 ], [ -126.497262799999987, 54.6051132 ], [ -126.497404, 54.605089 ], [ -126.497624300000012, 54.6050135 ], [ -126.497903600000015, 54.6050093 ], [ -126.498059, 54.6050221 ], [ -126.4982262, 54.605079 ], [ -126.4985876, 54.6052215 ], [ -126.498722799999982, 54.6052784 ], [ -126.4989013, 54.6054166 ], [ -126.4990311, 54.6055818 ], [ -126.499085099999988, 54.6056815 ], [ -126.4991377, 54.6058353 ], [ -126.499187299999974, 54.6060618 ], [ -126.4992561, 54.6061971 ], [ -126.49929, 54.606405 ], [ -126.4992678, 54.6065118 ], [ -126.498995299999976, 54.6066599 ], [ -126.4988954, 54.6067568 ], [ -126.4986962, 54.6069775 ], [ -126.498676499999988, 54.6070487 ], [ -126.4987025, 54.6071299 ], [ -126.498745299999982, 54.607184 ], [ -126.498967, 54.6073606 ], [ -126.4990398, 54.6074418 ], [ -126.499035299999989, 54.607533 ], [ -126.4989305, 54.607701 ], [ -126.498850800000014, 54.6077537 ], [ -126.4986605, 54.6078207 ], [ -126.498580800000013, 54.6078733 ], [ -126.498505, 54.6080784 ], [ -126.4984828, 54.6082137 ], [ -126.4985389, 54.6082864 ], [ -126.498651, 54.6084957 ], [ -126.4987793, 54.608651 ], [ -126.4988953, 54.6088062 ], [ -126.4990217, 54.6089885 ], [ -126.4990718, 54.6092135 ], [ -126.4990526, 54.6092762 ], [ -126.4990707, 54.6094656 ], [ -126.4991376, 54.6096565 ], [ -126.4992109, 54.6097291 ], [ -126.4993869, 54.6098672 ], [ -126.4995246, 54.6098886 ], [ -126.4997882, 54.6098943 ], [ -126.5000356, 54.60989 ], [ -126.5001586, 54.6099114 ], [ -126.500295299999976, 54.6099498 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076460, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 206395.390999155, "blue_line_key": 360873822, "length_metre": 496.002133853158, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4607646, 54.5136961 ], [ -126.459582700000013, 54.51335 ], [ -126.458215200000012, 54.5127632 ], [ -126.4577157, 54.5126621 ], [ -126.457402699999989, 54.5126593 ], [ -126.4559398, 54.5128857 ], [ -126.455315599999977, 54.512917 ], [ -126.453673199999983, 54.5127447 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17098193, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 17866.751903700799, "blue_line_key": 360881038, "length_metre": 601.79656633900197, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.09864, 54.3163263 ], [ -126.097165899999979, 54.3110032 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091242, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1082.97419132508, "blue_line_key": 360841027, "length_metre": 146.83140970576801, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.081936399999975, 54.4216808 ], [ -126.0817629, 54.4217206 ], [ -126.0814798, 54.4218132 ], [ -126.081134699999978, 54.4218944 ], [ -126.0808233, 54.4219499 ], [ -126.0804972, 54.4219784 ], [ -126.0800638, 54.4220126 ], [ -126.0797954, 54.4220781 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093938, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 20031.070948718701, "blue_line_key": 360862508, "length_metre": 432.08317421801701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.335031, 54.3937107 ], [ -126.3348999, 54.3935911 ], [ -126.334828, 54.3935184 ], [ -126.3347256, 54.3934074 ], [ -126.3345623, 54.3933233 ], [ -126.334277500000013, 54.3932094 ], [ -126.3340391, 54.3930684 ], [ -126.3339291, 54.392869 ], [ -126.3339336, 54.3928149 ], [ -126.3340476, 54.3927009 ], [ -126.334135, 54.3925585 ], [ -126.3341445, 54.3923876 ], [ -126.33413560000001, 54.3923164 ], [ -126.333961300000013, 54.3921327 ], [ -126.3339205, 54.3920686 ], [ -126.3339687, 54.3920159 ], [ -126.334116099999989, 54.3918835 ], [ -126.334283500000012, 54.3916812 ], [ -126.3344343, 54.3914776 ], [ -126.3344333, 54.3912881 ], [ -126.334379299999981, 54.3911443 ], [ -126.3343062, 54.3910887 ], [ -126.334088799999989, 54.390868 ], [ -126.3339573, 54.390784 ], [ -126.333839200000014, 54.3906828 ], [ -126.3336537, 54.3904621 ], [ -126.3336004, 54.3903439 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17093984, "stream_order": 5, "gnis_name": "Bulkley River", "downstream_route_measure": 262738.672049916, "blue_line_key": 360873822, "length_metre": 132.220302450383, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0652046, 54.3896987 ], [ -126.064144, 54.3905405 ], [ -126.0640792, 54.3906771 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099650, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 24193.6578123822, "blue_line_key": 360880905, "length_metre": 134.416778533919, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.39790739999998, 54.2845735 ], [ -126.3978722, 54.2846448 ], [ -126.397883900000011, 54.2847074 ], [ -126.397985, 54.2848271 ], [ -126.3981853, 54.2850378 ], [ -126.398214200000012, 54.2850934 ], [ -126.398271099999974, 54.285139 ], [ -126.39837630000001, 54.285186 ], [ -126.3984668, 54.2852059 ], [ -126.3986965, 54.2852116 ], [ -126.398915100000011, 54.2851803 ], [ -126.3992228, 54.2851589 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17058187, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 16527.433092662501, "blue_line_key": 360856488, "length_metre": 315.25686200449098, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.500295299999976, 54.6099498 ], [ -126.5004015, 54.6100054 ], [ -126.5004886, 54.610088 ], [ -126.500530399999988, 54.6101521 ], [ -126.500554499999978, 54.6102603 ], [ -126.5004983, 54.6104298 ], [ -126.500401900000014, 54.6105096 ], [ -126.500103400000015, 54.610548 ], [ -126.4999962, 54.6105452 ], [ -126.499658299999979, 54.6105124 ], [ -126.4994601, 54.6104455 ], [ -126.4992264, 54.6104668 ], [ -126.499161, 54.6105281 ], [ -126.4991344, 54.6106904 ], [ -126.4991477, 54.6107446 ], [ -126.499306499999989, 54.6109183 ], [ -126.499469800000014, 54.6110294 ], [ -126.4995461, 54.6110579 ], [ -126.4999154, 54.6110921 ], [ -126.500052599999989, 54.611122 ], [ -126.50029760000001, 54.6111818 ], [ -126.5003733, 54.6112188 ], [ -126.500429899999986, 54.6112829 ], [ -126.5004697, 54.6114097 ], [ -126.500574500000013, 54.6114837 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17077474, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 205422.79391902901, "blue_line_key": 360873822, "length_metre": 238.52677290808401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4689545, 54.5074011 ], [ -126.469161899999989, 54.5076218 ], [ -126.4692123, 54.5079551 ], [ -126.4687322, 54.5087185 ], [ -126.4683815, 54.5091115 ], [ -126.468366299999985, 54.5094078 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17106181, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 47957.975213284401, "blue_line_key": 360886221, "length_metre": 1065.52184145359, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4934051, 54.1881446 ], [ -126.493405700000011, 54.188109 ], [ -126.493410399999988, 54.1880549 ], [ -126.493428, 54.1879922 ], [ -126.493431699999988, 54.1879481 ], [ -126.4934334, 54.1879025 ], [ -126.49345169999998, 54.1878583 ], [ -126.493438799999979, 54.1878128 ], [ -126.4934265, 54.1877586 ], [ -126.4934003, 54.187696 ], [ -126.4933746, 54.1876319 ], [ -126.49331789999998, 54.1875593 ], [ -126.4932428, 54.1875037 ], [ -126.493184899999989, 54.1874482 ], [ -126.4931123, 54.1873926 ], [ -126.4930251, 54.1873371 ], [ -126.4929348, 54.1872901 ], [ -126.4928452, 54.1872345 ], [ -126.4927726, 54.187179 ], [ -126.4926994, 54.187132 ], [ -126.4926257, 54.1870864 ], [ -126.492553099999981, 54.1870309 ], [ -126.4924781, 54.1869753 ], [ -126.492420700000011, 54.1869112 ], [ -126.4923645, 54.1868372 ], [ -126.4922919, 54.1867816 ], [ -126.4922352, 54.186709 ], [ -126.4921615, 54.1866364 ], [ -126.49209, 54.1865709 ], [ -126.4920327, 54.1865068 ], [ -126.491974200000016, 54.1864526 ], [ -126.4919027, 54.1863601 ], [ -126.4918752, 54.1863145 ], [ -126.491788, 54.1862319 ], [ -126.491699, 54.1861678 ], [ -126.4915942, 54.1861479 ], [ -126.491426, 54.186135 ], [ -126.4913035, 54.1861237 ], [ -126.491212, 54.1861208 ], [ -126.4911054, 54.1861194 ], [ -126.4909969, 54.1861165 ], [ -126.4908592, 54.1861137 ], [ -126.4907527, 54.1861123 ], [ -126.490646, 54.186118 ], [ -126.4905363, 54.1861251 ], [ -126.490460699999986, 54.1861322 ], [ -126.490336499999984, 54.1861664 ], [ -126.490254899999982, 54.1862176 ], [ -126.4901751, 54.1862703 ], [ -126.490113099999988, 54.1863145 ], [ -126.4900771, 54.1863672 ], [ -126.4900279, 54.1864569 ], [ -126.490009699999987, 54.1865011 ], [ -126.489990800000015, 54.1865538 ], [ -126.489939799999988, 54.1866349 ], [ -126.4897217, 54.1866933 ], [ -126.4896139, 54.186709 ], [ -126.4895206, 54.1867247 ], [ -126.489383499999988, 54.1867133 ], [ -126.4892341, 54.1866549 ], [ -126.48915980000001, 54.1866178 ], [ -126.4890725, 54.1865352 ], [ -126.489032200000011, 54.1864441 ], [ -126.489036399999989, 54.1863643 ], [ -126.4890711, 54.1863017 ], [ -126.4891356, 54.1862575 ], [ -126.4892793, 54.1861621 ], [ -126.4893719, 54.1861279 ], [ -126.4895302, 54.1860596 ], [ -126.489687899999979, 54.1859727 ], [ -126.4898457, 54.1858858 ], [ -126.4899254, 54.1858602 ], [ -126.490065, 54.1858374 ], [ -126.4901587, 54.1857932 ], [ -126.490225099999989, 54.1857234 ], [ -126.490258, 54.1856793 ], [ -126.490292, 54.1856252 ], [ -126.4903103, 54.185581 ], [ -126.490284, 54.1854913 ], [ -126.4902138, 54.1854087 ], [ -126.49009430000001, 54.1853346 ], [ -126.489961400000013, 54.1852506 ], [ -126.489888799999989, 54.1851951 ], [ -126.4898302, 54.1851481 ], [ -126.4897717, 54.1850939 ], [ -126.4897284, 54.1850384 ], [ -126.489700899999988, 54.1849928 ], [ -126.4895845, 54.1849102 ], [ -126.4894479, 54.1848703 ], [ -126.489343099999985, 54.1848504 ], [ -126.4892359, 54.184857500000014 ], [ -126.4891402, 54.1849003 ], [ -126.489073300000015, 54.1849715 ], [ -126.489008200000015, 54.1850512 ], [ -126.4889747, 54.1851039 ], [ -126.4889711, 54.1851481 ], [ -126.4889687, 54.1852022 ], [ -126.488981, 54.1852563 ], [ -126.4889921, 54.1853204 ], [ -126.4890183, 54.1853831 ], [ -126.4890457, 54.1854286 ], [ -126.489058, 54.18548280000001 ], [ -126.489086699999973, 54.1855383 ], [ -126.4891142, 54.1855839 ], [ -126.4890936, 54.1856821 ], [ -126.4890278, 54.1857434 ], [ -126.488903, 54.1857861 ], [ -126.488825, 54.1857932 ], [ -126.4887494, 54.1858004 ], [ -126.4886714, 54.1858075 ], [ -126.4885197, 54.1857961 ], [ -126.488443499999988, 54.1857847 ], [ -126.4883667, 54.1857747 ], [ -126.4882905, 54.1857633 ], [ -126.488200299999988, 54.1857434 ], [ -126.4880638, 54.1856964 ], [ -126.4879455, 54.1856394 ], [ -126.487812600000012, 54.1855554 ], [ -126.487753500000011, 54.1855098 ], [ -126.4876968, 54.1854642 ], [ -126.487668, 54.1854087 ], [ -126.487640499999983, 54.1853631 ], [ -126.4876448, 54.1853104 ], [ -126.4876466, 54.1852648 ], [ -126.4877117, 54.1851851 ], [ -126.487775700000014, 54.1851424 ], [ -126.4878877, 54.1850811 ], [ -126.4879833, 54.1850113 ], [ -126.48801850000001, 54.1849401 ], [ -126.487993499999988, 54.1848675 ], [ -126.4879185, 54.184812 ], [ -126.4878154, 54.1847735 ], [ -126.4876315, 54.1847707 ], [ -126.487537599999982, 54.1847678 ], [ -126.4874456, 54.1847664 ], [ -126.487355400000013, 54.1847735 ], [ -126.4873086, 54.184782 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17104369, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 19196.1102532736, "blue_line_key": 360877225, "length_metre": 1414.33277599997, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2297594, 54.2153997 ], [ -126.2298329, 54.2154453 ], [ -126.2298906, 54.2155008 ], [ -126.229902599999988, 54.2155549 ], [ -126.2299603, 54.2156105 ], [ -126.2300517, 54.2156404 ], [ -126.2302823, 54.2156361 ], [ -126.2305923, 54.21558060000001 ], [ -126.230838100000014, 54.2155678 ], [ -126.231111, 54.2156276 ], [ -126.2312317, 54.2156575 ], [ -126.231560500000015, 54.2157914 ], [ -126.231858899999978, 54.2159153 ], [ -126.232086099999989, 54.2159466 ], [ -126.2323903, 54.2159808 ], [ -126.232665399999973, 54.2159879 ], [ -126.2328966, 54.2159751 ], [ -126.2331747, 54.2159537 ], [ -126.2334364, 54.2159509 ], [ -126.233573, 54.2159637 ], [ -126.2338732, 54.2160691 ], [ -126.2339945, 54.2160904 ], [ -126.234132300000013, 54.216093300000011 ], [ -126.234455, 54.2160833 ], [ -126.234653200000011, 54.2160876 ], [ -126.2347764, 54.2160904 ], [ -126.2351275, 54.2161161 ], [ -126.235421, 54.2160862 ], [ -126.235649599999988, 54.2161004 ], [ -126.2357716, 54.2161132 ], [ -126.2360896, 54.216183 ], [ -126.2364548, 54.2162371 ], [ -126.2366072, 54.21624 ], [ -126.2368675, 54.2162542 ], [ -126.2372333, 54.2162998 ], [ -126.237448, 54.216285600000013 ], [ -126.2377568, 54.21624 ], [ -126.2379957, 54.2161189 ], [ -126.2381121, 54.2159865 ], [ -126.2381251, 54.2157899 ], [ -126.238160099999988, 54.2157273 ], [ -126.238256, 54.2156845 ], [ -126.238348, 54.215686 ], [ -126.2384694, 54.2157073 ], [ -126.238735399999982, 54.2158398 ], [ -126.238841899999983, 54.2158683 ], [ -126.2392013, 54.215985 ], [ -126.2394464, 54.2160078 ], [ -126.2395836, 54.2160121 ], [ -126.2396928, 54.2159865 ], [ -126.2398015, 54.2159623 ], [ -126.239976299999981, 54.2158768 ], [ -126.2401453, 54.215854 ], [ -126.240438099999977, 54.2158327 ], [ -126.240762499999988, 54.2158312 ], [ -126.24097470000001, 54.215864 ], [ -126.241290299999989, 54.2159338 ], [ -126.2414673, 54.2160634 ], [ -126.2415504, 54.216183 ], [ -126.241608699999986, 54.2162371 ], [ -126.241697, 54.2162756 ], [ -126.2418042, 54.2162955 ], [ -126.2418983, 54.2162713 ], [ -126.242010099999987, 54.2162115 ], [ -126.242313400000015, 54.2160206 ], [ -126.2426323, 54.2158469 ], [ -126.242898599999975, 54.2157643 ], [ -126.2432669, 54.2157629 ], [ -126.243568499999981, 54.2158241 ], [ -126.243799700000011, 54.2158113 ], [ -126.243910899999975, 54.21576 ], [ -126.2440418, 54.2156546 ], [ -126.2440305, 54.215592 ], [ -126.243972, 54.215545 ], [ -126.2438356, 54.215525 ], [ -126.2437765, 54.2154866 ], [ -126.2438142, 54.2153627 ], [ -126.244098900000012, 54.215243 ], [ -126.244207499999987, 54.2152188 ], [ -126.2444362, 54.2152331 ], [ -126.2445295, 54.2152174 ], [ -126.244815300000013, 54.2150878 ], [ -126.245118499999975, 54.2148969 ], [ -126.2453472, 54.2149112 ], [ -126.245468499999987, 54.2149326 ], [ -126.245664100000013, 54.214991 ], [ -126.2457561, 54.2149924 ], [ -126.2458661, 54.2149511 ], [ -126.2460573, 54.2148471 ], [ -126.246187, 54.2147517 ], [ -126.2463033, 54.2146192 ], [ -126.2462946, 54.214502400000015 ], [ -126.246291, 54.2143315 ], [ -126.246361600000014, 54.2141977 ], [ -126.246608, 54.2141763 ], [ -126.246716600000013, 54.2141791 ], [ -126.246806799999987, 54.2141991 ], [ -126.246987, 54.214266 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17106432, "stream_order": 4, "gnis_name": "Buck Creek", "downstream_route_measure": 60215.142330196002, "blue_line_key": 360886221, "length_metre": 218.45573219595499, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.412574, 54.180978 ], [ -126.412515500000012, 54.180958 ], [ -126.4123785, 54.1809196 ], [ -126.4121975, 54.1808883 ], [ -126.4120909, 54.1808868 ], [ -126.4119665, 54.1809011 ], [ -126.4118246, 54.1809438 ], [ -126.4116831, 54.1810122 ], [ -126.4115558, 54.1810819 ], [ -126.4113192, 54.1812116 ], [ -126.411177799999976, 54.1812529 ], [ -126.4110681, 54.181287 ], [ -126.410945, 54.1813112 ], [ -126.410851799999989, 54.1813269 ], [ -126.4107275, 54.181334 ], [ -126.4106215, 54.1813312 ], [ -126.4105142, 54.1813383 ], [ -126.4104058, 54.1813355 ], [ -126.410237599999988, 54.1813226 ], [ -126.4100999, 54.1813198 ], [ -126.409933, 54.1813169 ], [ -126.4097788, 54.1813127 ], [ -126.4095072, 54.1812628 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17104479, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 22459.886557387199, "blue_line_key": 360877225, "length_metre": 227.226316211788, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.268571, 54.2140111 ], [ -126.2686942, 54.2140139 ], [ -126.268806, 54.2139541 ], [ -126.268889300000012, 54.2138388 ], [ -126.2689846, 54.2137775 ], [ -126.2691077, 54.2137804 ], [ -126.2691808, 54.2138274 ], [ -126.2692087, 54.2138915 ], [ -126.269281100000015, 54.213947 ], [ -126.269373800000011, 54.2139399 ], [ -126.2694843, 54.2138972 ], [ -126.269601899999984, 54.2137206 ], [ -126.2697778, 54.2136251 ], [ -126.270062399999986, 54.2135055 ], [ -126.27029490000001, 54.21347560000001 ], [ -126.270512700000012, 54.2134257 ], [ -126.270606099999981, 54.213383 ], [ -126.2708043, 54.2131993 ], [ -126.2709142, 54.2131381 ], [ -126.2710406, 54.2131053 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093300, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 14827.256481853499, "blue_line_key": 360846413, "length_metre": 959.26175760480805, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2809111, 54.401333099999988 ], [ -126.2808283, 54.4011607 ], [ -126.2807213, 54.4009329 ], [ -126.280678099999989, 54.4008688 ], [ -126.28059780000001, 54.4006965 ], [ -126.280500800000013, 54.4005227 ], [ -126.2804056, 54.4003233 ], [ -126.280294, 54.4001496 ], [ -126.2802704, 54.4000513 ], [ -126.28024259999998, 54.4000057 ], [ -126.280204700000013, 54.399879 ], [ -126.280194, 54.3998063 ], [ -126.280131200000014, 54.3995984 ], [ -126.2800656, 54.3994261 ], [ -126.2800088, 54.399352 ], [ -126.2798462, 54.3992594 ], [ -126.279605600000011, 54.3991726 ], [ -126.279394599999989, 54.3990786 ], [ -126.2790662, 54.3989361 ], [ -126.2789748, 54.3988977 ], [ -126.2788374, 54.3988849 ], [ -126.2786719, 54.3988279 ], [ -126.2784019, 54.398714 ], [ -126.278284, 54.3986399 ], [ -126.2779272, 54.3984334 ], [ -126.2778871, 54.3983608 ], [ -126.2778797, 54.3982169 ], [ -126.2778311, 54.3980175 ], [ -126.277791, 54.3979449 ], [ -126.2776454, 54.3978252 ], [ -126.277541, 54.3977683 ], [ -126.277403099999987, 54.3977569 ], [ -126.2772929, 54.3977711 ], [ -126.2771835, 54.3978238 ], [ -126.2769932, 54.397890800000013 ], [ -126.2768689, 54.3978965 ], [ -126.2767311, 54.3978851 ], [ -126.276394499999981, 54.397840900000013 ], [ -126.276028700000012, 54.3977968 ], [ -126.2757665, 54.3977911 ], [ -126.2755203, 54.3977953 ], [ -126.2753807, 54.3978096 ], [ -126.2750367, 54.3978822 ], [ -126.2747876, 54.3979221 ], [ -126.2746479, 54.3979363 ], [ -126.2743075, 54.3979648 ], [ -126.2741207, 54.3979876 ], [ -126.27397830000001, 54.3980303 ], [ -126.2737693, 54.398177 ], [ -126.2736885, 54.3982112 ], [ -126.2733039, 54.3982126 ], [ -126.273167199999989, 54.3981913 ], [ -126.272819, 54.3981115 ], [ -126.272527799999978, 54.3980773 ], [ -126.2722044, 54.398078800000015 ], [ -126.2718804, 54.3980816 ], [ -126.271617, 54.398093 ], [ -126.2714474, 54.3981158 ], [ -126.271273599999986, 54.3981571 ], [ -126.271131700000012, 54.3981984 ], [ -126.2707536, 54.3983252 ], [ -126.270597599999988, 54.3983579 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17105159, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 8184.8312564243397, "blue_line_key": 360882583, "length_metre": 108.003750813652, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.9654029, 54.202937899999988 ], [ -125.965372, 54.2029293 ], [ -125.9653092, 54.2028951 ], [ -125.965127, 54.20271 ], [ -125.965109700000014, 54.2026844 ], [ -125.964989, 54.2024978 ], [ -125.964955899999978, 54.2024622 ], [ -125.964834599999989, 54.202277 ], [ -125.9648027, 54.2022514 ], [ -125.9647519, 54.2021716 ], [ -125.964748599999979, 54.2021346 ], [ -125.9647129, 54.2020734 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17107129, "stream_order": 4, "gnis_name": "Buck Creek", "downstream_route_measure": 66188.732253606693, "blue_line_key": 360886221, "length_metre": 81.450064511384198, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.330836599999984, 54.1669025 ], [ -126.330732499999982, 54.166874 ], [ -126.3306426, 54.166827 ], [ -126.330288700000011, 54.1666291 ], [ -126.3300642, 54.1665436 ], [ -126.329972399999988, 54.1665151 ], [ -126.3298214, 54.1665023 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091593, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 0.0, "blue_line_key": 360841027, "length_metre": 1082.97419132508, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.094827099999989, 54.4181758 ], [ -126.0944768, 54.4205015 ], [ -126.081936399999975, 54.4216808 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17079967, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 225685.47820079801, "blue_line_key": 360873822, "length_metre": 109.07451982995001, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.283771699999988, 54.4954121 ], [ -126.2834895, 54.4955232 ], [ -126.2832196, 54.4960359 ], [ -126.282846299999989, 54.4961484 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17073408, "stream_order": 4, "gnis_name": "Cesford Creek", "downstream_route_measure": 5216.8648342751903, "blue_line_key": 360765936, "length_metre": 95.743140920362194, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.254346399999989, 54.529368100000013 ], [ -126.2542531, 54.5293752 ], [ -126.253943599999985, 54.5294037 ], [ -126.2535828, 54.5294592 ], [ -126.2533133, 54.5295689 ], [ -126.253040399999989, 54.5297156 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17098227, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 18468.548470039801, "blue_line_key": 360881038, "length_metre": 81.355994313488196, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.097165899999979, 54.3110032 ], [ -126.096741099999974, 54.3103175 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17096537, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 12325.647040841901, "blue_line_key": 360881038, "length_metre": 35.9721087804582, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1480429, 54.3360758 ], [ -126.1480123, 54.3360658 ], [ -126.1477684, 54.3360245 ], [ -126.1475096, 54.3359904 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093306, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1201.8502015127799, "blue_line_key": 360802599, "length_metre": 16.9999840055393, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.507676300000014, 54.3969593 ], [ -126.507583, 54.3970021 ], [ -126.507485699999989, 54.3970633 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093925, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 17299.545339231099, "blue_line_key": 360846413, "length_metre": 393.464284225553, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.269097500000015, 54.3906291 ], [ -126.2751593, 54.3908491 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17055852, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 18656.081372278899, "blue_line_key": 360856488, "length_metre": 139.48380140050401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5076057, 54.621617 ], [ -126.507793600000014, 54.6215571 ], [ -126.5078876, 54.6215415 ], [ -126.5080588, 54.6215443 ], [ -126.5084297, 54.6215529 ], [ -126.508490699999982, 54.6215899 ], [ -126.5085449, 54.6216896 ], [ -126.508697, 54.6217551 ], [ -126.5087885, 54.6217751 ], [ -126.5090158, 54.6218434 ], [ -126.5091703, 54.6218733 ], [ -126.5094754, 54.6219517 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17075177, "stream_order": 5, "gnis_name": "Richfield Creek", "downstream_route_measure": 1832.4297127146301, "blue_line_key": 360788426, "length_metre": 2355.70887153893, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3348272, 54.5200124 ], [ -126.3347896, 54.5201193 ], [ -126.3348415, 54.5202645 ], [ -126.334885199999974, 54.5203286 ], [ -126.335117099999977, 54.5205408 ], [ -126.335231799999988, 54.5206961 ], [ -126.335271899999981, 54.5207772 ], [ -126.335281499999979, 54.5208684 ], [ -126.335285899999988, 54.5210649 ], [ -126.3353487, 54.5212558 ], [ -126.3354066, 54.5213284 ], [ -126.335579900000013, 54.5215121 ], [ -126.3356372, 54.521586199999987 ], [ -126.335719399999988, 54.52175 ], [ -126.335815199999985, 54.5219309 ], [ -126.3359023, 54.522032 ], [ -126.336090399999975, 54.5222157 ], [ -126.336235800000011, 54.5223809 ], [ -126.3363642, 54.5225461 ], [ -126.336389, 54.5226358 ], [ -126.336361, 54.5228338 ], [ -126.3363095, 54.5229036 ], [ -126.3362236, 54.5230289 ], [ -126.336173100000011, 54.5230816 ], [ -126.336135, 54.523197 ], [ -126.3362188, 54.5233422 ], [ -126.3363053, 54.5234519 ], [ -126.336433599999978, 54.5236171 ], [ -126.336521, 54.5236826 ], [ -126.33670140000001, 54.5237766 ], [ -126.336897799999988, 54.5238251 ], [ -126.3371868, 54.5239034 ], [ -126.3372627, 54.5239319 ], [ -126.3375597, 54.524127 ], [ -126.3375862, 54.5241911 ], [ -126.3375617, 54.5243164 ], [ -126.337445499999987, 54.5244303 ], [ -126.3370947, 54.5246112 ], [ -126.336748500000013, 54.5247024 ], [ -126.3364353, 54.5247764 ], [ -126.3361385, 54.5248248 ], [ -126.335872199999983, 54.5248633 ], [ -126.335622500000014, 54.5249032 ], [ -126.3354798, 54.524953 ], [ -126.3352302, 54.5249929 ], [ -126.3351342, 54.525035599999988 ], [ -126.3348783, 54.5251838 ], [ -126.3344789, 54.5253632 ], [ -126.33430030000001, 54.5254942 ], [ -126.334055899999981, 54.5256865 ], [ -126.3339896, 54.5257563 ], [ -126.333872599999978, 54.5259072 ], [ -126.333837199999977, 54.525987 ], [ -126.3337437, 54.5262106 ], [ -126.333655599999986, 54.5263701 ], [ -126.3335877, 54.526458399999989 ], [ -126.3334415, 54.5265809 ], [ -126.3332978, 54.5266407 ], [ -126.3329714, 54.5266963 ], [ -126.332766799999987, 54.5267547 ], [ -126.332623599999977, 54.5268059 ], [ -126.3323554, 54.526898499999987 ], [ -126.3321505, 54.5269298 ], [ -126.3318378, 54.5269953 ], [ -126.331631, 54.5270808 ], [ -126.3314698, 54.5271762 ], [ -126.331339899999989, 54.5272802 ], [ -126.331337, 54.5273443 ], [ -126.331174099999984, 54.5274653 ], [ -126.3310872, 54.5276078 ], [ -126.3309345, 54.5278114 ], [ -126.330879400000015, 54.5279538 ], [ -126.330789199999984, 54.528140400000012 ], [ -126.330787300000011, 54.5281945 ], [ -126.330725699999974, 54.5284181 ], [ -126.330718099999984, 54.5285164 ], [ -126.3307215, 54.528722900000012 ], [ -126.330721900000015, 54.5289308 ], [ -126.3307473, 54.529012 ], [ -126.3308148, 54.5291758 ], [ -126.3308779, 54.5294008 ], [ -126.3307481, 54.5294977 ], [ -126.330636499999983, 54.5295219 ], [ -126.33054319999998, 54.529529 ], [ -126.330236500000012, 54.5295219 ], [ -126.3299587, 54.5295162 ], [ -126.3298498, 54.5295048 ], [ -126.329531799999984, 54.529425 ], [ -126.329262899999989, 54.5292755 ], [ -126.329115, 54.529173 ], [ -126.3287582, 54.5289593 ], [ -126.3286862, 54.5288853 ], [ -126.3284983, 54.5286659 ], [ -126.3283498, 54.5285719 ], [ -126.3281318, 54.5285848 ], [ -126.3277954, 54.5287941 ], [ -126.327668, 54.5288354 ], [ -126.327574699999985, 54.5288425 ], [ -126.327282199999985, 54.5288368 ], [ -126.327142699999982, 54.5288425 ], [ -126.327033799999981, 54.5288312 ], [ -126.3267088, 54.5288411 ], [ -126.326593399999979, 54.5289736 ], [ -126.3264885, 54.5291601 ], [ -126.3265251, 54.529314 ], [ -126.3266232, 54.5294606 ], [ -126.326709400000013, 54.5295433 ], [ -126.3268898, 54.5296373 ], [ -126.327148, 54.5297056 ], [ -126.327205600000013, 54.5297512 ], [ -126.327261100000015, 54.5298794 ], [ -126.3272562, 54.529942 ], [ -126.3270911, 54.5300902 ], [ -126.327054100000012, 54.5301884 ], [ -126.326981599999982, 54.5303664 ], [ -126.3269295, 54.5304377 ], [ -126.3268649, 54.5304818 ], [ -126.3266634, 54.5305032 ], [ -126.32638510000001, 54.530506 ], [ -126.3260612, 54.5304989 ], [ -126.325952799999982, 54.530479 ], [ -126.3256469, 54.5304277 ], [ -126.325263699999979, 54.5304006 ], [ -126.325077599999986, 54.530406299999989 ], [ -126.3247979, 54.5303992 ], [ -126.3245195, 54.5304021 ], [ -126.324256199999979, 54.530432 ], [ -126.3241586, 54.5304932 ], [ -126.3240426, 54.5306342 ], [ -126.3239406, 54.5307496 ], [ -126.323839400000011, 54.5308906 ], [ -126.323789, 54.5309433 ], [ -126.3235748, 54.531154 ], [ -126.32349, 54.5312694 ], [ -126.3231522, 54.5314688 ], [ -126.322973, 54.5316084 ], [ -126.3227812, 54.5317209 ], [ -126.3224762, 54.5318761 ], [ -126.3224228, 54.5319929 ], [ -126.3223178, 54.5321795 ], [ -126.3222275, 54.532366 ], [ -126.322186599999981, 54.532517 ], [ -126.3221348, 54.5326153 ], [ -126.3220924, 54.5326733 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17095428, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 6906.0354354843303, "blue_line_key": 360886221, "length_metre": 538.56850978956004, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6217139, 54.3603842 ], [ -126.6204677, 54.3603272 ], [ -126.6197791, 54.3601506 ], [ -126.619451399999988, 54.3599698 ], [ -126.6192632, 54.3595439 ], [ -126.6190426, 54.3593574 ], [ -126.618779600000011, 54.3592149 ], [ -126.6179096, 54.3589144 ], [ -126.6174694, 54.3586638 ], [ -126.617402, 54.3585142 ], [ -126.617433100000014, 54.3583419 ], [ -126.6182155, 54.3577409 ], [ -126.618346, 54.3572495 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17103921, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 32293.966161640401, "blue_line_key": 360881038, "length_metre": 189.73313604407201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0585141, 54.2222345 ], [ -126.058454, 54.222206 ], [ -126.058411600000014, 54.222169 ], [ -126.0583636, 54.2219881 ], [ -126.058269599999988, 54.2217802 ], [ -126.0582761, 54.2217161 ], [ -126.0582576, 54.2215281 ], [ -126.0582846, 54.2213486 ], [ -126.058247, 54.221239 ], [ -126.058161899999988, 54.2211393 ], [ -126.057992, 54.2209456 ], [ -126.058005099999988, 54.2207576 ], [ -126.0580377, 54.220722 ], [ -126.0581031, 54.2206963 ], [ -126.0581664, 54.2206436 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17077004, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 8445.9866538779406, "blue_line_key": 360869846, "length_metre": 144.96353936394399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5831644, 54.509375 ], [ -126.5831587, 54.5094833 ], [ -126.5831455, 54.5096983 ], [ -126.583095899999989, 54.5097425 ], [ -126.5829226, 54.5098108 ], [ -126.582689, 54.509833600000015 ], [ -126.5826114, 54.5098593 ], [ -126.5825784, 54.509912 ], [ -126.5825744, 54.5099661 ], [ -126.582615499999989, 54.5100387 ], [ -126.5829012, 54.5101697 ], [ -126.5830816, 54.5102723 ], [ -126.583123199999989, 54.5103364 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17073613, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 2132.6811083624798, "blue_line_key": 360881632, "length_metre": 123.124975120115, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6543546, 54.5279567 ], [ -126.6543305, 54.5278484 ], [ -126.65432749999998, 54.5276505 ], [ -126.6543338, 54.5275252 ], [ -126.654374499999989, 54.5273642 ], [ -126.6543857, 54.5271748 ], [ -126.65442, 54.5271036 ], [ -126.65455, 54.5269896 ], [ -126.6546324, 54.5268928 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17100246, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 22755.110679337799, "blue_line_key": 360881038, "length_metre": 104.054887962979, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0800564, 54.2741711 ], [ -126.0799535, 54.2741056 ], [ -126.079746699999987, 54.2739575 ], [ -126.0797035, 54.273929 ], [ -126.079588, 54.2738179 ], [ -126.079415499999982, 54.2736427 ], [ -126.0794041, 54.2736071 ], [ -126.079371, 54.27341770000001 ], [ -126.079404900000014, 54.273365 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17096655, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 13658.104105107501, "blue_line_key": 360886524, "length_metre": 442.07323217314899, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2717868, 54.3372579 ], [ -126.2717616, 54.3371853 ], [ -126.2717199, 54.3371383 ], [ -126.2716323, 54.3370557 ], [ -126.2714413, 54.3369346 ], [ -126.2712991, 54.3367523 ], [ -126.271240299999988, 54.3367053 ], [ -126.2711045, 54.3366754 ], [ -126.2708744, 54.3366426 ], [ -126.270678, 54.3366113 ], [ -126.2704798, 54.3365714 ], [ -126.2703281, 54.3365316 ], [ -126.270091099999988, 54.336409100000012 ], [ -126.270031800000012, 54.3363635 ], [ -126.2699783, 54.3362268 ], [ -126.2699697, 54.3361556 ], [ -126.2701228, 54.3359334 ], [ -126.2701423, 54.3358451 ], [ -126.2701165, 54.335781 ], [ -126.270028299999979, 54.3357069 ], [ -126.2698403, 54.3355503 ], [ -126.2697269, 54.3353765 ], [ -126.2696271, 54.3352669 ], [ -126.269437199999985, 54.3351358 ], [ -126.2693796, 54.3350717 ], [ -126.2693281, 54.3349094 ], [ -126.2693529, 54.3347655 ], [ -126.2694096, 54.3346146 ], [ -126.269391500000012, 54.3344066 ], [ -126.26934989999998, 54.3343525 ], [ -126.2691789, 54.3341417 ], [ -126.2690448, 54.3340662 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17104535, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 21705.5615123598, "blue_line_key": 360877225, "length_metre": 754.32504502740903, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2592584, 54.212406 ], [ -126.25936560000001, 54.2124259 ], [ -126.259450699999988, 54.2125271 ], [ -126.259683599999988, 54.2127037 ], [ -126.259843499999988, 54.2128603 ], [ -126.260022499999977, 54.2129173 ], [ -126.2601991, 54.2130213 ], [ -126.2603354, 54.2130683 ], [ -126.260632, 54.2132107 ], [ -126.26079439999998, 54.2133132 ], [ -126.2609417, 54.2133973 ], [ -126.2612838, 54.2135753 ], [ -126.261417200000011, 54.2136237 ], [ -126.2617327, 54.2137206 ], [ -126.2618388, 54.2137505 ], [ -126.2621245, 54.2138288 ], [ -126.262412699999985, 54.2139071 ], [ -126.262641300000013, 54.2139214 ], [ -126.262885299999979, 54.2139271 ], [ -126.26313420000001, 54.2138786 ], [ -126.2634283, 54.2138402 ], [ -126.2635699, 54.2137989 ], [ -126.263663299999976, 54.2137832 ], [ -126.264019699999977, 54.2137006 ], [ -126.264251500000015, 54.213679199999987 ], [ -126.2644204, 54.2136835 ], [ -126.264682, 54.2136807 ], [ -126.26499, 54.2136508 ], [ -126.2651298, 54.213628 ], [ -126.2654442, 54.2135269 ], [ -126.2657738, 54.2134172 ], [ -126.265881799999988, 54.2134015 ], [ -126.2659873, 54.2134129 ], [ -126.266153, 54.2134528 ], [ -126.266445699999977, 54.2136664 ], [ -126.266557899999981, 54.2138402 ], [ -126.2667528, 54.2139071 ], [ -126.2670767, 54.2138872 ], [ -126.2673886, 54.2137861 ], [ -126.267609, 54.2137291 ], [ -126.267719500000013, 54.213686400000014 ], [ -126.2680016, 54.2135938 ], [ -126.2681241, 54.2135781 ], [ -126.268246099999985, 54.2135909 ], [ -126.268352, 54.213628 ], [ -126.2683928, 54.2136835 ], [ -126.268399, 54.2138274 ], [ -126.2684826, 54.2139726 ], [ -126.268571, 54.2140111 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17082720, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 228889.47249204101, "blue_line_key": 360873822, "length_metre": 112.937506155855, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.256584100000012, 54.4838019 ], [ -126.2561384, 54.4835797 ], [ -126.2560197, 54.4833618 ], [ -126.2560675, 54.4832066 ], [ -126.256448, 54.4830257 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092219, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 11318.039660120099, "blue_line_key": 360862508, "length_metre": 139.97539032414701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.422047600000013, 54.4111587 ], [ -126.419908400000011, 54.4113396 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092213, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 17569.3730170778, "blue_line_key": 360862508, "length_metre": 63.415023694906701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3478015, 54.4116315 ], [ -126.3480929, 54.4115347 ], [ -126.348441600000015, 54.4115176 ], [ -126.3487072, 54.411445 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17103002, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 9738.5950873178499, "blue_line_key": 360880905, "length_metre": 922.11225249308495, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4542056, 54.2320402 ], [ -126.454191, 54.2320402 ], [ -126.454081899999977, 54.2320387 ], [ -126.453990299999987, 54.2320359 ], [ -126.4538976, 54.232043 ], [ -126.4538184, 54.2320872 ], [ -126.4537069, 54.232147 ], [ -126.453657, 54.2322182 ], [ -126.453576, 54.232288 ], [ -126.453481, 54.2323492 ], [ -126.4533554, 54.2324005 ], [ -126.45321509999998, 54.2324247 ], [ -126.4530889, 54.2324575 ], [ -126.4529803, 54.2324817 ], [ -126.4528713, 54.2325344 ], [ -126.452761, 54.2325771 ], [ -126.4526806, 54.2326383 ], [ -126.4526154, 54.232691 ], [ -126.452566, 54.2327338 ], [ -126.4525314, 54.232796400000012 ], [ -126.4525278, 54.2328676 ], [ -126.4525231, 54.2329488 ], [ -126.452519, 54.2329944 ], [ -126.45256, 54.2330841 ], [ -126.4526035, 54.2331397 ], [ -126.4526627, 54.2331852 ], [ -126.452764199999976, 54.2332693 ], [ -126.4528393, 54.2332977 ], [ -126.452929, 54.2333262 ], [ -126.453035199999988, 54.2333561 ], [ -126.4531256, 54.2333761 ], [ -126.453201799999988, 54.2333946 ], [ -126.4533209, 54.233443 ], [ -126.453424700000014, 54.2335071 ], [ -126.453526199999985, 54.2335911 ], [ -126.453599, 54.2336737 ], [ -126.4536259, 54.2337278 ], [ -126.4536522, 54.2337905 ], [ -126.4536798, 54.2338361 ], [ -126.453692099999984, 54.2338902 ], [ -126.4537039, 54.2339458 ], [ -126.45373020000001, 54.2340084 ], [ -126.453754799999984, 54.2341167 ], [ -126.4537518, 54.234179299999987 ], [ -126.453764099999987, 54.2342334 ], [ -126.453775299999975, 54.2342975 ], [ -126.45377, 54.2343602 ], [ -126.453783, 54.2344328 ], [ -126.4537922, 54.2344955 ], [ -126.4538039, 54.2345582 ], [ -126.453799799999985, 54.2346308 ], [ -126.453811499999986, 54.2346935 ], [ -126.453773899999987, 54.2347917 ], [ -126.453694199999987, 54.234871499999983 ], [ -126.4536295, 54.2349228 ], [ -126.4535785, 54.2349769 ], [ -126.453436400000015, 54.2350538 ], [ -126.453294500000013, 54.2351236 ], [ -126.4531348, 54.235209 ], [ -126.4529935, 54.2352703 ], [ -126.452852600000014, 54.2353301 ], [ -126.4527563, 54.2353814 ], [ -126.4527058, 54.2354611 ], [ -126.4527005, 54.2355238 ], [ -126.4526665, 54.2355779 ], [ -126.4526653, 54.2356221 ], [ -126.452659900000015, 54.2356847 ], [ -126.452673499999989, 54.2357488 ], [ -126.4526535, 54.2358115 ], [ -126.45265, 54.2358827 ], [ -126.452644, 54.2359539 ], [ -126.4526088, 54.2360251 ], [ -126.4525748, 54.2360792 ], [ -126.4525267, 54.2361319 ], [ -126.452428, 54.2362102 ], [ -126.4523171, 54.2362886 ], [ -126.4522672, 54.2363327 ], [ -126.452205100000015, 54.2363769 ], [ -126.4521393, 54.2364381 ], [ -126.4520888, 54.2364908 ], [ -126.4520078, 54.2365877 ], [ -126.4518787, 54.236676 ], [ -126.4517678, 54.2367272 ], [ -126.45168910000001, 54.23677 ], [ -126.4515472, 54.2368397 ], [ -126.4514087, 54.2368454 ], [ -126.4513176, 54.236807 ], [ -126.451229700000013, 54.23676 ], [ -126.45111, 54.236713 ], [ -126.451003299999982, 54.2366845 ], [ -126.450881099999989, 54.2366717 ], [ -126.450789, 54.2366703 ], [ -126.450619499999988, 54.2366945 ], [ -126.4504934, 54.2367543 ], [ -126.450442200000012, 54.2368155 ], [ -126.4504082, 54.2368697 ], [ -126.4503741, 54.2369309 ], [ -126.450371199999978, 54.2369936 ], [ -126.4503817, 54.2370662 ], [ -126.4503946, 54.2371118 ], [ -126.4504973, 54.2371858 ], [ -126.450617, 54.2372328 ], [ -126.450754800000013, 54.2372357 ], [ -126.4509086, 54.2372214 ], [ -126.4510465, 54.2372243 ], [ -126.4511674, 54.2372542 ], [ -126.451256499999985, 54.2372912 ], [ -126.451377400000013, 54.2373482 ], [ -126.4514519, 54.2373852 ], [ -126.4515399, 54.2374322 ], [ -126.451612, 54.2374963 ], [ -126.4516714, 54.2375618 ], [ -126.4517129, 54.2376159 ], [ -126.4517259, 54.2376615 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100330, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 20548.068031975199, "blue_line_key": 360880905, "length_metre": 509.51442157280502, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3750324, 54.2717072 ], [ -126.3750964, 54.2716716 ], [ -126.3751452, 54.2716104 ], [ -126.375255, 54.2716033 ], [ -126.37535960000001, 54.2716246 ], [ -126.3754335, 54.2716973 ], [ -126.3755545, 54.2717272 ], [ -126.3756166, 54.271683 ], [ -126.375610400000014, 54.2715577 ], [ -126.3756885, 54.2715235 ], [ -126.3758881, 54.2715449 ], [ -126.375993899999983, 54.2715833 ], [ -126.376066599999973, 54.2716389 ], [ -126.3761024, 54.2718112 ], [ -126.3760623, 54.2719365 ], [ -126.3760893, 54.2720177 ], [ -126.3761168, 54.2720633 ], [ -126.3761907, 54.2721089 ], [ -126.376267700000014, 54.2720847 ], [ -126.3762877, 54.272022 ], [ -126.3763524, 54.2719778 ], [ -126.3766479, 54.2719223 ], [ -126.3766972, 54.2718596 ], [ -126.3766709, 54.271797 ], [ -126.376595099999989, 54.271777 ], [ -126.3764882, 54.2717827 ], [ -126.3763966, 54.2717457 ], [ -126.376416, 54.2716916 ], [ -126.3764812, 54.2716389 ], [ -126.376668, 54.2715805 ], [ -126.376977, 54.2715691 ], [ -126.377118, 54.2715363 ], [ -126.3771362, 54.2714651 ], [ -126.3772162, 54.2714395 ], [ -126.377323599999983, 54.2714324 ], [ -126.3774299, 54.2714352 ], [ -126.377670599999988, 54.2715121 ], [ -126.3777892, 54.2715962 ], [ -126.3779946, 54.2717443 ], [ -126.3780393, 54.2717898 ], [ -126.3780914, 54.2719166 ], [ -126.3781818, 54.2719636 ], [ -126.378286300000013, 54.271985 ], [ -126.378410800000012, 54.2719778 ], [ -126.3785531, 54.2719009 ], [ -126.3786452, 54.2719024 ], [ -126.3788267, 54.2719607 ], [ -126.3788537, 54.2720149 ], [ -126.378819, 54.2720775 ], [ -126.378739599999989, 54.2721288 ], [ -126.378719599999982, 54.2721915 ], [ -126.378745399999985, 54.2722556 ], [ -126.3788681, 54.272267 ], [ -126.3790983, 54.2722712 ], [ -126.3792223, 54.2722655 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17081616, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 8266.7602361576592, "blue_line_key": 360875052, "length_metre": 60.713954147988403, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.410054, 54.487419 ], [ -126.410798899999975, 54.487087599999988 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17093852, "stream_order": 5, "gnis_name": "Bulkley River", "downstream_route_measure": 263154.51082940202, "blue_line_key": 360873822, "length_metre": 589.21942578157996, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0605933, 54.3920131 ], [ -126.0603458, 54.3920344 ], [ -126.0600083, 54.3920344 ], [ -126.0597737, 54.3920743 ], [ -126.059553099999988, 54.3921227 ], [ -126.05930429999998, 54.3921612 ], [ -126.059055, 54.3922011 ], [ -126.0587916, 54.3922395 ], [ -126.0585403, 54.392278 ], [ -126.0581953, 54.3923862 ], [ -126.058104, 54.3923748 ], [ -126.057924699999987, 54.3922893 ], [ -126.057632500000011, 54.3922922 ], [ -126.0573538, 54.3923121 ], [ -126.0571038, 54.3923606 ], [ -126.0567807, 54.39255 ], [ -126.0565466, 54.3925884 ], [ -126.0565826, 54.3927252 ], [ -126.0566638, 54.392879 ], [ -126.0566232, 54.3930314 ], [ -126.056479200000012, 54.3930912 ], [ -126.056186900000014, 54.3931011 ], [ -126.0561544, 54.3931368 ], [ -126.056097200000011, 54.3932877 ], [ -126.0559795, 54.3934031 ], [ -126.0557613, 54.3934515 ], [ -126.055600700000014, 54.393537 ], [ -126.0555869, 54.3937164 ], [ -126.0557019, 54.3938446 ], [ -126.055486, 54.3940554 ], [ -126.055484799999988, 54.3940653 ], [ -126.055585099999988, 54.3941935 ], [ -126.055604399999979, 54.3943559 ], [ -126.0555172, 54.3944883 ], [ -126.055326, 54.3945638 ], [ -126.055158299999974, 54.394655 ], [ -126.054991199999975, 54.3947447 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091894, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 16947.8292282041, "blue_line_key": 360862508, "length_metre": 270.70440479251999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3489135, 54.4160065 ], [ -126.3480217, 54.4147121 ], [ -126.3466425, 54.4140612 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104278, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 32532.554564497001, "blue_line_key": 360881038, "length_metre": 732.86559466111203, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.058148800000012, 54.2202477 ], [ -126.05813689999998, 54.2202206 ], [ -126.0581078, 54.2201936 ], [ -126.0580676, 54.220111 ], [ -126.058067799999989, 54.2200839 ], [ -126.058104899999989, 54.220022699999987 ], [ -126.058224700000011, 54.2198361 ], [ -126.05825320000001, 54.2196396 ], [ -126.058241200000012, 54.2196125 ], [ -126.0582026, 54.2194858 ], [ -126.0581444, 54.2194388 ], [ -126.0581324, 54.2194117 ], [ -126.058103899999978, 54.2193832 ], [ -126.0580776, 54.2193291 ], [ -126.0580486, 54.219302 ], [ -126.0580083, 54.2192194 ], [ -126.0580085, 54.2191924 ], [ -126.0579965, 54.2191653 ], [ -126.0579992, 54.2191382 ], [ -126.058015900000015, 54.2191126 ], [ -126.0580521, 54.2190143 ], [ -126.0581897, 54.2188192 ], [ -126.0581501, 54.2187281 ], [ -126.0581077, 54.218691 ], [ -126.05809330000001, 54.218664 ], [ -126.0580509, 54.218627 ], [ -126.0580034, 54.218617 ], [ -126.0579591, 54.2185985 ], [ -126.057869, 54.2185785 ], [ -126.057655, 54.2185643 ], [ -126.057328200000015, 54.2186184 ], [ -126.057076099999989, 54.218721 ], [ -126.056791499999989, 54.2188392 ], [ -126.0566827, 54.2188634 ], [ -126.056636900000015, 54.218862 ], [ -126.056592599999988, 54.218843400000011 ], [ -126.056563599999976, 54.2188164 ], [ -126.056623699999989, 54.2186198 ], [ -126.056758800000011, 54.2184247 ], [ -126.0567677, 54.2183079 ], [ -126.0567414, 54.2182538 ], [ -126.056698200000014, 54.2182253 ], [ -126.056653200000014, 54.2182154 ], [ -126.0565396, 54.2180872 ], [ -126.0565425, 54.2180331 ], [ -126.0565556, 54.2178451 ], [ -126.056604599999986, 54.217818 ], [ -126.0566366, 54.2177838 ], [ -126.056694799999988, 54.2176058 ], [ -126.0566834, 54.2175773 ], [ -126.0563829, 54.2174805 ], [ -126.0563381, 54.2174434 ], [ -126.0563421, 54.2173993 ], [ -126.0563594, 54.2173722 ], [ -126.056455700000015, 54.2173024 ], [ -126.056577499999989, 54.2171173 ], [ -126.056592599999988, 54.2169108 ], [ -126.056609799999976, 54.2168837 ], [ -126.056592599999988, 54.2166858 ], [ -126.0565449, 54.2164778 ], [ -126.0565621, 54.2164508 ], [ -126.0565655, 54.2164152 ], [ -126.056647199999986, 54.2163454 ], [ -126.056710200000012, 54.2163197 ], [ -126.057053599999989, 54.2162471 ], [ -126.0571784, 54.216205800000012 ], [ -126.0572911, 54.2161446 ], [ -126.057352899999984, 54.2161289 ], [ -126.05743720000001, 54.216032 ], [ -126.0574427, 54.2159509 ], [ -126.0573596, 54.2158327 ], [ -126.0573098, 54.2156504 ], [ -126.0573692, 54.2154823 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17089068, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 240185.33125337999, "blue_line_key": 360873822, "length_metre": 387.306282895641, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2086112, 54.441632500000011 ], [ -126.2085686, 54.4415599 ], [ -126.208574500000012, 54.441488699999987 ], [ -126.208609099999975, 54.441426 ], [ -126.2088166, 54.441332 ], [ -126.2091042, 54.4411853 ], [ -126.2091685, 54.4411426 ], [ -126.2091884, 54.4410799 ], [ -126.209166400000015, 54.4409361 ], [ -126.209081200000014, 54.440825 ], [ -126.2090063, 54.440788 ], [ -126.2089149, 54.4407766 ], [ -126.2086543, 54.4407794 ], [ -126.208542799999975, 54.4408036 ], [ -126.2082297, 54.4408777 ], [ -126.2080712, 54.4409375 ], [ -126.2079774, 54.4409532 ], [ -126.2076844, 54.4409646 ], [ -126.207472, 54.4409147 ], [ -126.207306, 54.4408378 ], [ -126.2071852, 54.4408264 ], [ -126.206843799999973, 54.4408634 ], [ -126.206732300000013, 54.4408876 ], [ -126.2064169, 54.4409888 ], [ -126.206155700000011, 54.4410002 ], [ -126.2060471, 54.4409888 ], [ -126.2058235, 54.4408677 ], [ -126.205723, 54.4407652 ], [ -126.205671, 54.4406299 ], [ -126.205658500000013, 54.4405757 ], [ -126.2056945, 54.440523 ], [ -126.2057876, 54.4404889 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17096307, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 9188.7768819304401, "blue_line_key": 360886221, "length_metre": 843.09845676514601, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6128467, 54.3459912 ], [ -126.6128219, 54.3459014 ], [ -126.6127855, 54.3457476 ], [ -126.612627300000014, 54.3455368 ], [ -126.6124374, 54.3453816 ], [ -126.612256899999977, 54.3452691 ], [ -126.612247200000013, 54.3452064 ], [ -126.61228650000001, 54.3450455 ], [ -126.612618900000015, 54.3448988 ], [ -126.612717499999988, 54.3447848 ], [ -126.612790499999988, 54.3445698 ], [ -126.612797799999981, 54.3444445 ], [ -126.612717600000011, 54.344262199999989 ], [ -126.612642900000012, 54.3441895 ], [ -126.6124856, 54.3439973 ], [ -126.6124258, 54.3439517 ], [ -126.612147, 54.3437295 ], [ -126.6120895, 54.3436569 ], [ -126.6120362, 54.3435301 ], [ -126.6120386, 54.3434675 ], [ -126.612095599999989, 54.343298 ], [ -126.61213140000001, 54.3432168 ], [ -126.6122487, 54.3430217 ], [ -126.6123691, 54.342818 ], [ -126.612377400000014, 54.3426827 ], [ -126.6124342, 54.3424862 ], [ -126.6124319, 54.3422697 ], [ -126.6124433, 54.3420632 ], [ -126.612486499999989, 54.3418496 ], [ -126.612482899999989, 54.3416786 ], [ -126.612493699999987, 54.3414807 ], [ -126.6124915, 54.3412642 ], [ -126.6125947, 54.3410605 ], [ -126.6126612, 54.3409893 ], [ -126.6128709, 54.3407956 ], [ -126.6130205, 54.340592 ], [ -126.6132136, 54.3404524 ], [ -126.6133155, 54.3403014 ], [ -126.6133233, 54.3401747 ], [ -126.6133184, 54.3399867 ], [ -126.613259700000015, 54.3399311 ], [ -126.6130413, 54.3397389 ], [ -126.612997899999982, 54.3396748 ], [ -126.6129161, 54.339511 ], [ -126.6128185, 54.3393016 ], [ -126.612824, 54.3392304 ], [ -126.612834, 54.3390695 ], [ -126.6128381, 54.3389883 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099978, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 8127.14126962919, "blue_line_key": 360877225, "length_metre": 434.41062924622003, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.19600530000001, 54.2831294 ], [ -126.1959659, 54.2830026 ], [ -126.195908, 54.2829471 ], [ -126.1958958, 54.28292 ], [ -126.1958671, 54.2828916 ], [ -126.1958532, 54.282856 ], [ -126.195824, 54.2828289 ], [ -126.195774299999982, 54.2826566 ], [ -126.1957633, 54.2826195 ], [ -126.19574870000001, 54.2825925 ], [ -126.1957526, 54.2825213 ], [ -126.1957035, 54.2823404 ], [ -126.195640399999988, 54.282158100000011 ], [ -126.1955749, 54.2819687 ], [ -126.195619400000012, 54.2817721 ], [ -126.195684199999988, 54.281728 ], [ -126.1957179, 54.2817023 ], [ -126.196032699999975, 54.2815742 ], [ -126.196114099999988, 54.2815044 ], [ -126.1961479, 54.2814517 ], [ -126.1961516, 54.2814147 ], [ -126.1961682, 54.281389 ], [ -126.1961739, 54.281299300000015 ], [ -126.196161800000013, 54.2812722 ], [ -126.1960834, 54.2810714 ], [ -126.1959549, 54.2809076 ], [ -126.1958136, 54.2807325 ], [ -126.1956411, 54.2805487 ], [ -126.1955973, 54.2805217 ], [ -126.1954235, 54.280355 ], [ -126.1952219, 54.2801713 ], [ -126.195065199999988, 54.2800047 ], [ -126.195051299999975, 54.2799691 ], [ -126.1950221, 54.279942 ], [ -126.1950151, 54.2798067 ], [ -126.1950137, 54.2796088 ], [ -126.195030800000012, 54.2795817 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17105980, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 9983.6894884078793, "blue_line_key": 360882583, "length_metre": 91.412396956920304, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.9576712, 54.1898109 ], [ -125.9578523, 54.1897625 ], [ -125.9579339, 54.1896343 ], [ -125.9581139, 54.1893595 ], [ -125.9581339, 54.1892071 ], [ -125.958094500000016, 54.1890903 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17085356, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 198674.48726761699, "blue_line_key": 360873822, "length_metre": 432.36295859062699, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5040504, 54.467913400000015 ], [ -126.5036412, 54.4678081 ], [ -126.5024943, 54.4678152 ], [ -126.501816, 54.4679889 ], [ -126.5010061, 54.4682795 ], [ -126.500473899999989, 54.4683507 ], [ -126.4992693, 54.4682353 ], [ -126.4983691, 54.4682026 ], [ -126.4976426, 54.4682339 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17104503, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 22920.9798499645, "blue_line_key": 360877225, "length_metre": 161.16619693194099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.273563599999989, 54.2134414 ], [ -126.2737198, 54.2134001 ], [ -126.2737706, 54.2133474 ], [ -126.2739352, 54.2131623 ], [ -126.2739872, 54.2130725 ], [ -126.274161399999983, 54.2129686 ], [ -126.2742718, 54.2129529 ], [ -126.2745646, 54.2129244 ], [ -126.274919, 54.2128874 ], [ -126.2750593, 54.2128632 ], [ -126.2754481, 54.212792 ], [ -126.275555399999973, 54.2127848 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100443, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 9697.1103138558992, "blue_line_key": 360877225, "length_metre": 130.76317967555201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.195596699999982, 54.2717186 ], [ -126.1956304, 54.2716659 ], [ -126.1957824, 54.2714893 ], [ -126.1958001, 54.2714537 ], [ -126.195881, 54.2713654 ], [ -126.1959808, 54.2712786 ], [ -126.1959986, 54.2712429 ], [ -126.19611, 54.2711646 ], [ -126.196142399999985, 54.271129 ], [ -126.1963675, 54.2709994 ], [ -126.1966086, 54.2708527 ], [ -126.1966562, 54.270835600000012 ], [ -126.196737, 54.2707744 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17079429, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 5408.8792927464701, "blue_line_key": 360875052, "length_metre": 180.467714373929, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.375221899999985, 54.4976566 ], [ -126.375328599999989, 54.4976951 ], [ -126.375434899999988, 54.4977065 ], [ -126.375542099999976, 54.4977364 ], [ -126.3758121, 54.4978404 ], [ -126.3759203, 54.4978603 ], [ -126.3762705, 54.4979315 ], [ -126.3766266, 54.4979301 ], [ -126.37689, 54.4979272 ], [ -126.377260799999988, 54.4979258 ], [ -126.377491, 54.497913 ], [ -126.3776014, 54.4979059 ], [ -126.3778959, 54.4978774 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100662, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 2340.5632800936301, "blue_line_key": 360874778, "length_metre": 134.52632438228699, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3408767, 54.267775 ], [ -126.34091020000001, 54.2677223 ], [ -126.3409749, 54.2676782 ], [ -126.341085400000011, 54.2676625 ], [ -126.3412863, 54.2676397 ], [ -126.341623899999988, 54.2676297 ], [ -126.3417014, 54.2676041 ], [ -126.3417551, 54.2674887 ], [ -126.341680599999989, 54.2674517 ], [ -126.3415427, 54.2674489 ], [ -126.3412019, 54.2674944 ], [ -126.341016399999987, 54.2675357 ], [ -126.3408777, 54.267541400000013 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093547, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 299.046570999734, "blue_line_key": 360802599, "length_metre": 189.54098860828501, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.520300799999987, 54.3940468 ], [ -126.5200683, 54.3940682 ], [ -126.519728, 54.3940967 ], [ -126.51941690000001, 54.3941536 ], [ -126.5191046, 54.3942277 ], [ -126.519009399999987, 54.3942619 ], [ -126.518896899999987, 54.3943317 ], [ -126.5188025, 54.3943844 ], [ -126.5184231, 54.3945382 ], [ -126.518345, 54.3945724 ], [ -126.5179977, 54.3946906 ], [ -126.517794799999976, 54.3947319 ], [ -126.517701199999976, 54.3947475 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17087928, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 278115.05990728602, "blue_line_key": 360873822, "length_metre": 152.82195319416999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1421822, 54.4499328 ], [ -126.142196899999973, 54.4501578 ], [ -126.1422117, 54.4503829 ], [ -126.1424134, 54.4505851 ], [ -126.142617, 54.4507617 ], [ -126.1426872, 54.4508528 ], [ -126.1427675, 54.4510522 ], [ -126.142833599999989, 54.451216 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17073668, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 2255.8060834825901, "blue_line_key": 360881632, "length_metre": 40.907817121144902, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6546324, 54.5268928 ], [ -126.654734, 54.5267689 ], [ -126.6548022, 54.526635 ], [ -126.654808499999973, 54.526545299999988 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17106420, "stream_order": 4, "gnis_name": "Buck Creek", "downstream_route_measure": 60433.598062391997, "blue_line_key": 360886221, "length_metre": 67.266389858263494, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4095072, 54.1812628 ], [ -126.4085109, 54.1811033 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17088555, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 239015.83264668399, "blue_line_key": 360873822, "length_metre": 56.658449035564203, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.210209600000013, 54.4453469 ], [ -126.210119299999988, 54.4452913 ], [ -126.210093199999989, 54.4452272 ], [ -126.2100741, 54.4450478 ], [ -126.2101106, 54.4449936 ], [ -126.210176, 54.4449409 ], [ -126.21025490000001, 54.4448982 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17095254, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 6804.83508889313, "blue_line_key": 360886221, "length_metre": 59.021776580157898, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.623132399999989, 54.3606819 ], [ -126.6226977, 54.3604853 ], [ -126.622363, 54.360409 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17078881, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 204248.08652063299, "blue_line_key": 360873822, "length_metre": 970.44602152979598, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.477542599999978, 54.4997531 ], [ -126.4768985, 54.500347 ], [ -126.4765104, 54.5005663 ], [ -126.4757492, 54.5008568 ], [ -126.475511699999984, 54.5010662 ], [ -126.475272499999988, 54.5015333 ], [ -126.4752204, 54.5021386 ], [ -126.4748769, 54.5027638 ], [ -126.4743404, 54.5036326 ], [ -126.4736159, 54.5044287 ], [ -126.473408799999987, 54.504537 ], [ -126.473026800000014, 54.5045071 ], [ -126.4728652, 54.5042536 ], [ -126.472563600000015, 54.5040214 ], [ -126.4722432, 54.5041311 ], [ -126.471971599999989, 54.5042977 ], [ -126.4718607, 54.5045099 ], [ -126.4716039, 54.5047606 ], [ -126.4715333, 54.5049415 ], [ -126.47156, 54.505195 ], [ -126.4714311, 54.5053887 ], [ -126.4711957, 54.505571 ], [ -126.470432699999989, 54.5059014 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17084825, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 4591.9427311695199, "blue_line_key": 360846413, "length_metre": 181.01432059012399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3153435, 54.471699 ], [ -126.3154975, 54.4716933 ], [ -126.3156015, 54.4717318 ], [ -126.31578970000001, 54.471934 ], [ -126.3159097, 54.4719895 ], [ -126.3160637, 54.4719838 ], [ -126.3162732, 54.4718628 ], [ -126.316368199999985, 54.47183 ], [ -126.3164777, 54.4718044 ], [ -126.316601699999978, 54.4718072 ], [ -126.3167382, 54.4718371 ], [ -126.3168738, 54.4719041 ], [ -126.31715819999998, 54.4720351 ], [ -126.3172882, 54.4721733 ], [ -126.317404400000015, 54.4722744 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17083094, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1756.4836611608, "blue_line_key": 360875052, "length_metre": 186.686679947534, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3393989, 54.4808524 ], [ -126.3393337, 54.4809051 ], [ -126.339223, 54.4809478 ], [ -126.3389594, 54.4809863 ], [ -126.3388035, 54.4809834 ], [ -126.338662, 54.4810162 ], [ -126.3385685, 54.4810589 ], [ -126.3384408, 54.4811287 ], [ -126.3381495, 54.481301 ], [ -126.3378629, 54.4814392 ], [ -126.33775, 54.4815089 ], [ -126.3377128, 54.4816072 ], [ -126.3377092, 54.481687 ], [ -126.3377197, 54.4817682 ], [ -126.3377872, 54.4818963 ], [ -126.337875399999987, 54.4819519 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17065977, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 5913.8494414614197, "blue_line_key": 360851751, "length_metre": 404.86669878469098, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.15855569999998, 54.5687826 ], [ -126.1565965, 54.5722285 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17107386, "stream_order": 4, "gnis_name": "Buck Creek", "downstream_route_measure": 67824.769141785306, "blue_line_key": 360886221, "length_metre": 87.279689651198794, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.317396300000013, 54.160787 ], [ -126.317339300000015, 54.1607229 ], [ -126.317268200000015, 54.1606574 ], [ -126.3170287, 54.1605534 ], [ -126.316936799999979, 54.160552 ], [ -126.3167979, 54.1605662 ], [ -126.316686800000014, 54.1606175 ], [ -126.3166543, 54.1606801 ], [ -126.316590799999986, 54.1607143 ], [ -126.3164818, 54.1607129 ], [ -126.316393, 54.160683 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17054339, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 23111.102595259599, "blue_line_key": 360856488, "length_metre": 332.58656659800198, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5459363, 54.634029 ], [ -126.544052899999983, 54.6312546 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17064622, "stream_order": 5, "gnis_name": "Richfield Creek", "downstream_route_measure": 12477.0912797648, "blue_line_key": 360788426, "length_metre": 474.38469037280697, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2712196, 54.5760337 ], [ -126.270957900000013, 54.5760095 ], [ -126.270725899999974, 54.57601240000001 ], [ -126.2706, 54.576028 ], [ -126.2704848, 54.5761249 ], [ -126.270378699999981, 54.576328499999988 ], [ -126.2702406, 54.5765322 ], [ -126.2701754, 54.5765849 ], [ -126.269932399999988, 54.5767586 ], [ -126.2697226, 54.5768797 ], [ -126.2693698, 54.5770791 ], [ -126.2692632, 54.5772842 ], [ -126.269198499999987, 54.5773354 ], [ -126.2690704, 54.5773782 ], [ -126.2688237, 54.577381 ], [ -126.2685729, 54.5774024 ], [ -126.2683412, 54.5774252 ], [ -126.268246099999985, 54.5774579 ], [ -126.2681132, 54.5775633 ], [ -126.2680646, 54.5776246 ], [ -126.2678793, 54.5778368 ], [ -126.26773270000001, 54.5779322 ], [ -126.267542799999987, 54.5780176 ], [ -126.267416399999988, 54.5780419 ], [ -126.267152400000015, 54.5780447 ], [ -126.2667809, 54.5780461 ], [ -126.2665921, 54.578121599999989 ], [ -126.2665253, 54.5781928 ], [ -126.2664637, 54.5784164 ], [ -126.2663453, 54.578557399999987 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17105621, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 1969.6919644135701, "blue_line_key": 360880905, "length_metre": 195.07879922445801, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.412432599999988, 54.1933273 ], [ -126.412275099999988, 54.1935011 ], [ -126.412076399999975, 54.1936136 ], [ -126.411391699999982, 54.1938044 ], [ -126.411095899999978, 54.1943015 ], [ -126.4106777, 54.1946447 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093376, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 904.54661194037305, "blue_line_key": 360802599, "length_metre": 297.30358957240998, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5120471, 54.3962942 ], [ -126.5116598, 54.3963313 ], [ -126.5115036, 54.396337 ], [ -126.51134780000001, 54.3963697 ], [ -126.5109912, 54.3964167 ], [ -126.510680099999988, 54.3964737 ], [ -126.510365100000016, 54.39658330000001 ], [ -126.5102568, 54.396599 ], [ -126.510149700000014, 54.3965976 ], [ -126.5097939, 54.3966076 ], [ -126.509557500000014, 54.3966745 ], [ -126.5092967, 54.3966788 ], [ -126.508940900000013, 54.3966887 ], [ -126.508629199999987, 54.3967542 ], [ -126.5085209, 54.3967699 ], [ -126.5081643, 54.3968169 ], [ -126.507897199999988, 54.3968739 ], [ -126.5077574, 54.3969166 ], [ -126.507676300000014, 54.3969593 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099627, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 24328.074590916101, "blue_line_key": 360880905, "length_metre": 27.329906817904298, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3992228, 54.2851589 ], [ -126.3994044, 54.2852173 ], [ -126.3995278, 54.2852201 ], [ -126.3996176, 54.2852216 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080311, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 224073.496609097, "blue_line_key": 360873822, "length_metre": 22.160143114679201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.295698300000012, 54.4938084 ], [ -126.295483799999985, 54.4937771 ], [ -126.295362200000014, 54.493774199999983 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17103479, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 30918.8605504972, "blue_line_key": 360881038, "length_metre": 403.04235744111202, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.067460700000012, 54.2297814 ], [ -126.0675145, 54.2296745 ], [ -126.067502499999975, 54.2296475 ], [ -126.0674152, 54.2295734 ], [ -126.067267499999986, 54.2294979 ], [ -126.0671299, 54.229468 ], [ -126.0668602, 54.2293797 ], [ -126.06671870000001, 54.229214499999983 ], [ -126.0666838, 54.2290707 ], [ -126.066639, 54.2290337 ], [ -126.066581199999987, 54.2290052 ], [ -126.06653630000001, 54.2289681 ], [ -126.0664779, 54.2289482 ], [ -126.066433, 54.2289112 ], [ -126.0663939, 54.2288385 ], [ -126.0662249, 54.2288343 ], [ -126.066210500000011, 54.2288072 ], [ -126.0662915, 54.228746 ], [ -126.066325499999977, 54.2286933 ], [ -126.066415299999989, 54.2285152 ], [ -126.0666105, 54.2283486 ], [ -126.066629699999979, 54.228323 ], [ -126.066612799999987, 54.2281236 ], [ -126.0666197, 54.2280253 ], [ -126.066636899999978, 54.2279983 ], [ -126.066637799999981, 54.2279626 ], [ -126.066624800000014, 54.2277462 ], [ -126.0666531, 54.2275496 ], [ -126.0666387, 54.2275226 ], [ -126.0666433, 54.227477 ], [ -126.0665782, 54.2272961 ], [ -126.066389, 54.227148 ], [ -126.066336, 54.2270469 ], [ -126.066338300000012, 54.2269942 ], [ -126.066322, 54.2268133 ], [ -126.066203, 54.2267393 ], [ -126.0661445, 54.2267193 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099675, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 24129.270698226399, "blue_line_key": 360880905, "length_metre": 64.387114155776004, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.397207799999975, 54.2842446 ], [ -126.3973911, 54.2842574 ], [ -126.3975115, 54.2842958 ], [ -126.3976735, 54.2843884 ], [ -126.3977946, 54.2844183 ], [ -126.397869199999988, 54.2844553 ], [ -126.3979127, 54.2845109 ], [ -126.39790739999998, 54.2845735 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17077509, "stream_order": 5, "gnis_name": "Richfield Creek", "downstream_route_measure": 15.479631892393099, "blue_line_key": 360788426, "length_metre": 1632.4491975273099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3440364, 54.5076831 ], [ -126.3437206, 54.5077927 ], [ -126.3434255, 54.5078226 ], [ -126.343331099999986, 54.5078469 ], [ -126.343311500000013, 54.5079095 ], [ -126.3433183, 54.5080363 ], [ -126.3434741, 54.5082556 ], [ -126.343514699999986, 54.5083282 ], [ -126.3436112, 54.5085276 ], [ -126.3436355, 54.5086188 ], [ -126.343612099999987, 54.5087341 ], [ -126.343516099999988, 54.5087769 ], [ -126.3432379, 54.5087797 ], [ -126.3430404, 54.5087484 ], [ -126.3427374, 54.5086615 ], [ -126.3425053, 54.5086658 ], [ -126.342394, 54.508717 ], [ -126.342358300000015, 54.5087697 ], [ -126.342360500000012, 54.5089862 ], [ -126.342348199999989, 54.5091742 ], [ -126.3423138, 54.5092369 ], [ -126.3422544, 54.5094334 ], [ -126.3421859, 54.5095303 ], [ -126.3421164, 54.5096371 ], [ -126.342035899999985, 54.5096983 ], [ -126.3418428, 54.5098009 ], [ -126.3415583, 54.509912 ], [ -126.341492599999981, 54.5099732 ], [ -126.3415043, 54.5100373 ], [ -126.3415703, 54.5101911 ], [ -126.34156729999998, 54.5102623 ], [ -126.3415169, 54.510315 ], [ -126.3412021, 54.5104076 ], [ -126.3411214, 54.5104418 ], [ -126.341026199999988, 54.510503 ], [ -126.340943, 54.5105998 ], [ -126.340838299999973, 54.5107508 ], [ -126.3407518, 54.5108918 ], [ -126.3406209, 54.5110057 ], [ -126.3403804, 54.5111453 ], [ -126.3402994, 54.5112151 ], [ -126.340284900000015, 54.5114302 ], [ -126.3402901, 54.5115826 ], [ -126.340137899999988, 54.5117777 ], [ -126.340090499999988, 54.5118218 ], [ -126.3399328, 54.5118446 ], [ -126.3395719, 54.5119358 ], [ -126.3392921, 54.5119571 ], [ -126.338917, 54.5120468 ], [ -126.338834600000013, 54.5120995 ], [ -126.338769500000012, 54.5121522 ], [ -126.3386042, 54.5123288 ], [ -126.3385357, 54.5124257 ], [ -126.3384351, 54.5125581 ], [ -126.3383936, 54.5127105 ], [ -126.3384043, 54.5127917 ], [ -126.33839420000001, 54.5129526 ], [ -126.338398899999987, 54.5131065 ], [ -126.3384089, 54.5131962 ], [ -126.3384141, 54.5133486 ], [ -126.3383945, 54.5134112 ], [ -126.3382889, 54.5136064 ], [ -126.3382243, 54.5136505 ], [ -126.338146599999988, 54.5136761 ], [ -126.337765499999989, 54.5138385 ], [ -126.33770029999998, 54.5138912 ], [ -126.3376793, 54.5139439 ], [ -126.3377972, 54.514055 ], [ -126.3380384, 54.5141504 ], [ -126.3381213, 54.5142772 ], [ -126.338099199999988, 54.5144025 ], [ -126.338012800000016, 54.5145364 ], [ -126.3379476, 54.514589099999988 ], [ -126.3378657, 54.5146403 ], [ -126.3375161, 54.5148041 ], [ -126.337240799999989, 54.5149864 ], [ -126.337082099999989, 54.5150818 ], [ -126.3369542, 54.5151246 ], [ -126.3368567, 54.51522 ], [ -126.336805200000015, 54.5152826 ], [ -126.3367395, 54.5153439 ], [ -126.336558599999989, 54.515502 ], [ -126.336508200000011, 54.5155547 ], [ -126.3364574, 54.515643 ], [ -126.336288900000014, 54.5158637 ], [ -126.3362518, 54.515962 ], [ -126.336215, 54.5160247 ], [ -126.336236899999989, 54.516178499999981 ], [ -126.336438199999989, 54.5164078 ], [ -126.3364652, 54.5164704 ], [ -126.3365468, 54.5166428 ], [ -126.336627900000011, 54.5168165 ], [ -126.336623, 54.5168792 ], [ -126.3364132, 54.5170358 ], [ -126.3363606, 54.5171156 ], [ -126.3363718, 54.5171882 ], [ -126.3366818, 54.5174019 ], [ -126.336968, 54.5175158 ], [ -126.337270299999986, 54.5176397 ], [ -126.3373278, 54.5176853 ], [ -126.337307599999974, 54.517756500000011 ], [ -126.337225600000011, 54.5178363 ], [ -126.337161399999985, 54.517879 ], [ -126.3370198, 54.5179117 ], [ -126.3367274, 54.517906 ], [ -126.3363859, 54.5179075 ], [ -126.3362626, 54.5179231 ], [ -126.3360874, 54.5179815 ], [ -126.3359109, 54.5180855 ], [ -126.335828299999989, 54.5181738 ], [ -126.335660300000015, 54.518386 ], [ -126.335637899999981, 54.5184843 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080449, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 226480.28151241201, "blue_line_key": 360873822, "length_metre": 97.187316899332401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.277585899999977, 54.4932843 ], [ -126.2772473, 54.4931533 ], [ -126.2770375, 54.4931433 ], [ -126.2766603, 54.4933427 ], [ -126.2762851, 54.4933498 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17055136, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 26282.226104706799, "blue_line_key": 360856488, "length_metre": 23.361307377794802, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5711902, 54.6254684 ], [ -126.5714206, 54.6254761 ], [ -126.5715257, 54.6255221 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17097638, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 16287.743403171, "blue_line_key": 360881038, "length_metre": 1192.4428244917799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.118714, 54.3202913 ], [ -126.118305799999987, 54.3201717 ], [ -126.1182145, 54.3197914 ], [ -126.1180987, 54.3197202 ], [ -126.117381, 54.319545 ], [ -126.116191199999989, 54.3196475 ], [ -126.114852500000012, 54.3201731 ], [ -126.1014277, 54.3193869 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17088156, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 7960.5219773237104, "blue_line_key": 360846413, "length_metre": 680.10606598898698, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.306528, 54.4529279 ], [ -126.3065056, 54.4527841 ], [ -126.3064498, 54.4526929 ], [ -126.306350699999982, 54.4525647 ], [ -126.3062494, 54.4524636 ], [ -126.3060424, 54.4523155 ], [ -126.3060008, 54.45226 ], [ -126.3059654, 54.4520976 ], [ -126.305957600000013, 54.4519538 ], [ -126.3059489, 54.4518541 ], [ -126.305922200000012, 54.4517914 ], [ -126.3058352, 54.4517259 ], [ -126.305556400000015, 54.451503699999989 ], [ -126.305472099999989, 54.4513755 ], [ -126.3060874, 54.4509397 ], [ -126.306181099999989, 54.450924 ], [ -126.306308300000012, 54.4508557 ], [ -126.306455699999987, 54.4507232 ], [ -126.3065558, 54.4506278 ], [ -126.3066061, 54.4505481 ], [ -126.3066325, 54.4503772 ], [ -126.306660599999987, 54.4501806 ], [ -126.3067276, 54.4501094 ], [ -126.306816, 54.4499499 ], [ -126.3069207, 54.4497448 ], [ -126.3070048, 54.4496665 ], [ -126.307070700000011, 54.4496052 ], [ -126.307198299999982, 54.4495354 ], [ -126.307404, 54.44946 ], [ -126.3077393, 54.4492606 ], [ -126.3078539, 54.4491723 ], [ -126.3080816, 54.4490071 ], [ -126.308184, 54.448829 ], [ -126.3081822, 54.448641 ], [ -126.30811150000001, 54.4485228 ], [ -126.308038099999976, 54.4484673 ], [ -126.307696599999986, 54.4482978 ], [ -126.3073946, 54.4481824 ], [ -126.3070184, 54.4480486 ], [ -126.3068568, 54.4479104 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17061561, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 23771.355224390201, "blue_line_key": 360875378, "length_metre": 333.71182969794398, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6907122, 54.5894968 ], [ -126.6926805, 54.5899953 ], [ -126.695609600000012, 54.5904367 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17089577, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 184554.24909507899, "blue_line_key": 360873822, "length_metre": 887.09069449676599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.597226100000015, 54.4348974 ], [ -126.5971848, 54.4351566 ], [ -126.596913500000014, 54.4354714 ], [ -126.595920100000015, 54.4361721 ], [ -126.5956143, 54.4363259 ], [ -126.5953226, 54.43639 ], [ -126.5948371, 54.4363074 ], [ -126.5945081, 54.4360781 ], [ -126.594418599999983, 54.4359271 ], [ -126.594344, 54.4352207 ], [ -126.5941281, 54.4348846 ], [ -126.5940523, 54.4348704 ], [ -126.593663400000011, 54.4348689 ], [ -126.5932518, 54.4349259 ], [ -126.592616, 54.4351552 ], [ -126.5925121, 54.4352919 ], [ -126.592543400000011, 54.4353916 ], [ -126.5930921, 54.4358759 ], [ -126.592912700000014, 54.4360325 ], [ -126.5927101, 54.4361009 ], [ -126.5923113, 54.4361279 ], [ -126.591884, 54.4360681 ], [ -126.5915226, 54.4358616 ], [ -126.5908661, 54.4356024 ], [ -126.5901722, 54.435591 ], [ -126.589439899999988, 54.4357249 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17067028, "stream_order": 4, "gnis_name": "Johnny David Creek", "downstream_route_measure": 7236.0824028871602, "blue_line_key": 360866287, "length_metre": 463.07358746806, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4197797, 54.5626077 ], [ -126.419838399999989, 54.5626718 ], [ -126.420093799999989, 54.5628128 ], [ -126.420430700000011, 54.562847 ], [ -126.4205362, 54.5628755 ], [ -126.420830399999986, 54.5628911 ], [ -126.421073400000012, 54.562941 ], [ -126.4214537, 54.5630478 ], [ -126.4216073, 54.5630791 ], [ -126.421849599999987, 54.5631731 ], [ -126.4220046, 54.5633839 ], [ -126.422063799999989, 54.5634394 ], [ -126.4222306, 54.5634964 ], [ -126.4224462, 54.5635192 ], [ -126.422600499999987, 54.5635135 ], [ -126.422879, 54.5635106 ], [ -126.4231586, 54.5634978 ], [ -126.4233423, 54.5635206 ], [ -126.4234325, 54.563557700000011 ], [ -126.4235247, 54.5635961 ], [ -126.4238983, 54.5637926 ], [ -126.4240468, 54.5638952 ], [ -126.4243123, 54.5640988 ], [ -126.424431899999988, 54.5641644 ], [ -126.4247939, 54.5643239 ], [ -126.4250525, 54.5643922 ], [ -126.4253946, 54.5646158 ], [ -126.4254965, 54.5646899 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17094304, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 697.39010479349599, "blue_line_key": 360886524, "length_metre": 147.99741812658399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.150120699999988, 54.3831915 ], [ -126.150201, 54.3831317 ], [ -126.150297099999989, 54.383089 ], [ -126.150581699999989, 54.382977900000014 ], [ -126.1508004, 54.3829209 ], [ -126.15099020000001, 54.3828625 ], [ -126.151135799999977, 54.3827571 ], [ -126.151237400000014, 54.3826247 ], [ -126.1514548, 54.3825848 ], [ -126.1517488, 54.382583399999987 ], [ -126.151979, 54.382589099999983 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17067356, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 19718.447666595999, "blue_line_key": 360875378, "length_metre": 530.8527633315, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6616272, 54.5598647 ], [ -126.664592499999983, 54.5609941 ], [ -126.667560599999987, 54.563083399999989 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17096495, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 0.0, "blue_line_key": 360760744, "length_metre": 926.27919395938898, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5612237, 54.3404723 ], [ -126.561118899999983, 54.3404439 ], [ -126.560811199999989, 54.3404367 ], [ -126.5604731, 54.3404396 ], [ -126.560133, 54.340441 ], [ -126.559811900000014, 54.3404439 ], [ -126.5594583, 54.3404282 ], [ -126.5592598, 54.3403883 ], [ -126.5589728, 54.3403014 ], [ -126.5587607, 54.3402516 ], [ -126.5585793, 54.3402117 ], [ -126.5583659, 54.3401448 ], [ -126.5581276, 54.3400237 ], [ -126.557993, 54.3399482 ], [ -126.5577389, 54.3398443 ], [ -126.5575736, 54.3397517 ], [ -126.5572905, 54.3396192 ], [ -126.5569471, 54.3394426 ], [ -126.556857799999989, 54.3393771 ], [ -126.5566513, 54.3392561 ], [ -126.556351400000011, 54.339088 ], [ -126.556176099999988, 54.3389684 ], [ -126.5559386, 54.3388103 ], [ -126.5555958, 54.3386323 ], [ -126.5555204, 54.3386038 ], [ -126.5554306, 54.3385397 ], [ -126.55515, 54.3383446 ], [ -126.5550314, 54.3382791 ], [ -126.5546737, 54.338074 ], [ -126.554633299999978, 54.3380013 ], [ -126.5544554, 54.3378546 ], [ -126.554369099999988, 54.3377806 ], [ -126.554132199999984, 54.337614 ], [ -126.553865799999983, 54.3374203 ], [ -126.5537209, 54.3372907 ], [ -126.553708199999988, 54.3372365 ], [ -126.5535059, 54.3370343 ], [ -126.5534167, 54.3369617 ], [ -126.553226799999976, 54.3367865 ], [ -126.5531696, 54.3367409 ], [ -126.5530651, 54.3366839 ], [ -126.5527973, 54.3365358 ], [ -126.5525997, 54.3364589 ], [ -126.5522992, 54.336355 ], [ -126.5522268, 54.3362624 ], [ -126.5522197, 54.336137 ], [ -126.55220150000001, 54.3359391 ], [ -126.5521565, 54.3358935 ], [ -126.55199420000001, 54.3357995 ], [ -126.551887, 54.335771 ], [ -126.5517979, 54.3357326 ], [ -126.5516924, 54.3356856 ], [ -126.551347399999983, 54.3355346 ], [ -126.5510036, 54.3353665 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17088227, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 190450.70803582601, "blue_line_key": 360873822, "length_metre": 576.23858798898004, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.549966099999978, 54.4463253 ], [ -126.5496209, 54.4463808 ], [ -126.5494171, 54.4464734 ], [ -126.5489674, 54.4468494 ], [ -126.548458, 54.4478592 ], [ -126.547835899999981, 54.4484274 ], [ -126.547641, 54.4493432 ], [ -126.5472588, 54.4498274 ], [ -126.5467129, 54.4501422 ], [ -126.5463222, 54.4502718 ], [ -126.5458625, 54.4503188 ], [ -126.5455447, 54.4502746 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17096043, "stream_order": 4, "gnis_name": "Dungate Creek", "downstream_route_measure": 4115.8377140583098, "blue_line_key": 360760898, "length_metre": 1646.1950981462501, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5730565, 54.3574418 ], [ -126.5729369, 54.35735780000001 ], [ -126.572852, 54.357231 ], [ -126.5728302, 54.3570772 ], [ -126.5728746, 54.3568536 ], [ -126.5728673, 54.3567283 ], [ -126.5727833, 54.3565915 ], [ -126.5725478, 54.3564064 ], [ -126.5724791, 54.3562611 ], [ -126.5725498, 54.3561016 ], [ -126.5726829, 54.3559592 ], [ -126.572845199999989, 54.3557826 ], [ -126.5729504, 54.3555875 ], [ -126.5730654, 54.355455 ], [ -126.5731678, 54.3552955 ], [ -126.573188, 54.3552243 ], [ -126.5731763, 54.3551602 ], [ -126.5730753, 54.3550235 ], [ -126.572853599999988, 54.3548754 ], [ -126.572768, 54.3547572 ], [ -126.5727336, 54.3545492 ], [ -126.5727752, 54.3543612 ], [ -126.572723599999975, 54.354216 ], [ -126.572458, 54.3540052 ], [ -126.572190399999982, 54.3538556 ], [ -126.572179800000015, 54.3537745 ], [ -126.5721905, 54.3536121 ], [ -126.57216219999998, 54.3535395 ], [ -126.57203, 54.3534569 ], [ -126.571945500000012, 54.3533287 ], [ -126.5719333, 54.353266 ], [ -126.5719534, 54.3531948 ], [ -126.572023800000011, 54.3530153 ], [ -126.5720362, 54.3528274 ], [ -126.572118300000014, 54.352712 ], [ -126.572391900000014, 54.3525382 ], [ -126.5724101, 54.3524656 ], [ -126.572383299999984, 54.3524029 ], [ -126.5722211, 54.3522733 ], [ -126.571956899999989, 54.3520797 ], [ -126.5719305, 54.3520156 ], [ -126.5719341, 54.3519358 ], [ -126.5719442, 54.351782 ], [ -126.571873299999979, 54.3516638 ], [ -126.571762, 54.351472899999983 ], [ -126.5717661, 54.3513918 ], [ -126.57175860000001, 54.3512394 ], [ -126.571777599999976, 54.351185199999989 ], [ -126.571944, 54.350983 ], [ -126.5721261, 54.3507708 ], [ -126.5720447, 54.3505714 ], [ -126.571917099999979, 54.3504062 ], [ -126.5718903, 54.3503435 ], [ -126.57168, 54.3502396 ], [ -126.5714668, 54.3501997 ], [ -126.5713929, 54.3501527 ], [ -126.5713359, 54.3500715 ], [ -126.571309499999984, 54.3500074 ], [ -126.571274099999982, 54.3498095 ], [ -126.5712991, 54.3496756 ], [ -126.5713486, 54.3496044 ], [ -126.571512200000015, 54.3494449 ], [ -126.571564400000014, 54.349338 ], [ -126.57148140000001, 54.3491572 ], [ -126.5714404, 54.3490931 ], [ -126.571341599999982, 54.3489293 ], [ -126.571268300000014, 54.3488738 ], [ -126.5711054, 54.3487812 ], [ -126.570971199999988, 54.3486971 ], [ -126.5708984, 54.3486331 ], [ -126.570870199999987, 54.3485604 ], [ -126.570864599999979, 54.3484166 ], [ -126.570949700000014, 54.3482927 ], [ -126.571063599999988, 54.3481773 ], [ -126.571114199999982, 54.348089 ], [ -126.5711338, 54.3480263 ], [ -126.5711091, 54.347936599999983 ], [ -126.5709489, 54.3477529 ], [ -126.570789800000014, 54.3476147 ], [ -126.5707771, 54.347560599999987 ], [ -126.570755699999978, 54.3473712 ], [ -126.5707523, 54.3472003 ], [ -126.570724899999988, 54.3471462 ], [ -126.5705659, 54.3469454 ], [ -126.5704059, 54.3467887 ], [ -126.5703025, 54.3467146 ], [ -126.5701249, 54.3466221 ], [ -126.5699758, 54.346511 ], [ -126.569896899999989, 54.3463116 ], [ -126.569720499999988, 54.3461464 ], [ -126.5695962, 54.345937 ], [ -126.5694642, 54.3458259 ], [ -126.5693674, 54.345608 ], [ -126.5692952, 54.3455354 ], [ -126.568969099999975, 54.3453303 ], [ -126.568773299999989, 54.3452548 ], [ -126.568461099999979, 54.3450868 ], [ -126.5683706, 54.3450312 ], [ -126.5680888, 54.3448461 ], [ -126.568033199999988, 54.344782 ], [ -126.5679333, 54.3446353 ], [ -126.5678976, 54.3444729 ], [ -126.5678896, 54.3443291 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17081202, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 226903.61836661899, "blue_line_key": 360873822, "length_metre": 281.51329941492702, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.273538800000011, 54.4909913 ], [ -126.273389599999987, 54.4907692 ], [ -126.273735, 54.4906595 ], [ -126.2747554, 54.4904786 ], [ -126.2751299, 54.4902522 ], [ -126.2755284, 54.4897437 ], [ -126.2754802, 54.4895201 ], [ -126.275113699999977, 54.4892538 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17104504, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 23082.1460468964, "blue_line_key": 360877225, "length_metre": 130.01360537753101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.275555399999973, 54.2127848 ], [ -126.2756614, 54.2128148 ], [ -126.275748400000012, 54.2128703 ], [ -126.2757751, 54.2129244 ], [ -126.275871400000014, 54.2131153 ], [ -126.2759286, 54.2131523 ], [ -126.276020699999975, 54.2131737 ], [ -126.276112799999979, 54.2131751 ], [ -126.27632939999998, 54.2131352 ], [ -126.276591, 54.2131324 ], [ -126.2766855, 54.2131067 ], [ -126.276807, 54.213101 ], [ -126.277129, 54.2130996 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17081787, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 227836.11052273901, "blue_line_key": 360873822, "length_metre": 59.3177404143253, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2688316, 54.486864 ], [ -126.26840270000001, 54.4870363 ], [ -126.268034500000013, 54.4871203 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17094443, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 1204.95944126564, "blue_line_key": 360886524, "length_metre": 142.68758836036301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1541177, 54.3806336 ], [ -126.153967, 54.3805767 ], [ -126.1539296, 54.3804499 ], [ -126.1539259, 54.3802704 ], [ -126.1539834, 54.3801181 ], [ -126.1540532, 54.3799856 ], [ -126.154170099999988, 54.3798717 ], [ -126.154301, 54.3797663 ], [ -126.1544161, 54.3796438 ], [ -126.1545171, 54.3795199 ], [ -126.1545508, 54.3794942 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076498, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 206891.39313300801, "blue_line_key": 360873822, "length_metre": 55.2428713634445, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.453673199999983, 54.5127447 ], [ -126.4534224, 54.5125638 ], [ -126.4530049, 54.5124599 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101717, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 26933.879534635202, "blue_line_key": 360881038, "length_metre": 401.53279811467598, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0708311, 54.2528179 ], [ -126.0710054, 54.2527681 ], [ -126.071065799999985, 54.2527695 ], [ -126.0711097, 54.2527895 ], [ -126.0712713, 54.2529006 ], [ -126.0713317, 54.252902 ], [ -126.071380800000014, 54.2528678 ], [ -126.071420100000012, 54.2527339 ], [ -126.071398899999977, 54.2526257 ], [ -126.0715105, 54.2525473 ], [ -126.0715284, 54.2525117 ], [ -126.071500500000013, 54.2524747 ], [ -126.0714573, 54.2524462 ], [ -126.0714157, 54.2523736 ], [ -126.071433, 54.2523465 ], [ -126.0714667, 54.2523209 ], [ -126.071473, 54.2522041 ], [ -126.071372799999978, 54.2521115 ], [ -126.071349, 54.2520304 ], [ -126.071403499999988, 54.251915 ], [ -126.0713618, 54.2518424 ], [ -126.071302800000012, 54.2518039 ], [ -126.0709721, 54.251688499999986 ], [ -126.0708687, 54.251631599999989 ], [ -126.0708866, 54.251596 ], [ -126.071017199999986, 54.251519099999989 ], [ -126.0710513, 54.2514393 ], [ -126.0710398, 54.2514108 ], [ -126.0708928, 54.2512997 ], [ -126.0708808, 54.2512727 ], [ -126.070808, 54.2511986 ], [ -126.070842500000012, 54.2511644 ], [ -126.070919499999974, 54.2511474 ], [ -126.0709825, 54.2511217 ], [ -126.071031599999984, 54.2510875 ], [ -126.0710675, 54.2510163 ], [ -126.0710549, 54.2509707 ], [ -126.071013099999973, 54.2509252 ], [ -126.0708919, 54.2508768 ], [ -126.070831499999983, 54.2508753 ], [ -126.0706903, 54.2509081 ], [ -126.0706306, 54.2508981 ], [ -126.070602, 54.2508696 ], [ -126.070602899999983, 54.250834 ], [ -126.0705769, 54.2507984 ], [ -126.0705313, 54.2507699 ], [ -126.070455, 54.2507585 ], [ -126.0703939, 54.2507657 ], [ -126.070330899999988, 54.2507913 ], [ -126.070177699999988, 54.250797 ], [ -126.0701167, 54.2507771 ], [ -126.0700742, 54.25074 ], [ -126.070075100000011, 54.2507044 ], [ -126.0701242, 54.2506702 ], [ -126.070251, 54.2506104 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17092918, "stream_order": 5, "gnis_name": "Bulkley River", "downstream_route_measure": 268694.09030384501, "blue_line_key": 360873822, "length_metre": 133.75198057374601, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0754829, 54.4031831 ], [ -126.0754411, 54.4033526 ], [ -126.07537, 54.403495 ], [ -126.0753398, 54.4036731 ], [ -126.07535679999998, 54.4038895 ], [ -126.0754045, 54.4040889 ], [ -126.0752003, 54.4043353 ], [ -126.0751856, 54.4043353 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17104979, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 419.45153857637598, "blue_line_key": 360747189, "length_metre": 714.38911271739903, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.980680400000011, 54.2061381 ], [ -125.980910200000011, 54.2061423 ], [ -125.9809553, 54.2061324 ], [ -125.981001299999988, 54.2061395 ], [ -125.981046400000011, 54.2061295 ], [ -125.9813686, 54.206121 ], [ -125.981690199999989, 54.2061139 ], [ -125.9817363, 54.206121 ], [ -125.982045500000012, 54.2061409 ], [ -125.9824012, 54.2061865 ], [ -125.982728599999987, 54.2062491 ], [ -125.9830375, 54.2062961 ], [ -125.9833796, 54.2063588 ], [ -125.9834422, 54.2063674 ], [ -125.9834719, 54.2063659 ], [ -125.983794499999973, 54.2063759 ], [ -125.9838425, 54.2063845 ], [ -125.9839039, 54.206383 ], [ -125.9839517, 54.2063987 ], [ -125.9839972, 54.2064072 ], [ -125.9840445, 54.2064243 ], [ -125.9841683, 54.2064386 ], [ -125.984473600000015, 54.2064229 ], [ -125.9845775, 54.2063659 ], [ -125.984841100000011, 54.2062064 ], [ -125.9849166, 54.2061865 ], [ -125.984991199999982, 54.2061495 ], [ -125.9850368, 54.2061381 ], [ -125.985080200000013, 54.2061195 ], [ -125.9851253, 54.206109600000012 ], [ -125.9852923, 54.2060597 ], [ -125.985605699999979, 54.2059629 ], [ -125.985652, 54.2059429 ], [ -125.9858611, 54.2058846 ], [ -125.9859523, 54.2058817 ], [ -125.985997399999988, 54.20587170000001 ], [ -125.9861682, 54.2058774 ], [ -125.9862142, 54.2058846 ], [ -125.986261, 54.2058831 ], [ -125.9864006, 54.2059073 ], [ -125.9867366, 54.2059073 ], [ -125.987022599999989, 54.205819 ], [ -125.9872851, 54.2056424 ], [ -125.9874036, 54.2055855 ], [ -125.98769, 54.2055157 ], [ -125.9880551, 54.2054701 ], [ -125.988378399999988, 54.2054715 ], [ -125.988423499999982, 54.2054616 ], [ -125.9884679, 54.2054601 ], [ -125.9885129, 54.2054502 ], [ -125.9888276, 54.2053434 ], [ -125.9891742, 54.2052622 ], [ -125.989220499999988, 54.2052622 ], [ -125.989527, 54.2052365 ], [ -125.9898449, 54.2051739 ], [ -125.9901468, 54.2051212 ], [ -125.9902082, 54.2051198 ], [ -125.990388599999989, 54.2050799 ], [ -125.99072169999998, 54.2050087 ], [ -125.9908587, 54.2049873 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17103177, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 15683.6419562213, "blue_line_key": 360877225, "length_metre": 48.3332487884554, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2002942, 54.2312155 ], [ -126.2002982, 54.2311443 ], [ -126.200318599999989, 54.2310817 ], [ -126.200435700000014, 54.2309407 ], [ -126.2005205, 54.2308082 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17094877, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 4709.0348954708497, "blue_line_key": 360886524, "length_metre": 500.74783751123101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1891716, 54.3716469 ], [ -126.1893859, 54.3716696 ], [ -126.189634399999989, 54.371631199999989 ], [ -126.189897, 54.3716013 ], [ -126.190117399999977, 54.3715529 ], [ -126.1903505, 54.371503 ], [ -126.1905722, 54.3714375 ], [ -126.1907906, 54.3713877 ], [ -126.1910385, 54.3713577 ], [ -126.191218, 54.3714432 ], [ -126.1915273, 54.3716568 ], [ -126.1918016, 54.3716896 ], [ -126.1920955, 54.3716611 ], [ -126.1923073, 54.3717109 ], [ -126.192503300000013, 54.3717779 ], [ -126.1927164, 54.3718377 ], [ -126.192976, 54.3718705 ], [ -126.1932356, 54.3719032 ], [ -126.193495200000015, 54.371936 ], [ -126.1937536, 54.3719787 ], [ -126.1939955, 54.3720471 ], [ -126.1941743, 54.372114 ], [ -126.1942902, 54.3722336 ], [ -126.1944054, 54.3723618 ], [ -126.1945224, 54.372437299999987 ], [ -126.1945984, 54.3724572 ], [ -126.194817499999985, 54.3723988 ], [ -126.1949343, 54.3722849 ], [ -126.1952695, 54.3720941 ], [ -126.195281, 54.3719331 ], [ -126.195329300000012, 54.3718804 ], [ -126.195396500000015, 54.3718092 ], [ -126.195397799999981, 54.3717921 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17060898, "stream_order": 4, "gnis_name": "Richfield Creek", "downstream_route_measure": 18436.7747451746, "blue_line_key": 360788426, "length_metre": 65.282432555993495, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.196057400000015, 54.594866 ], [ -126.1958068, 54.5949145 ], [ -126.1955061, 54.595007 ], [ -126.195203699999979, 54.5951252 ], [ -126.195173099999977, 54.5951423 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17083348, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 200854.31972727401, "blue_line_key": 360873822, "length_metre": 253.17763051143399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.483386700000011, 54.4792501 ], [ -126.4817691, 54.479102 ], [ -126.4811459, 54.4791319 ], [ -126.4809377, 54.479264400000012 ], [ -126.480739199999988, 54.4795236 ], [ -126.4807379, 54.4797444 ], [ -126.4808924, 54.4800036 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17096710, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 12361.6191496224, "blue_line_key": 360881038, "length_metre": 956.38816787441704, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1475096, 54.3359904 ], [ -126.147494900000012, 54.3359904 ], [ -126.147251, 54.3359491 ], [ -126.147009399999988, 54.3359077 ], [ -126.1467489, 54.335865 ], [ -126.1465227, 54.3358152 ], [ -126.1463436, 54.3357297 ], [ -126.146276500000013, 54.3355845 ], [ -126.1462419, 54.3354306 ], [ -126.1461919, 54.3352583 ], [ -126.1461255, 54.3351045 ], [ -126.1460585, 54.3349592 ], [ -126.1459773, 54.3348125 ], [ -126.1459733, 54.3346416 ], [ -126.1458273, 54.334539100000015 ], [ -126.145662300000012, 54.3344551 ], [ -126.1455743, 54.334381 ], [ -126.1455633, 54.3343169 ], [ -126.1456205, 54.3341659 ], [ -126.1457076, 54.3340335 ], [ -126.145793399999988, 54.3338911 ], [ -126.14586580000001, 54.3337586 ], [ -126.145907, 54.3335977 ], [ -126.1458247, 54.333461 ], [ -126.145564099999973, 54.3334453 ], [ -126.145359099999979, 54.333512199999987 ], [ -126.1451975, 54.333607699999988 ], [ -126.145068900000012, 54.333713 ], [ -126.1449519, 54.333827 ], [ -126.1448514, 54.3339495 ], [ -126.144705699999975, 54.3340549 ], [ -126.1445306, 54.3341403 ], [ -126.1443109, 54.3342072 ], [ -126.1440906, 54.3342557 ], [ -126.1438575, 54.3343126 ], [ -126.1436531, 54.334371 ], [ -126.1434341, 54.334429399999983 ], [ -126.1432431, 54.3345049 ], [ -126.1430031, 54.3346345 ], [ -126.142936299999988, 54.334731399999988 ], [ -126.143198399999974, 54.334945 ], [ -126.143217, 54.3351159 ], [ -126.1431159, 54.3352398 ], [ -126.142939, 54.3353438 ], [ -126.142721200000011, 54.3353922 ], [ -126.1424612, 54.335368 ], [ -126.1422668, 54.3352911 ], [ -126.142072399999975, 54.3352142 ], [ -126.1418928, 54.3351301 ], [ -126.1418201, 54.3350746 ], [ -126.141811599999983, 54.3349834 ], [ -126.1418083, 54.334804 ], [ -126.141577500000011, 54.3345647 ], [ -126.141479199999978, 54.3344451 ], [ -126.1413601, 54.3343625 ], [ -126.1410899, 54.3342656 ], [ -126.1408477, 54.3342329 ], [ -126.1406839, 54.3341389 ], [ -126.140741099999985, 54.3339879 ], [ -126.140855, 54.3338825 ], [ -126.1410772, 54.3338156 ], [ -126.1411231, 54.3337899 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17096845, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 14401.9103629815, "blue_line_key": 360886524, "length_metre": 96.0581663923018, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.267432, 54.3317377 ], [ -126.267336899999989, 54.3315468 ], [ -126.2673148, 54.3314115 ], [ -126.267169, 54.3312734 ], [ -126.2668569, 54.3311224 ], [ -126.26670750000001, 54.3310284 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17093513, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 171730.08676958299, "blue_line_key": 360873822, "length_metre": 139.162450752186, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.69467779999998, 54.3936794 ], [ -126.6925296, 54.3936666 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17088903, "stream_order": 4, "gnis_name": "Raspberry Creek", "downstream_route_measure": 16.551462601641301, "blue_line_key": 360817924, "length_metre": 2107.5293061512698, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.583027, 54.4408164 ], [ -126.5831776, 54.4408549 ], [ -126.583504800000014, 54.4410685 ], [ -126.583741, 54.4412622 ], [ -126.584083, 54.4414402 ], [ -126.5842493, 54.4414972 ], [ -126.5845719, 54.4415485 ], [ -126.5847831, 54.441624 ], [ -126.5850588, 54.4416482 ], [ -126.585350699999978, 54.4416539 ], [ -126.5855671, 54.4416581 ], [ -126.585852599999981, 54.4417806 ], [ -126.5860047, 54.4418291 ], [ -126.5862045, 54.4418604 ], [ -126.586435099999989, 54.4418732 ], [ -126.586526299999989, 54.4418575 ], [ -126.586636, 54.441859 ], [ -126.5870053, 54.4418675 ], [ -126.5872972, 54.4418732 ], [ -126.5875263, 54.4419045 ], [ -126.587710199999989, 54.441953 ], [ -126.588034, 54.4419587 ], [ -126.5883828, 54.442047 ], [ -126.5886285, 54.4420797 ], [ -126.5889644, 54.442121 ], [ -126.5893153, 54.4421823 ], [ -126.5896929, 54.4423076 ], [ -126.5898915, 54.442356 ], [ -126.5901212, 54.4423788 ], [ -126.5902278, 54.4424173 ], [ -126.5905704, 54.4425939 ], [ -126.5906915, 54.4426679 ], [ -126.5909717, 54.4428901 ], [ -126.5911188, 54.4429741 ], [ -126.591211199999989, 54.4430111 ], [ -126.5913007, 54.4430496 ], [ -126.591375899999989, 54.4430866 ], [ -126.5916762, 54.4432091 ], [ -126.5918418, 54.4433031 ], [ -126.5919307, 54.4433501 ], [ -126.5922498, 54.4434185 ], [ -126.59238830000001, 54.4434569 ], [ -126.592674, 54.4435438 ], [ -126.5929798, 54.4436221 ], [ -126.593158699999989, 54.4437062 ], [ -126.5932779, 54.4437717 ], [ -126.5935299, 54.4439483 ], [ -126.593726, 54.4440323 ], [ -126.5938478, 54.4440622 ], [ -126.5939707, 54.4440822 ], [ -126.594324300000011, 54.4441078 ], [ -126.5945805, 54.4442018 ], [ -126.5949168, 54.444263 ], [ -126.5950513, 54.44432 ], [ -126.5952297, 54.4444126 ], [ -126.595548099999988, 54.444518 ], [ -126.59586920000001, 54.4445877 ], [ -126.5959597, 54.4446162 ], [ -126.5962615, 54.4447131 ], [ -126.5964074, 54.444849800000014 ], [ -126.5965857, 54.4449709 ], [ -126.5966452, 54.445025 ], [ -126.5968041, 54.4452087 ], [ -126.5969196, 54.4453554 ], [ -126.596975, 54.4454636 ], [ -126.596996, 54.4456075 ], [ -126.5973567, 54.4457955 ], [ -126.5975869, 54.4458168 ], [ -126.5979562, 54.4458254 ], [ -126.5980729, 54.4459265 ], [ -126.5981162, 54.4459991 ], [ -126.59812620000001, 54.4460618 ], [ -126.598125699999983, 54.4460703 ], [ -126.598124700000014, 54.4460803 ], [ -126.5981236, 54.4460974 ], [ -126.598124, 54.4461245 ], [ -126.5981162, 54.4462242 ], [ -126.5981088, 54.446358 ], [ -126.5981783, 54.4465033 ], [ -126.5982929, 54.4466315 ], [ -126.5983796, 54.4467411 ], [ -126.5983952, 54.4467597 ], [ -126.5984084, 54.4467782 ], [ -126.598424, 54.4467967 ], [ -126.5984376, 54.4468138 ], [ -126.5985668, 54.4469704 ], [ -126.5986655, 54.4471513 ], [ -126.598698, 54.4473678 ], [ -126.598701, 54.4475843 ], [ -126.5986921, 54.4477367 ], [ -126.5986956, 54.4479517 ], [ -126.5986874, 54.44806 ], [ -126.598710799999978, 54.4482038 ], [ -126.598749399999988, 54.4483391 ], [ -126.5988923, 54.4485129 ], [ -126.5989491, 54.4486311 ], [ -126.5990967, 54.4487422 ], [ -126.5991244, 54.4487963 ], [ -126.5991279, 54.4490042 ], [ -126.5991364, 54.449085399999987 ], [ -126.599172400000015, 54.4492919 ], [ -126.5991828, 54.4493816 ], [ -126.59921989999998, 54.4495355 ], [ -126.599315599999983, 54.4497533 ], [ -126.5993695, 54.4498801 ], [ -126.5994109, 54.4499442 ], [ -126.5994819, 54.4500709 ], [ -126.5995086, 54.450135 ], [ -126.599503899999988, 54.4501977 ], [ -126.599523799999986, 54.4503871 ], [ -126.599553, 54.4504227 ], [ -126.599567099999973, 54.4504598 ], [ -126.5995958, 54.4504968 ], [ -126.599608, 54.4505324 ], [ -126.599634099999989, 54.450605 ], [ -126.599746, 54.450804399999988 ], [ -126.599856899999978, 54.4510138 ], [ -126.6000043, 54.4511605 ], [ -126.600047300000014, 54.451206 ], [ -126.6003596, 54.4513926 ], [ -126.6004329, 54.4514567 ], [ -126.600491399999981, 54.4515208 ], [ -126.6005479, 54.4516119 ], [ -126.6006462, 54.4517942 ], [ -126.600869, 54.4519424 ], [ -126.600942299999986, 54.4520064 ], [ -126.601102399999988, 54.4521446 ], [ -126.601367700000011, 54.4523468 ], [ -126.6014121, 54.4524024 ], [ -126.6014828, 54.4525021 ], [ -126.6014937, 54.4525833 ], [ -126.601520400000013, 54.4526473 ], [ -126.6015868, 54.452836800000014 ], [ -126.6015921, 54.4529906 ], [ -126.6016617, 54.4531358 ], [ -126.6017197, 54.4532085 ], [ -126.6019834, 54.4534292 ], [ -126.6021011, 54.453548899999987 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17065181, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 7054.8779961303599, "blue_line_key": 360851751, "length_metre": 549.02296585996703, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1470836, 54.5756219 ], [ -126.139925800000015, 54.5729593 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17073394, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1888.00028110122, "blue_line_key": 360881632, "length_metre": 244.68082726125999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.653498399999989, 54.5297028 ], [ -126.653679399999987, 54.5294906 ], [ -126.6537618, 54.5294293 ], [ -126.654070600000011, 54.5294165 ], [ -126.6543459, 54.5292157 ], [ -126.6545633, 54.5291829 ], [ -126.6545883, 54.529032 ], [ -126.654746800000012, 54.5289351 ], [ -126.65474420000001, 54.5287286 ], [ -126.654702899999975, 54.5286204 ], [ -126.6546278, 54.5285819 ], [ -126.654617500000015, 54.5285192 ], [ -126.654566800000012, 54.5283028 ], [ -126.6544666, 54.528166 ], [ -126.6543659, 54.5280379 ], [ -126.6543546, 54.5279567 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17076848, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 8672.8272334908706, "blue_line_key": 360869846, "length_metre": 1056.9535217739799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.584106199999979, 54.5104375 ], [ -126.5842313, 54.5104304 ], [ -126.5843398, 54.5104147 ], [ -126.584704099999982, 54.5102694 ], [ -126.584936200000016, 54.5102652 ], [ -126.5853219, 54.5102637 ], [ -126.585460700000013, 54.5102666 ], [ -126.585673, 54.5103335 ], [ -126.5859467, 54.5103933 ], [ -126.586070299999989, 54.5104047 ], [ -126.5864853, 54.5104389 ], [ -126.586748799999981, 54.510436100000014 ], [ -126.5869981, 54.5103962 ], [ -126.5873665, 54.5101968 ], [ -126.5875059, 54.5101626 ], [ -126.587645200000011, 54.5101569 ], [ -126.587831200000011, 54.5101512 ], [ -126.5880794, 54.5101569 ], [ -126.588262899999989, 54.510151199999981 ], [ -126.5883718, 54.5101626 ], [ -126.588510700000015, 54.5101655 ], [ -126.588835, 54.5101712 ], [ -126.5891279, 54.5101683 ], [ -126.5894066, 54.5101569 ], [ -126.5897922, 54.5101555 ], [ -126.590101800000014, 54.5101612 ], [ -126.59038, 54.5101583 ], [ -126.590642, 54.510181100000011 ], [ -126.5909019, 54.510231 ], [ -126.591051399999984, 54.5102879 ], [ -126.5913408, 54.5103663 ], [ -126.5914654, 54.5103677 ], [ -126.5916798, 54.510372 ], [ -126.591958, 54.5103691 ], [ -126.592328899999984, 54.5103677 ], [ -126.59264, 54.51035490000001 ], [ -126.592903, 54.5103606 ], [ -126.593291600000015, 54.510315 ], [ -126.593633700000012, 54.5102766 ], [ -126.5939306, 54.5102196 ], [ -126.594070500000015, 54.5102125 ], [ -126.5943634, 54.5102096 ], [ -126.594516, 54.5102224 ], [ -126.594902, 54.5102481 ], [ -126.5951154, 54.5102694 ], [ -126.595422899999988, 54.5103307 ], [ -126.595652500000014, 54.510362 ], [ -126.5958846, 54.5103577 ], [ -126.596177, 54.5103634 ], [ -126.5965342, 54.510352 ], [ -126.5968595, 54.5103406 ], [ -126.5971519, 54.5103463 ], [ -126.597408399999978, 54.5104418 ], [ -126.597529, 54.5104973 ], [ -126.597827, 54.5106924 ], [ -126.5982, 54.5108975 ], [ -126.5983221, 54.5109274 ], [ -126.5986612, 54.5109331 ], [ -126.5989196, 54.5110015 ], [ -126.5992561, 54.5110713 ], [ -126.59959760000001, 54.5110698 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101353, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 16437.195660753001, "blue_line_key": 360880905, "length_metre": 537.46719566228705, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3958903, 54.2561478 ], [ -126.3958122, 54.2561819 ], [ -126.3957188, 54.2561976 ], [ -126.39535020000001, 54.256199 ], [ -126.394982, 54.256199 ], [ -126.3947109, 54.2561121 ], [ -126.3946364, 54.2560751 ], [ -126.3945771, 54.2560295 ], [ -126.39447269999998, 54.2560082 ], [ -126.3943036, 54.2559968 ], [ -126.3940581, 54.2559811 ], [ -126.393768200000011, 54.2559669 ], [ -126.393536899999987, 54.2559797 ], [ -126.393443499999989, 54.2559954 ], [ -126.3933783, 54.2560481 ], [ -126.3931991, 54.2562417 ], [ -126.3931677, 54.2564654 ], [ -126.393119, 54.2565195 ], [ -126.3929598, 54.2565964 ], [ -126.3926626, 54.2566975 ], [ -126.392463600000013, 54.2567018 ], [ -126.392186599999974, 54.256706 ], [ -126.392078499999982, 54.2566946 ], [ -126.39175680000001, 54.2566875 ], [ -126.3916793, 54.2567132 ], [ -126.3916152, 54.2567559 ], [ -126.3915952, 54.2568186 ], [ -126.3915722, 54.2569439 ], [ -126.3914846, 54.2571134 ], [ -126.3914738, 54.2572658 ], [ -126.391425, 54.257327 ], [ -126.3910608, 54.2574993 ], [ -126.3909956, 54.257552 ], [ -126.390962099999982, 54.2576047 ], [ -126.390599699999981, 54.2577585 ], [ -126.39038189999998, 54.2578084 ], [ -126.3902256, 54.2578226 ], [ -126.389903299999986, 54.257851099999989 ], [ -126.389808799999983, 54.2578767 ], [ -126.3897148, 54.257901 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17086114, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 233117.250814748, "blue_line_key": 360873822, "length_metre": 142.19408742562399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.250628699999979, 54.4648671 ], [ -126.25057, 54.4648115 ], [ -126.2505523, 54.4646135 ], [ -126.2505722, 54.4645509 ], [ -126.2506294, 54.46439 ], [ -126.2507221, 54.4641849 ], [ -126.2508373, 54.4640538 ], [ -126.2509593, 54.4638487 ], [ -126.250954199999981, 54.4637049 ], [ -126.2509569, 54.4636422 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17083545, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 229717.31611524901, "blue_line_key": 360873822, "length_metre": 35.485475860640499, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2572537, 54.4791163 ], [ -126.2572293, 54.4787987 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17073342, "stream_order": 4, "gnis_name": "Cesford Creek", "downstream_route_measure": 5312.6079751955504, "blue_line_key": 360765936, "length_metre": 472.44869193524602, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.253040399999989, 54.5297156 ], [ -126.2528299, 54.5298737 ], [ -126.2527282, 54.5299876 ], [ -126.2525312, 54.5301628 ], [ -126.2523214, 54.5302838 ], [ -126.252195300000011, 54.5303351 ], [ -126.2518358, 54.5304077 ], [ -126.2516797, 54.5304049 ], [ -126.2514958, 54.5303907 ], [ -126.251156900000012, 54.5303565 ], [ -126.251018, 54.5303536 ], [ -126.2507574, 54.5303479 ], [ -126.250646300000014, 54.5303636 ], [ -126.2505679, 54.5303978 ], [ -126.2503957, 54.5304476 ], [ -126.2502812, 54.5305074 ], [ -126.249948100000012, 54.5306442 ], [ -126.249655499999989, 54.5306456 ], [ -126.249423299999989, 54.5306499 ], [ -126.249283600000012, 54.5306285 ], [ -126.2489311, 54.5305843 ], [ -126.2485952, 54.5305416 ], [ -126.2483655, 54.5304904 ], [ -126.248229900000013, 54.5304434 ], [ -126.2479296, 54.530328 ], [ -126.2475968, 54.5302212 ], [ -126.2473827, 54.5301813 ], [ -126.247244900000013, 54.5301685 ], [ -126.2469202, 54.5301428 ], [ -126.246766, 54.5301485 ], [ -126.2466271, 54.5301457 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091954, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 13102.095921565, "blue_line_key": 360846413, "length_metre": 88.045351853716895, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2814143, 54.4144283 ], [ -126.2813288, 54.4136411 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17077116, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 8355.7213549604094, "blue_line_key": 360869846, "length_metre": 90.265298917530103, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5842761, 54.5088851 ], [ -126.5831644, 54.509375 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17100911, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 18812.173069296801, "blue_line_key": 360880905, "length_metre": 230.890369708458, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3710517, 54.2637715 ], [ -126.3708619, 54.2638655 ], [ -126.370674, 54.2639339 ], [ -126.370435500000013, 54.264055 ], [ -126.3702034, 54.2640763 ], [ -126.36985, 54.2640692 ], [ -126.369693099999978, 54.2641461 ], [ -126.3696731, 54.2642088 ], [ -126.369502200000014, 54.2642501 ], [ -126.369317799999976, 54.2642544 ], [ -126.3689783, 54.264255800000015 ], [ -126.3688733, 54.2642358 ], [ -126.3685228, 54.2641931 ], [ -126.3682939, 54.2641789 ], [ -126.3680618, 54.2641732 ], [ -126.3678457, 54.2642045 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17106886, "stream_order": 4, "gnis_name": "Buck Creek", "downstream_route_measure": 63964.275282797003, "blue_line_key": 360886221, "length_metre": 929.59331398918505, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3584181, 54.1756408 ], [ -126.3530173, 54.1744152 ], [ -126.346210899999988, 54.171464699999987 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17104593, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 24132.3893062924, "blue_line_key": 360877225, "length_metre": 131.61836965772599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.289035, 54.2119204 ], [ -126.2890852, 54.2118221 ], [ -126.2894619, 54.2116968 ], [ -126.2897882, 54.211649800000011 ], [ -126.289941899999988, 54.2116355 ], [ -126.2902505, 54.2116241 ], [ -126.290575, 54.2115686 ], [ -126.2907966, 54.2114746 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17088517, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 188535.36941521801, "blue_line_key": 360873822, "length_metre": 125.73242243108901, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5604947, 54.4444197 ], [ -126.5600671, 54.4443955 ], [ -126.5593232, 54.4442673 ], [ -126.5589591, 54.4441178 ], [ -126.5586791, 54.4440708 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17095752, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 7925.2113949980003, "blue_line_key": 360886221, "length_metre": 564.33960537709095, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.61421630000001, 54.3547572 ], [ -126.6141792, 54.3546119 ], [ -126.614182199999973, 54.354540699999987 ], [ -126.6141462, 54.3543783 ], [ -126.6140763, 54.3542501 ], [ -126.6140646, 54.3541789 ], [ -126.614075, 54.3540166 ], [ -126.614109700000014, 54.3539454 ], [ -126.6141371, 54.3537488 ], [ -126.614241299999975, 54.3535352 ], [ -126.614262400000015, 54.353454 ], [ -126.6143044, 54.3532575 ], [ -126.6143556, 54.3531321 ], [ -126.614460099999988, 54.3529456 ], [ -126.6144714, 54.3527391 ], [ -126.614459099999976, 54.3526764 ], [ -126.614374, 54.3525568 ], [ -126.6143079, 54.3523759 ], [ -126.6142898, 54.3521694 ], [ -126.614246799999989, 54.3520967 ], [ -126.6141375, 54.3518788 ], [ -126.6140999, 54.3517421 ], [ -126.6140636, 54.3515527 ], [ -126.613844599999979, 54.351369 ], [ -126.6137383, 54.3513305 ], [ -126.6134519, 54.3511995 ], [ -126.6133622, 54.3511625 ], [ -126.613016, 54.3510556 ], [ -126.6126775, 54.3510314 ], [ -126.6123265, 54.3509802 ], [ -126.6120409, 54.3508748 ], [ -126.6117694, 54.3507708 ], [ -126.611695499999982, 54.3507238 ], [ -126.6115471, 54.3506312 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17068067, "stream_order": 4, "gnis_name": "Johnny David Creek", "downstream_route_measure": 6369.89941903608, "blue_line_key": 360866287, "length_metre": 593.846592648203, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4131849, 54.5566061 ], [ -126.4134714, 54.556693 ], [ -126.4136848, 54.5567428 ], [ -126.4138065, 54.5567813 ], [ -126.4141405, 54.5568867 ], [ -126.4144909, 54.5569664 ], [ -126.4148286, 54.5570191 ], [ -126.415102499999989, 54.5570789 ], [ -126.415298, 54.5571729 ], [ -126.4154889, 54.5573296 ], [ -126.4156101, 54.5573766 ], [ -126.41573120000001, 54.5574236 ], [ -126.415988200000015, 54.5575105 ], [ -126.4163532, 54.5576258 ], [ -126.4164424, 54.5576728 ], [ -126.4165425, 54.557801 ], [ -126.4165771, 54.5579904 ], [ -126.4165954, 54.5581983 ], [ -126.4168908, 54.5583935 ], [ -126.4171315, 54.558506 ], [ -126.4174178, 54.5586285 ], [ -126.417547299999981, 54.5587851 ], [ -126.4177503, 54.559013 ], [ -126.4179056, 54.5592152 ], [ -126.4180797, 54.559399 ], [ -126.418134799999976, 54.5595157 ], [ -126.4181447, 54.5596069 ], [ -126.418151, 54.5597507 ], [ -126.4182206, 54.559896 ], [ -126.4182611, 54.5599772 ], [ -126.4183906, 54.5601339 ], [ -126.4185616, 54.5603617 ], [ -126.4186361, 54.5604087 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17076814, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 8605.9715514508498, "blue_line_key": 360869846, "length_metre": 16.472739921729101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5831717, 54.5104434 ], [ -126.5833547, 54.5103406 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17105009, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 7305.1486615441299, "blue_line_key": 360882583, "length_metre": 603.17685918797599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.9749256, 54.2069556 ], [ -125.9748294, 54.2069128 ], [ -125.9745315, 54.2068032 ], [ -125.974499599999987, 54.2067775 ], [ -125.9742886, 54.2066109 ], [ -125.974164800000011, 54.2065967 ], [ -125.9740743, 54.2066437 ], [ -125.974014599999975, 54.206653599999981 ], [ -125.973679, 54.2066721 ], [ -125.9736147, 54.2066551 ], [ -125.973568199999988, 54.2066294 ], [ -125.9735193, 54.206603799999982 ], [ -125.9734809, 54.206497 ], [ -125.973447400000012, 54.2064428 ], [ -125.9733984, 54.2064172 ], [ -125.9731308, 54.2063246 ], [ -125.972823, 54.2062876 ], [ -125.972515, 54.2062776 ], [ -125.9723287, 54.2062548 ], [ -125.9720317, 54.2061822 ], [ -125.971893799999989, 54.206166499999988 ], [ -125.971583699999982, 54.2061295 ], [ -125.9715072, 54.2061324 ], [ -125.971461599999984, 54.2061238 ], [ -125.971292, 54.206128100000015 ], [ -125.970956199999989, 54.2061537 ], [ -125.970654200000013, 54.2062064 ], [ -125.9704013, 54.206330300000012 ], [ -125.9702802, 54.2063417 ], [ -125.970184, 54.206299 ], [ -125.9701375, 54.2062734 ], [ -125.9701045, 54.206237800000011 ], [ -125.970027, 54.2060327 ], [ -125.9699829, 54.2058361 ], [ -125.9699552, 54.2056481 ], [ -125.969825, 54.2055527 ], [ -125.9697909, 54.2055 ], [ -125.969742, 54.2054744 ], [ -125.9697252, 54.2054473 ], [ -125.969613, 54.205369 ], [ -125.9695658, 54.2053519 ], [ -125.9695314, 54.2053263 ], [ -125.9694118, 54.2051497 ], [ -125.9693766, 54.205087 ], [ -125.9691228, 54.2049503 ], [ -125.9689428, 54.2047922 ], [ -125.968893799999989, 54.2047666 ], [ -125.968800099999982, 54.2047238 ], [ -125.968469399999989, 54.2046241 ], [ -125.96840370000001, 54.2045714 ], [ -125.9683099, 54.2045287 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17063461, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 22620.114405239299, "blue_line_key": 360875378, "length_metre": 559.094194342935, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6832475, 54.5804192 ], [ -126.6837299, 54.5820439 ], [ -126.6874824, 54.584611700000011 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17097441, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 30448.470519395501, "blue_line_key": 360880905, "length_metre": 503.458765607168, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4264159, 54.321687 ], [ -126.426504199999982, 54.321734 ], [ -126.426743299999984, 54.3216044 ], [ -126.4268656, 54.3216244 ], [ -126.4268457, 54.321687 ], [ -126.4267795, 54.3217839 ], [ -126.426792, 54.321838 ], [ -126.4268473, 54.3219021 ], [ -126.426969700000015, 54.3219149 ], [ -126.4270598, 54.3219704 ], [ -126.4270717, 54.3220331 ], [ -126.427035899999979, 54.3220858 ], [ -126.4270297, 54.3221855 ], [ -126.427089200000012, 54.3222311 ], [ -126.4270864, 54.3222937 ], [ -126.4269522, 54.3224718 ], [ -126.4269464, 54.322543 ], [ -126.426904499999978, 54.3227224 ], [ -126.42682, 54.3228364 ], [ -126.4268032, 54.3228905 ], [ -126.42700640000001, 54.3230742 ], [ -126.4271107, 54.3231312 ], [ -126.4271679, 54.3232038 ], [ -126.4272013, 54.3234117 ], [ -126.427158800000015, 54.3235997 ], [ -126.4272319, 54.3236553 ], [ -126.427548500000015, 54.3237607 ], [ -126.4278797, 54.3238661 ], [ -126.4281958, 54.3239729 ], [ -126.4284341, 54.3240854 ], [ -126.4285719, 54.3241238 ], [ -126.428829600000014, 54.3241751 ], [ -126.4289342, 54.3242036 ], [ -126.429098599999975, 54.3242976 ], [ -126.4292793, 54.3243731 ], [ -126.429351700000012, 54.3244372 ], [ -126.429309100000012, 54.3245981 ], [ -126.429282699999987, 54.3247961 ], [ -126.4292616, 54.3248758 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17100153, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 22315.353425699999, "blue_line_key": 360881038, "length_metre": 280.27209962545101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0822113, 54.2779048 ], [ -126.080913, 54.2755102 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102871, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 29990.222720599799, "blue_line_key": 360881038, "length_metre": 142.003734138102, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0675227, 54.2352048 ], [ -126.0675276, 54.2351051 ], [ -126.067680900000013, 54.2349199 ], [ -126.067681799999988, 54.2348843 ], [ -126.0676393, 54.2348473 ], [ -126.0674897, 54.2347903 ], [ -126.0672386, 54.2346579 ], [ -126.0672565, 54.2346222 ], [ -126.0673049, 54.2345966 ], [ -126.067381399999988, 54.2345809 ], [ -126.0675345, 54.2345753 ], [ -126.0676, 54.2345496 ], [ -126.0676887, 54.234354499999988 ], [ -126.0676616, 54.2343089 ], [ -126.067590599999988, 54.2342434 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17089779, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 240572.63753627599, "blue_line_key": 360873822, "length_metre": 969.050055128944, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2057876, 54.4404889 ], [ -126.205911499999985, 54.4404917 ], [ -126.206034699999989, 54.4405031 ], [ -126.2062465, 54.4405615 ], [ -126.20656910000001, 54.44057 ], [ -126.206713, 54.4405102 ], [ -126.2067937, 54.440449 ], [ -126.206909599999989, 54.4403165 ], [ -126.2069508, 54.4401741 ], [ -126.20696, 54.4400388 ], [ -126.206920499999981, 54.4399576 ], [ -126.206755799999982, 54.4398636 ], [ -126.2065911, 54.4397967 ], [ -126.2065009, 54.439768199999989 ], [ -126.2061834, 54.4396699 ], [ -126.206060799999989, 54.43965 ], [ -126.205954, 54.4396472 ], [ -126.2056509, 54.4395774 ], [ -126.2055452, 54.43953040000001 ], [ -126.2055198, 54.4394577 ], [ -126.205539799999983, 54.4393951 ], [ -126.2058233, 54.439294 ], [ -126.2059182, 54.4392683 ], [ -126.206310899999977, 54.4391701 ], [ -126.2063898, 54.4391273 ], [ -126.206449100000015, 54.438947899999988 ], [ -126.2064373, 54.4388852 ], [ -126.2063892, 54.4386773 ], [ -126.2063485, 54.4386132 ], [ -126.206215699999987, 54.4385121 ], [ -126.206016799999986, 54.4384793 ], [ -126.205647700000014, 54.4384708 ], [ -126.205372900000015, 54.438438 ], [ -126.204994199999987, 54.4383397 ], [ -126.2046932, 54.4382158 ], [ -126.2045139, 54.4381489 ], [ -126.204393, 54.4381104 ], [ -126.2043026, 54.438062 ], [ -126.2039916, 54.437884 ], [ -126.2038606, 54.437764400000013 ], [ -126.2038653, 54.4377102 ], [ -126.203884699999989, 54.437649 ], [ -126.2039495, 54.4376048 ], [ -126.204045, 54.4375707 ], [ -126.2039622, 54.4373983 ], [ -126.203908399999989, 54.4372887 ], [ -126.2037433, 54.4372232 ], [ -126.203562800000014, 54.4371733 ], [ -126.2034713, 54.4371349 ], [ -126.203428799999983, 54.4370893 ], [ -126.2034181, 54.4370166 ], [ -126.203411499999973, 54.4368913 ], [ -126.2034981, 54.4367589 ], [ -126.2036117, 54.4366535 ], [ -126.2037508, 54.4364498 ], [ -126.2038297, 54.4364071 ], [ -126.204158100000015, 54.4363515 ], [ -126.2042536, 54.4363174 ], [ -126.2043173, 54.4362832 ], [ -126.2043248, 54.4361664 ], [ -126.2042516, 54.4361108 ], [ -126.204054, 54.436061 ], [ -126.2037008, 54.4360354 ], [ -126.203565, 54.436004 ], [ -126.2033857, 54.43591 ], [ -126.203313099999974, 54.4358459 ], [ -126.203247499999989, 54.4356736 ], [ -126.203214299999985, 54.435492700000012 ], [ -126.2031953, 54.435313300000011 ], [ -126.203268799999989, 54.4351353 ], [ -126.2033701, 54.4350028 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17079985, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 223685.83768100501, "blue_line_key": 360873822, "length_metre": 94.072643922719294, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.297006799999977, 54.4952939 ], [ -126.2967195, 54.4957453 ], [ -126.296156400000015, 54.495902 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17085431, "stream_order": 4, "gnis_name": "Raspberry Creek", "downstream_route_measure": 4858.5593579521401, "blue_line_key": 360817924, "length_metre": 193.51432383771601, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.632100400000013, 54.4667983 ], [ -126.632182899999989, 54.466935 ], [ -126.632300199999989, 54.4670632 ], [ -126.6323735, 54.4671273 ], [ -126.632479300000014, 54.46718280000001 ], [ -126.6327753, 54.467368 ], [ -126.632895799999986, 54.4674164 ], [ -126.6330627, 54.4675004 ], [ -126.63315080000001, 54.4675645 ], [ -126.6332788, 54.4677468 ], [ -126.6334139, 54.4678308 ], [ -126.6336877, 54.4678892 ], [ -126.6337778, 54.4679191 ], [ -126.6338365, 54.4679832 ], [ -126.634017199999988, 54.4680487 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092327, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 12078.597121725301, "blue_line_key": 360862508, "length_metre": 178.91893497068301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4107327, 54.4098199 ], [ -126.408311, 54.4105919 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17106669, "stream_order": 4, "gnis_name": "Buck Creek", "downstream_route_measure": 63084.641331865103, "blue_line_key": 360886221, "length_metre": 769.11554678228299, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.370620699999989, 54.1790175 ], [ -126.3599877, 54.1760175 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102290, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 28696.564084343201, "blue_line_key": 360881038, "length_metre": 140.708082645063, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0671774, 54.2426505 ], [ -126.0672272, 54.2425879 ], [ -126.0673573, 54.2424924 ], [ -126.067426399999988, 54.2423771 ], [ -126.0674291, 54.24235 ], [ -126.0675148, 54.2422361 ], [ -126.067629, 54.2421307 ], [ -126.067632300000014, 54.2420951 ], [ -126.0675464, 54.241984 ], [ -126.0673693, 54.2419085 ], [ -126.0672853, 54.2417988 ], [ -126.067300799999984, 54.2417632 ], [ -126.0675263, 54.2416336 ], [ -126.0675893, 54.241608 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101863, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 27808.030032675699, "blue_line_key": 360881038, "length_metre": 6.0501845088413102, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0703749, 54.2482121 ], [ -126.0703775, 54.248185 ], [ -126.0703801, 54.2481579 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092938, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 18653.064966976599, "blue_line_key": 360862508, "length_metre": 144.71552198874099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3447939, 54.4037884 ], [ -126.3447791, 54.4035548 ], [ -126.344775399999989, 54.4033654 ], [ -126.3445568, 54.4031546 ], [ -126.34451, 54.4029282 ], [ -126.3444845, 54.4028556 ], [ -126.344283499999989, 54.4026362 ], [ -126.3442408, 54.4025636 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17066394, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 4146.2500116352903, "blue_line_key": 360851751, "length_metre": 51.770328355974897, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1830104, 54.5667821 ], [ -126.1829198, 54.5667536 ], [ -126.182605899999984, 54.5665926 ], [ -126.182453, 54.5665528 ], [ -126.182344199999989, 54.5665684 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17067622, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 19400.400456502299, "blue_line_key": 360875378, "length_metre": 318.04721009375999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.657623500000014, 54.5583885 ], [ -126.65901980000001, 54.5593534 ], [ -126.6616272, 54.5598647 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17092396, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 164908.07732636499, "blue_line_key": 360873822, "length_metre": 1122.3489732524599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.740699976239299, 54.407409019823753 ], [ -126.7407, 54.4074088 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17079372, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 5603.4849580359196, "blue_line_key": 360875052, "length_metre": 114.01359569640501, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3781115, 54.4978987 ], [ -126.3798746, 54.4978574 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17065400, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 3284.4160232025702, "blue_line_key": 360851751, "length_metre": 17.746669268359401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1908653, 54.5717013 ], [ -126.1906287, 54.5716201 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17056463, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 18014.165641743599, "blue_line_key": 360856488, "length_metre": 641.91573053535205, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.506147700000014, 54.6181077 ], [ -126.5061566, 54.6181889 ], [ -126.5061222, 54.6182601 ], [ -126.5059953, 54.6182929 ], [ -126.505948499999988, 54.6183285 ], [ -126.5059432, 54.6184082 ], [ -126.505985, 54.6184723 ], [ -126.5062394, 54.6186119 ], [ -126.506299399999975, 54.6186589 ], [ -126.5062443, 54.6187828 ], [ -126.5058922, 54.6189836 ], [ -126.5058572, 54.619027800000012 ], [ -126.5058548, 54.619099 ], [ -126.5058804, 54.6191531 ], [ -126.5059729, 54.6191915 ], [ -126.506014799999988, 54.6192556 ], [ -126.5060423, 54.6193183 ], [ -126.5060369, 54.6193909 ], [ -126.5059081, 54.6194864 ], [ -126.5058712, 54.6195576 ], [ -126.505897800000014, 54.6196302 ], [ -126.5060297, 54.6197683 ], [ -126.506283599999989, 54.6199165 ], [ -126.5063436, 54.6199635 ], [ -126.5063254, 54.6200162 ], [ -126.506173499999989, 54.6201928 ], [ -126.5061528, 54.6202739 ], [ -126.5061617, 54.6203907 ], [ -126.5062268, 54.6206086 ], [ -126.5062785, 54.6207795 ], [ -126.506368, 54.6208265 ], [ -126.5064763, 54.6208194 ], [ -126.5065884, 54.620751 ], [ -126.5065476, 54.620677 ], [ -126.506535199999973, 54.6206058 ], [ -126.5066312, 54.6205631 ], [ -126.506770399999979, 54.6205659 ], [ -126.507034600000011, 54.6205702 ], [ -126.5071251, 54.6206001 ], [ -126.5071674, 54.6206627 ], [ -126.5071793, 54.6207354 ], [ -126.5071419, 54.6208151 ], [ -126.5069653, 54.6209205 ], [ -126.5069157, 54.6210003 ], [ -126.50692549999998, 54.6210715 ], [ -126.507047599999979, 54.6211099 ], [ -126.5071401, 54.621112800000013 ], [ -126.507265, 54.6210786 ], [ -126.5073614, 54.6210273 ], [ -126.507551799999987, 54.6209675 ], [ -126.50769, 54.6209803 ], [ -126.507915399999987, 54.6210829 ], [ -126.507909500000011, 54.6211997 ], [ -126.507859399999987, 54.6212524 ], [ -126.507634599999989, 54.6213834 ], [ -126.5075254, 54.6214076 ], [ -126.507475199999973, 54.6214603 ], [ -126.5074222, 54.62155 ], [ -126.507480699999988, 54.6216227 ], [ -126.5076057, 54.621617 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076662, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 215675.89811338301, "blue_line_key": 360873822, "length_metre": 52.590028359812599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.364640799999989, 54.5120995 ], [ -126.3642754, 54.5119386 ], [ -126.363922300000013, 54.5119172 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104855, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 1096.31460934243, "blue_line_key": 360882583, "length_metre": 879.09923112569402, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0383909, 54.2079767 ], [ -126.0380321, 54.20785990000001 ], [ -126.0379766, 54.2077859 ], [ -126.03788, 54.2076121 ], [ -126.037754799999973, 54.2074298 ], [ -126.037666699999988, 54.2073914 ], [ -126.037621699999988, 54.2073814 ], [ -126.0375774, 54.2073629 ], [ -126.0375159, 54.2073515 ], [ -126.037471499999981, 54.207333 ], [ -126.037289, 54.2072931 ], [ -126.0369856, 54.2072575 ], [ -126.036702299999973, 54.2073586 ], [ -126.0365785, 54.2073643 ], [ -126.0363687, 54.2073059 ], [ -126.0361852, 54.2073016 ], [ -126.0360299, 54.207333 ], [ -126.035982199999978, 54.2073501 ], [ -126.0359352, 54.2073586 ], [ -126.0358404, 54.2073914 ], [ -126.0356664, 54.2074868 ], [ -126.0355849, 54.2075295 ], [ -126.0354808, 54.2077061 ], [ -126.035436300000015, 54.2079126 ], [ -126.035391300000015, 54.2081006 ], [ -126.0353558, 54.2081704 ], [ -126.0353239, 54.2081975 ], [ -126.035238799999973, 54.2083029 ], [ -126.0350733, 54.208461 ], [ -126.034993500000013, 54.2085122 ], [ -126.0347076, 54.2086404 ], [ -126.0346616, 54.208666 ], [ -126.034599300000011, 54.2086831 ], [ -126.0344401, 54.2087515 ], [ -126.034170800000012, 54.2088611 ], [ -126.0338856, 54.2089808 ], [ -126.033558500000012, 54.209062 ], [ -126.033480399999988, 54.2090691 ], [ -126.033158199999988, 54.2090976 ], [ -126.0328051, 54.2090976 ], [ -126.032497699999979, 54.209099 ], [ -126.032186, 54.2091716 ], [ -126.032090299999979, 54.2092329 ], [ -126.0318641, 54.209371 ], [ -126.0316112, 54.209482099999988 ], [ -126.0313874, 54.2096203 ], [ -126.0313389, 54.2096459 ], [ -126.031098, 54.209784 ], [ -126.031004599999989, 54.2097997 ], [ -126.0306819, 54.2098097 ], [ -126.030378399999989, 54.2097741 ], [ -126.0303341, 54.2097556 ], [ -126.0302891, 54.2097456 ], [ -126.0301542, 54.2096886 ], [ -126.02991059999998, 54.2096559 ], [ -126.0295892, 54.2096559 ], [ -126.029544800000011, 54.2096373 ], [ -126.0292445, 54.2095405 ], [ -126.0291226, 54.2095277 ], [ -126.0290776, 54.2095177 ], [ -126.0288337, 54.209512 ], [ -126.0287862, 54.209502 ], [ -126.028698100000014, 54.2094636 ], [ -126.0286587, 54.2093724 ], [ -126.028485199999977, 54.2092158 ], [ -126.0283813, 54.2091674 ], [ -126.0282145, 54.209137399999989 ], [ -126.0281388, 54.2091446 ] ] } }, @@ -270,35 +585,78 @@ { "type": "Feature", "properties": { "linear_feature_id": 17104686, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 2236.4217528316399, "blue_line_key": 360882583, "length_metre": 417.76150015791598, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.025232, 54.2103039 ], [ -126.0251018, 54.2103993 ], [ -126.0248606, 54.2105645 ], [ -126.0247691, 54.2107596 ], [ -126.0248173, 54.210959 ], [ -126.0247723, 54.211147 ], [ -126.0247713, 54.2111826 ], [ -126.024754, 54.2112097 ], [ -126.0247589, 54.211335 ], [ -126.0247417, 54.2113621 ], [ -126.024692499999986, 54.21139620000001 ], [ -126.024630199999976, 54.2114133 ], [ -126.0242921, 54.2114319 ], [ -126.0239957, 54.211495899999989 ], [ -126.023867, 54.2115743 ], [ -126.0237249, 54.2116426 ], [ -126.0236631, 54.2116583 ], [ -126.023614099999989, 54.2116854 ], [ -126.0235523, 54.211701 ], [ -126.0232367, 54.2118107 ], [ -126.0231422, 54.211862 ], [ -126.022901300000015, 54.2120001 ], [ -126.022869199999988, 54.2120343 ], [ -126.0226283, 54.2121724 ], [ -126.0225786, 54.212208 ], [ -126.022515599999977, 54.2122337 ], [ -126.022186499999975, 54.2123334 ], [ -126.0220617, 54.2123747 ], [ -126.0219835, 54.2123818 ], [ -126.0219217, 54.2123975 ], [ -126.0215985, 54.2124089 ], [ -126.021248, 54.2123818 ], [ -126.02091, 54.2124003 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17088521, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 188431.47654218, "blue_line_key": 360873822, "length_metre": 103.892873037735, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5619024, 54.4440423 ], [ -126.5611576, 54.44437270000001 ], [ -126.5604947, 54.4444197 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17094345, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 0.0, "blue_line_key": 360881038, "length_metre": 219.16202746339101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1233209, 54.383012 ], [ -126.125481099999988, 54.3815893 ], [ -126.1255738, 54.3815494 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17061168, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 24467.4977798443, "blue_line_key": 360875378, "length_metre": 24.146696254181101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.7004077, 54.5915605 ], [ -126.700454400000012, 54.5915533 ], [ -126.7005016, 54.5915448 ], [ -126.7006258, 54.591512 ], [ -126.700753, 54.5914778 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17080205, "stream_order": 4, "gnis_name": "Ailport Creek", "downstream_route_measure": 14514.816458797201, "blue_line_key": 360878058, "length_metre": 1058.4326492381399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.113304700000015, 54.4945604 ], [ -126.113238, 54.4946302 ], [ -126.1128601, 54.4947199 ], [ -126.1124426, 54.4947285 ], [ -126.1121285, 54.4948111 ], [ -126.111855699999978, 54.4949563 ], [ -126.1115146, 54.4951828 ], [ -126.1113463, 54.495358 ], [ -126.111326600000012, 54.4956456 ], [ -126.111087500000011, 54.4957653 ], [ -126.110798300000013, 54.4959291 ], [ -126.110646, 54.4960872 ], [ -126.110478, 54.4962823 ], [ -126.1103064, 54.4965557 ], [ -126.1102138, 54.4967523 ], [ -126.1100706, 54.4970357 ], [ -126.109965100000011, 54.4972137 ], [ -126.1096493, 54.4975199 ], [ -126.109373799999986, 54.4977207 ], [ -126.1090014, 54.4979728 ], [ -126.1087717, 54.4981551 ], [ -126.10859, 54.4983132 ], [ -126.1084248, 54.4984798 ], [ -126.1082407, 54.498665 ], [ -126.1080117, 54.4988387 ], [ -126.107794, 54.4990766 ], [ -126.1075679, 54.4992147 ], [ -126.1072763, 54.4994056 ], [ -126.106984700000012, 54.4995964 ], [ -126.1068348, 54.4997545 ], [ -126.1067913, 54.499924 ], [ -126.1067428, 54.5000002 ], [ -126.1067406, 54.5000037 ], [ -126.106622699999974, 54.5001547 ], [ -126.1063789, 54.5003285 ], [ -126.1060418, 54.5004823 ], [ -126.1057388, 54.500609 ], [ -126.1053279, 54.50077 ], [ -126.105072299999989, 54.500881 ], [ -126.1048327, 54.5010021 ], [ -126.104634300000015, 54.5011588 ], [ -126.104436, 54.501342500000014 ], [ -126.1041892, 54.5015518 ], [ -126.1039053, 54.501653 ], [ -126.103636499999979, 54.5017185 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17061422, "stream_order": 4, "gnis_name": "Richfield Creek", "downstream_route_measure": 18023.374921321501, "blue_line_key": 360788426, "length_metre": 413.399823853013, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.199235300000012, 54.5918837 ], [ -126.1992492, 54.5919279 ], [ -126.199209, 54.5920347 ], [ -126.1990286, 54.5922113 ], [ -126.1989928, 54.592264 ], [ -126.1989006, 54.5924691 ], [ -126.1986426, 54.5926429 ], [ -126.1983567, 54.5927354 ], [ -126.1980672, 54.5929078 ], [ -126.197825200000011, 54.5930288 ], [ -126.197791900000013, 54.5930815 ], [ -126.1977842, 54.5931798 ], [ -126.197784899999988, 54.5933863 ], [ -126.1976802, 54.5935643 ], [ -126.19751620000001, 54.5937224 ], [ -126.1973341, 54.593862 ], [ -126.1971354, 54.5940557 ], [ -126.196971300000016, 54.5942138 ], [ -126.19690869999998, 54.5944188 ], [ -126.1967728, 54.5946225 ], [ -126.1964997, 54.5947692 ], [ -126.196152, 54.5948418 ], [ -126.196057400000015, 54.594866 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17081223, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 227185.13166603399, "blue_line_key": 360873822, "length_metre": 229.606976626213, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.275113699999977, 54.4892538 ], [ -126.274821, 54.4891598 ], [ -126.27471220000001, 54.4891968 ], [ -126.2742601, 54.4896697 ], [ -126.27393189999998, 54.4898278 ], [ -126.273626600000014, 54.4899004 ], [ -126.273177499999989, 54.489936 ], [ -126.2728312, 54.489896099999989 ], [ -126.2725706, 54.4898221 ], [ -126.2723906, 54.4896796 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17092524, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 250001.39820938301, "blue_line_key": 360873822, "length_metre": 410.86010852297699, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1962155, 54.4099325 ], [ -126.1958861, 54.4098071 ], [ -126.1954717, 54.4097615 ], [ -126.195138199999988, 54.4099068 ], [ -126.1947769, 54.4100065 ], [ -126.19457890000001, 54.4099923 ], [ -126.1944133, 54.409908200000011 ], [ -126.1942089, 54.4097687 ], [ -126.194098099999977, 54.4095593 ], [ -126.194135800000012, 54.409461 ], [ -126.1942548, 54.409293 ], [ -126.1944087, 54.4090893 ], [ -126.194398699999979, 54.4090081 ], [ -126.1942739, 54.4088173 ], [ -126.1942161, 54.4087262 ], [ -126.194260899999989, 54.4085467 ], [ -126.194606799999988, 54.4084285 ], [ -126.1949646, 54.408392899999988 ], [ -126.195123099999989, 54.4083331 ], [ -126.195153799999986, 54.408118 ], [ -126.19509140000001, 54.407883 ], [ -126.1950778, 54.4078731 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17083413, "stream_order": 4, "gnis_name": "Ailport Creek", "downstream_route_measure": 10505.9100772198, "blue_line_key": 360878058, "length_metre": 674.93072536219699, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1524435, 54.4816699 ], [ -126.152445899999989, 54.4816428 ], [ -126.1523471, 54.4815146 ], [ -126.1523027, 54.4814605 ], [ -126.1522004, 54.4813765 ], [ -126.1521749, 54.4813039 ], [ -126.1520643, 54.481113 ], [ -126.1517578, 54.4810788 ], [ -126.151339299999989, 54.4811045 ], [ -126.151216, 54.4811201 ], [ -126.1511231, 54.4810988 ], [ -126.151001799999989, 54.4808624 ], [ -126.150928600000015, 54.4808068 ], [ -126.150589, 54.4807897 ], [ -126.1504232, 54.4807598 ], [ -126.150062800000015, 54.4805889 ], [ -126.1497479, 54.480455 ], [ -126.1494987, 54.4802884 ], [ -126.149246299999973, 54.4801374 ], [ -126.1488047, 54.4800563 ], [ -126.148420800000011, 54.4800192 ], [ -126.14805410000001, 54.479948 ], [ -126.147691400000014, 54.4798312 ], [ -126.1475721, 54.4797743 ], [ -126.1474557, 54.4796817 ], [ -126.147347599999989, 54.4796617 ], [ -126.1470407, 54.4796632 ], [ -126.1467149, 54.4796831 ], [ -126.146293399999976, 54.4797444 ], [ -126.1457953, 54.4798141 ], [ -126.1454175, 54.4799039 ], [ -126.145086, 54.4800221 ], [ -126.1448423, 54.4801958 ], [ -126.144760799999986, 54.4802386 ], [ -126.144513, 54.4802599 ], [ -126.1443566, 54.4802927 ], [ -126.144112299999989, 54.4804479 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17105241, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 8405.5394283522201, "blue_line_key": 360882583, "length_metre": 166.272198930527, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.9642458, 54.2011135 ], [ -125.964258199999989, 54.2010864 ], [ -125.9642568, 54.2010508 ], [ -125.9643122, 54.2009867 ], [ -125.964462, 54.2009112 ], [ -125.9644896, 54.2008827 ], [ -125.964296099999984, 54.2007346 ], [ -125.964013400000013, 54.2006435 ], [ -125.9639168, 54.2005822 ], [ -125.963867900000011, 54.2005566 ], [ -125.963806, 54.2005395 ], [ -125.963744600000012, 54.2005409 ], [ -125.9634069, 54.2005324 ], [ -125.9633129, 54.2005167 ], [ -125.9631549, 54.2004569 ], [ -125.9631089, 54.2004498 ], [ -125.9630775, 54.2004227 ], [ -125.962933600000014, 54.200364300000011 ], [ -125.962806799999981, 54.200286 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17104484, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 22687.112873598999, "blue_line_key": 360877225, "length_metre": 142.92742531715399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2710406, 54.2131053 ], [ -126.2711937, 54.2130996 ], [ -126.271561399999982, 54.2130996 ], [ -126.2718992, 54.2130882 ], [ -126.27199, 54.2131267 ], [ -126.2720478, 54.2131822 ], [ -126.2721328, 54.2132833 ], [ -126.272191799999973, 54.2133289 ], [ -126.2723131, 54.2133503 ], [ -126.2724204, 54.2133431 ], [ -126.272515700000014, 54.2132819 ], [ -126.2726003, 54.213149500000014 ], [ -126.2726955, 54.2131153 ], [ -126.272787, 54.2131181 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17089622, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 2708.9970511154902, "blue_line_key": 360862508, "length_metre": 876.09616445621202, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5062973, 54.4394805 ], [ -126.506339, 54.4393196 ], [ -126.5063306, 54.4391757 ], [ -126.506289399999986, 54.4391117 ], [ -126.506051499999984, 54.438945 ], [ -126.505846800000015, 54.4387884 ], [ -126.5057176, 54.4386331 ], [ -126.505676099999988, 54.438542 ], [ -126.5056238, 54.4383696 ], [ -126.5055241, 54.43827 ], [ -126.505273800000012, 54.4380478 ], [ -126.505187400000011, 54.4379381 ], [ -126.5049677, 54.4377544 ], [ -126.5047154, 54.4376148 ], [ -126.5044401, 54.437555 ], [ -126.504302599999988, 54.4375422 ], [ -126.5039181, 54.4375351 ], [ -126.5037185, 54.4375037 ], [ -126.503597299999981, 54.4374653 ], [ -126.5033624, 54.4372901 ], [ -126.5031043, 54.4372303 ], [ -126.502856, 54.437226 ], [ -126.5026861, 54.4372217 ], [ -126.5025609, 54.4372645 ], [ -126.5023052, 54.4374211 ], [ -126.5021794, 54.4374724 ], [ -126.502067499999981, 54.4375052 ], [ -126.501959700000015, 54.4375123 ], [ -126.501836399999988, 54.437500899999989 ], [ -126.501488900000012, 54.4373955 ], [ -126.501186800000013, 54.4373072 ], [ -126.500895199999988, 54.4372659 ], [ -126.5007588, 54.437236 ], [ -126.500439499999985, 54.4371477 ], [ -126.5000942, 54.4370152 ], [ -126.499851199999981, 54.4369469 ], [ -126.4997285, 54.4369269 ], [ -126.4994751, 54.4368044 ], [ -126.4991707, 54.436709 ], [ -126.498876900000013, 54.4364783 ], [ -126.4986557, 54.4363202 ], [ -126.4984681, 54.4361009 ], [ -126.49826, 54.4359613 ], [ -126.4980556, 54.435769 ], [ -126.497955499999989, 54.4356494 ], [ -126.4978426, 54.4354756 ], [ -126.4977568, 54.4353574 ], [ -126.4976284, 54.4352207 ], [ -126.4975246, 54.4351467 ], [ -126.4973486, 54.4349715 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17088508, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 8640.6280433126994, "blue_line_key": 360846413, "length_metre": 346.93375447862701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3068568, 54.4479104 ], [ -126.306813600000012, 54.4478734 ], [ -126.306768, 54.4478364 ], [ -126.3067423, 54.4477637 ], [ -126.3066712, 54.4476811 ], [ -126.306484, 54.4474703 ], [ -126.3063878, 54.4473066 ], [ -126.3063335, 54.4471698 ], [ -126.306339200000011, 54.4470986 ], [ -126.3063218, 54.4468992 ], [ -126.306324499999988, 54.4468366 ], [ -126.306428900000014, 54.44666 ], [ -126.3065786, 54.4465005 ], [ -126.306659900000014, 54.4464577 ], [ -126.306886799999987, 54.446274 ], [ -126.3070026, 54.4461686 ], [ -126.3071341, 54.4460191 ], [ -126.3071852, 54.4459578 ], [ -126.307180500000015, 54.4458126 ], [ -126.3071457, 54.4456417 ], [ -126.307120399999988, 54.4455334 ], [ -126.3070987, 54.4454152 ], [ -126.3070712, 54.445334 ], [ -126.3069898, 54.4451702 ], [ -126.306923799999979, 54.445025 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17081184, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 4962.7492376264599, "blue_line_key": 360869846, "length_metre": 1551.2279606082, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5671762, 54.488315199999988 ], [ -126.56717159999998, 54.4883779 ], [ -126.567162299999978, 54.4885388 ], [ -126.5671672, 54.4887012 ], [ -126.567158299999988, 54.4888536 ], [ -126.567185, 54.4889533 ], [ -126.5672066, 54.4890886 ], [ -126.5672506, 54.4891527 ], [ -126.5674067, 54.4893805 ], [ -126.567517, 54.4895714 ], [ -126.567554199999989, 54.4897252 ], [ -126.567546, 54.4898691 ], [ -126.5676262, 54.4900684 ], [ -126.567908, 54.4902807 ], [ -126.567949, 54.4903533 ], [ -126.567977699999986, 54.4904259 ], [ -126.5679695, 54.4905342 ], [ -126.5679775, 54.4906595 ], [ -126.567957599999986, 54.4907307 ], [ -126.567929499999977, 54.4909458 ], [ -126.567925800000012, 54.4910269 ], [ -126.5679322, 54.4911708 ], [ -126.5679848, 54.4913161 ], [ -126.5680439, 54.4913716 ], [ -126.5681298, 54.491498400000012 ], [ -126.5681566, 54.4915624 ], [ -126.5681903, 54.491769 ], [ -126.568216, 54.4918786 ], [ -126.5683596, 54.4920509 ], [ -126.5685211, 54.492172 ], [ -126.5685798, 54.4922361 ], [ -126.5687852, 54.4924284 ], [ -126.5688419, 54.4924839 ], [ -126.569000699999989, 54.4926762 ], [ -126.5690724, 54.4927944 ], [ -126.569173599999985, 54.4929126 ], [ -126.5693461, 54.4931148 ], [ -126.569552, 54.4932986 ], [ -126.5696098, 54.4933441 ], [ -126.569875, 54.4935478 ], [ -126.5699499, 54.4935934 ], [ -126.5700572, 54.4936233 ], [ -126.5701458, 54.4936788 ], [ -126.570248, 54.4937799 ], [ -126.570303599999974, 54.4938882 ], [ -126.5703677, 54.4941061 ], [ -126.5704176, 54.4943226 ], [ -126.5705755, 54.4944963 ], [ -126.570738899999981, 54.4946259 ], [ -126.570917699999981, 54.4947185 ], [ -126.57092870000001, 54.4947997 ], [ -126.5709727, 54.4948638 ], [ -126.5711929, 54.4950489 ], [ -126.5713821, 54.4952312 ], [ -126.5715755, 54.4953523 ], [ -126.5718605, 54.4955203 ], [ -126.5720944, 54.4957226 ], [ -126.572273, 54.4958436 ], [ -126.5725059, 54.4960629 ], [ -126.5725656, 54.4961099 ], [ -126.5729758, 54.4962353 ], [ -126.573066399999988, 54.4962638 ], [ -126.5734139, 54.4963791 ], [ -126.573503500000015, 54.4964247 ], [ -126.573834, 54.4966027 ], [ -126.574014799999986, 54.4966967 ], [ -126.574180399999989, 54.4967708 ], [ -126.574285199999977, 54.4968007 ], [ -126.5746042, 54.4969061 ], [ -126.5749071, 54.4970015 ], [ -126.575013, 54.4970214 ], [ -126.5754, 54.49703 ], [ -126.5756984, 54.4969545 ], [ -126.575821499999989, 54.4969388 ], [ -126.576147299999988, 54.4969189 ], [ -126.576394, 54.4969146 ], [ -126.576750100000012, 54.4969132 ], [ -126.5769648, 54.4969445 ], [ -126.577318399999982, 54.4969787 ], [ -126.577409, 54.4970072 ], [ -126.5774992, 54.4970442 ], [ -126.5778455, 54.4972052 ], [ -126.577951399999989, 54.4972251 ], [ -126.578075, 54.4972365 ], [ -126.5783364, 54.4972322 ], [ -126.5785825, 54.497265 ], [ -126.5786595, 54.4972835 ], [ -126.5787634, 54.4973305 ], [ -126.5791244, 54.4974914 ], [ -126.579395299999987, 54.4976224 ], [ -126.57953160000001, 54.4976609 ], [ -126.579819199999974, 54.4977649 ], [ -126.5799549, 54.4978404 ], [ -126.580255799999989, 54.4979628 ], [ -126.5804366, 54.4980212 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17104480, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 20610.4430292736, "blue_line_key": 360877225, "length_metre": 613.15996200084999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.246987, 54.214266 ], [ -126.2470924, 54.2143045 ], [ -126.2473509, 54.2143372 ], [ -126.247485399999974, 54.2143757 ], [ -126.2475082, 54.2144939 ], [ -126.2474846, 54.2146192 ], [ -126.2475442, 54.2146563 ], [ -126.2477888, 54.2146534 ], [ -126.2481273, 54.2146335 ], [ -126.2484398, 54.2145509 ], [ -126.2485199, 54.2144982 ], [ -126.2487023, 54.2143045 ], [ -126.248831400000014, 54.2141905 ], [ -126.248900799999987, 54.2140666 ], [ -126.249018499999977, 54.2139171 ], [ -126.249237, 54.2138587 ], [ -126.249609100000015, 54.2138131 ], [ -126.2499496, 54.2137676 ], [ -126.2502576, 54.2137376 ], [ -126.250504100000015, 54.2137163 ], [ -126.2508013, 54.213642199999988 ], [ -126.250910600000012, 54.2136365 ], [ -126.251232, 54.2136166 ], [ -126.2515717, 54.2136066 ], [ -126.2517884, 54.213566699999987 ], [ -126.25205, 54.2135639 ], [ -126.2522798, 54.2135682 ], [ -126.252596, 54.2136565 ], [ -126.252934, 54.213638 ], [ -126.253027300000014, 54.2136223 ], [ -126.2533557, 54.2135297 ], [ -126.253486, 54.2134257 ], [ -126.253578799999985, 54.2133916 ], [ -126.2536874, 54.2133944 ], [ -126.2540048, 54.2134457 ], [ -126.2541585, 54.2134585 ], [ -126.254281100000014, 54.2134428 ], [ -126.2543758, 54.2134101 ], [ -126.2545066, 54.213304699999988 ], [ -126.2546695, 54.2131381 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17098445, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 18549.904464353302, "blue_line_key": 360881038, "length_metre": 555.623799440536, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.096741099999974, 54.3103175 ], [ -126.0955447, 54.3053884 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17094144, "stream_order": 5, "gnis_name": "Bulkley River", "downstream_route_measure": 262178.644239582, "blue_line_key": 360873822, "length_metre": 560.02781033392796, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.071967099999981, 54.3866381 ], [ -126.068785600000012, 54.387682 ], [ -126.0652046, 54.3896987 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093692, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 16468.449850942801, "blue_line_key": 360846413, "length_metre": 170.27497189753399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2620846, 54.3949988 ], [ -126.2621884, 54.393474499999989 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17055004, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 19496.679687192602, "blue_line_key": 360856488, "length_metre": 320.51616221031497, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5106335, 54.6265689 ], [ -126.5107206, 54.6266515 ], [ -126.510948499999984, 54.626747 ], [ -126.5110691, 54.6268111 ], [ -126.5110175, 54.6268823 ], [ -126.5109225, 54.6269079 ], [ -126.5108709, 54.6269791 ], [ -126.5109148, 54.6270518 ], [ -126.5109886, 54.6270802 ], [ -126.511097799999988, 54.6270916 ], [ -126.5111736, 54.6271287 ], [ -126.5112865, 54.627301 ], [ -126.5114632, 54.6274306 ], [ -126.511556200000015, 54.6274605 ], [ -126.51164630000001, 54.6274705 ], [ -126.511926699999989, 54.6274491 ], [ -126.5121043, 54.6273551 ], [ -126.512212, 54.6273565 ], [ -126.512302100000014, 54.627395 ], [ -126.512404100000012, 54.6275132 ], [ -126.5124789, 54.6275602 ], [ -126.5127259, 54.6275645 ], [ -126.5128208, 54.6275317 ], [ -126.5129369, 54.6274164 ], [ -126.5130451, 54.6274092 ], [ -126.513100799999989, 54.6275189 ], [ -126.513014799999979, 54.6276613 ], [ -126.5130095, 54.6277411 ], [ -126.513066599999988, 54.6278322 ], [ -126.513141499999989, 54.6278792 ], [ -126.513233, 54.6278992 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17065492, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 21019.733552733, "blue_line_key": 360875378, "length_metre": 473.08169366807402, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.669760599999989, 54.5695521 ], [ -126.6700156, 54.5725017 ], [ -126.670768599999974, 54.5737108 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17098307, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 28423.4697141045, "blue_line_key": 360880905, "length_metre": 336.45055058634699, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.427667899999989, 54.3072925 ], [ -126.4275399, 54.3073709 ], [ -126.427536, 54.3074435 ], [ -126.4276513, 54.3075446 ], [ -126.427706199999975, 54.3076714 ], [ -126.42783630000001, 54.3077996 ], [ -126.4278572, 54.3079534 ], [ -126.4278538, 54.3080246 ], [ -126.4278418, 54.3082225 ], [ -126.4277386, 54.3083821 ], [ -126.4275907, 54.308523 ], [ -126.427465, 54.3085743 ], [ -126.427246499999981, 54.308632700000011 ], [ -126.4271808, 54.308694 ], [ -126.42714620000001, 54.3087566 ], [ -126.4271581, 54.3088193 ], [ -126.4272378, 54.3090272 ], [ -126.427217899999988, 54.3090899 ], [ -126.4271148, 54.3092765 ], [ -126.4271056, 54.3094118 ], [ -126.4270705, 54.309483 ], [ -126.42707489999998, 54.3096624 ], [ -126.4271428, 54.3098077 ], [ -126.427155199999987, 54.3098618 ], [ -126.4272208, 54.3100341 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076117, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 214713.91015036599, "blue_line_key": 360873822, "length_metre": 302.65811466512002, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3756905, 54.5159178 ], [ -126.374870199999989, 54.5156829 ], [ -126.3740192, 54.5153396 ], [ -126.3737702, 54.5151545 ], [ -126.3734933, 54.5148184 ], [ -126.373260300000013, 54.5146788 ], [ -126.3730339, 54.5146318 ], [ -126.3726579, 54.5146475 ], [ -126.3722462, 54.5147856 ], [ -126.3719943, 54.5148112 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17103864, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 7318.5444297204303, "blue_line_key": 360880905, "length_metre": 1033.6522530790601, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4354223, 54.2206379 ], [ -126.4354382, 54.2206479 ], [ -126.435559500000011, 54.2206493 ], [ -126.4356535, 54.2206522 ], [ -126.4357462, 54.2206451 ], [ -126.435854100000014, 54.2206294 ], [ -126.4360687, 54.2206151 ], [ -126.4361925, 54.2206095 ], [ -126.436315799999988, 54.2206123 ], [ -126.436436499999985, 54.2206152 ], [ -126.436544500000011, 54.2206265 ], [ -126.4366505, 54.2206365 ], [ -126.436772, 54.2206579 ], [ -126.4368799, 54.2206693 ], [ -126.4370165, 54.2206892 ], [ -126.437137299999989, 54.2207191 ], [ -126.4372721, 54.2207576 ], [ -126.4374082, 54.220806 ], [ -126.4375278, 54.220853 ], [ -126.43764680000001, 54.2209014 ], [ -126.437766400000015, 54.2209484 ], [ -126.4378567, 54.2209954 ], [ -126.43793, 54.2210424 ], [ -126.437988499999989, 54.2210965 ], [ -126.438045899999977, 54.2211606 ], [ -126.438086899999988, 54.2212432 ], [ -126.438126, 54.2213244 ], [ -126.438152399999979, 54.221407 ], [ -126.438162800000015, 54.2214868 ], [ -126.4381885, 54.2215509 ], [ -126.4382167, 54.2216149 ], [ -126.4382405, 54.2217047 ], [ -126.438252800000015, 54.2217588 ], [ -126.4382938, 54.2218414 ], [ -126.438336, 54.221914 ], [ -126.438362900000016, 54.2219681 ], [ -126.4384179, 54.2220593 ], [ -126.4384624, 54.2221049 ], [ -126.4385632, 54.2221974 ], [ -126.4386834, 54.222263 ], [ -126.438770099999985, 54.2223271 ], [ -126.438875, 54.2223741 ], [ -126.4389507, 54.222394 ], [ -126.439055599999989, 54.2224139 ], [ -126.4391319, 54.2224524 ], [ -126.43922160000001, 54.2224809 ], [ -126.4393272, 54.2225193 ], [ -126.439462, 54.2225578 ], [ -126.4395968, 54.2225962 ], [ -126.439732899999981, 54.2226446 ], [ -126.439852500000015, 54.2226916 ], [ -126.4399715, 54.2227401 ], [ -126.4401234, 54.2227785 ], [ -126.44029, 54.2228099 ], [ -126.4404254, 54.2228398 ], [ -126.4405468, 54.2228682 ], [ -126.4406384, 54.2228982 ], [ -126.440727400000014, 54.2229352 ], [ -126.4408159, 54.2229736 ], [ -126.4409484, 54.2230662 ], [ -126.4410076, 54.2231118 ], [ -126.441080199999988, 54.2231673 ], [ -126.4411236, 54.2232229 ], [ -126.4411804, 54.2232955 ], [ -126.441207299999974, 54.2233496 ], [ -126.4412349, 54.2234223 ], [ -126.441262399999985, 54.2234678 ], [ -126.441287499999987, 54.2235405 ], [ -126.441299199999989, 54.2236302 ], [ -126.441310300000012, 54.2236943 ], [ -126.4415675, 54.2239962 ], [ -126.4415797, 54.2240233 ], [ -126.4416079, 54.2240874 ], [ -126.441649399999989, 54.2241415 ], [ -126.4416928, 54.224197 ], [ -126.441765499999988, 54.2242526 ], [ -126.441824, 54.2243067 ], [ -126.441912599999981, 54.2243722 ], [ -126.441987, 54.2244092 ], [ -126.4421476, 54.2245118 ], [ -126.4422532, 54.2245773 ], [ -126.4423405, 54.2246328 ], [ -126.4425053, 54.2246898 ], [ -126.4426108, 54.2247283 ], [ -126.4427921, 54.2247596 ], [ -126.442869500000015, 54.224761 ], [ -126.4430097, 54.2247368 ], [ -126.443121299999987, 54.224677 ], [ -126.443216400000011, 54.2246158 ], [ -126.443296800000013, 54.2245545 ], [ -126.4434095, 54.2244847 ], [ -126.4435509, 54.2244164 ], [ -126.4436301, 54.2243722 ], [ -126.4438337, 54.2243138 ], [ -126.44391, 54.2242982 ], [ -126.444049599999985, 54.224282500000015 ], [ -126.4441735, 54.2242768 ], [ -126.4442801, 54.2242782 ], [ -126.4443875, 54.2242982 ], [ -126.444462, 54.2243281 ], [ -126.4445657, 54.2243651 ], [ -126.444686599999983, 54.2244221 ], [ -126.4448424, 54.2246058 ], [ -126.444887, 54.2246514 ], [ -126.444913899999989, 54.2247055 ], [ -126.444926200000012, 54.2247596 ], [ -126.444922, 54.2248052 ], [ -126.4448862, 54.224912 ], [ -126.4448673, 54.2249647 ], [ -126.4447833, 54.225063 ], [ -126.4447492, 54.2251242 ], [ -126.4447322, 54.2251783 ], [ -126.4447286, 54.2252225 ], [ -126.4447409, 54.2252766 ], [ -126.444752, 54.2253407 ], [ -126.4449015, 54.2254062 ], [ -126.444974800000011, 54.2254532 ], [ -126.4451279, 54.225474600000013 ], [ -126.445220599999985, 54.2254674 ], [ -126.445312699999988, 54.2254689 ], [ -126.4453425, 54.2254603 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080408, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 226348.33223680599, "blue_line_key": 360873822, "length_metre": 131.949275606811, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2775722, 54.4944436 ], [ -126.2776862, 54.4943297 ], [ -126.27770049999998, 54.4941232 ], [ -126.27770670000001, 54.4940434 ], [ -126.2776725, 54.4938355 ], [ -126.2776266, 54.493619 ], [ -126.2775766, 54.493428199999983 ], [ -126.277585899999977, 54.4932843 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17067223, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1055.0069918629499, "blue_line_key": 360881574, "length_metre": 98.042963323513803, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6032629, 54.5608374 ], [ -126.6033945, 54.560883 ], [ -126.6038261, 54.5613558 ], [ -126.604101299999982, 54.5615552 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17080099, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 5033.0535144742598, "blue_line_key": 360875052, "length_metre": 133.64520524745001, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3732929, 54.494512 ], [ -126.3738882, 54.4956586 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17065126, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 2951.5748340299301, "blue_line_key": 360851751, "length_metre": 76.653973898349307, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.194232, 54.5738836 ], [ -126.1936241, 54.5732935 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17071170, "stream_order": 4, "gnis_name": "Perow Creek", "downstream_route_measure": 4262.8266095515301, "blue_line_key": 360836816, "length_metre": 552.99753247582601, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4788465, 54.541038 ], [ -126.4792042, 54.5412517 ], [ -126.4793841, 54.5413272 ], [ -126.47957310000001, 54.5415109 ], [ -126.479876100000013, 54.5416348 ], [ -126.4799501, 54.5416903 ], [ -126.4801751, 54.5417843 ], [ -126.480297299999989, 54.5418142 ], [ -126.4806156, 54.5419367 ], [ -126.4807839, 54.5419681 ], [ -126.4810441, 54.5419823 ], [ -126.4811693, 54.5419752 ], [ -126.4815081, 54.5419823 ], [ -126.4816932, 54.5419866 ], [ -126.4819569, 54.5419837 ], [ -126.48225, 54.5419809 ], [ -126.482620700000012, 54.541988 ], [ -126.4829006, 54.5419666 ], [ -126.4831669, 54.5419282 ], [ -126.4833545, 54.541904 ], [ -126.4836635, 54.541884 ], [ -126.4840058, 54.5418456 ], [ -126.4843507, 54.5418 ], [ -126.484519599999985, 54.5417943 ], [ -126.48487609999998, 54.5417929 ], [ -126.485232499999981, 54.5417915 ], [ -126.485401, 54.5417943 ], [ -126.485490700000014, 54.5418328 ], [ -126.48585, 54.5420279 ], [ -126.4860131, 54.542166 ], [ -126.486172700000012, 54.5423141 ], [ -126.4862304, 54.5423953 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17066332, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 4056.1975094282202, "blue_line_key": 360851751, "length_metre": 90.052502207066993, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1843227, 54.567037 ], [ -126.1842777, 54.5670185 ], [ -126.1838517, 54.5669102 ], [ -126.183546199999981, 54.5668575 ], [ -126.183208900000011, 54.5668319 ], [ -126.1830104, 54.5667821 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17104907, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 179.96456436429401, "blue_line_key": 360747189, "length_metre": 239.486974212082, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.9775838, 54.2068003 ], [ -125.9776802, 54.2066451 ], [ -125.9778059, 54.2064699 ], [ -125.9778646, 54.2064428 ], [ -125.9779103, 54.2064315 ], [ -125.9779373, 54.2064044 ], [ -125.97801290000001, 54.206384500000013 ], [ -125.978313500000013, 54.2062962 ], [ -125.9786006, 54.2062178 ], [ -125.9786445, 54.2061979 ], [ -125.9786896, 54.2061879 ], [ -125.9787354, 54.2061694 ], [ -125.979049799999984, 54.2060896 ], [ -125.979174300000011, 54.2060953 ], [ -125.979482100000013, 54.2061324 ], [ -125.9797886, 54.2061067 ], [ -125.9801074, 54.2060811 ], [ -125.980155900000014, 54.2060882 ], [ -125.9802173, 54.2060868 ], [ -125.980573, 54.2061324 ], [ -125.980680400000011, 54.2061381 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17087495, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 278567.21037860401, "blue_line_key": 360873822, "length_metre": 416.85223137167901, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.144969699999976, 54.4535503 ], [ -126.145056900000014, 54.4536144 ], [ -126.145308300000011, 54.4537739 ], [ -126.1456169, 54.453979 ], [ -126.145735, 54.4540801 ], [ -126.146012899999974, 54.4543023 ], [ -126.146213, 54.454523 ], [ -126.1463712, 54.4546897 ], [ -126.146473899999989, 54.4549702 ], [ -126.146348899999978, 54.4552366 ], [ -126.1462865, 54.4554516 ], [ -126.1461768, 54.4557094 ], [ -126.1459268, 54.4559828 ], [ -126.1459551, 54.456225 ], [ -126.145994800000011, 54.4563261 ], [ -126.1460238, 54.4565867 ], [ -126.146053900000013, 54.4568032 ], [ -126.1461047, 54.4569485 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099830, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 23441.397394745301, "blue_line_key": 360880905, "length_metre": 92.685444390401798, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.392027, 54.2813449 ], [ -126.3923313, 54.2813876 ], [ -126.3924388, 54.2814075 ], [ -126.3927272, 54.281467299999989 ], [ -126.392753, 54.2815314 ], [ -126.3927636, 54.2816041 ], [ -126.392743599999989, 54.2816667 ], [ -126.392654299999975, 54.2818618 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17106563, "stream_order": 4, "gnis_name": "Buck Creek", "downstream_route_measure": 61566.1735256342, "blue_line_key": 360886221, "length_metre": 680.98785229097302, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3934169, 54.1784158 ], [ -126.390614899999989, 54.1785939 ], [ -126.388552599999983, 54.1792642 ], [ -126.3832777, 54.1793829 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17095257, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 6863.8568654732899, "blue_line_key": 360886221, "length_metre": 42.1785700110444, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.622363, 54.360409 ], [ -126.6217139, 54.3603842 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17097912, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 29409.905702584801, "blue_line_key": 360880905, "length_metre": 259.67331810922099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.427345100000011, 54.3151613 ], [ -126.42728240000001, 54.315214 ], [ -126.4270908, 54.3152994 ], [ -126.4269052, 54.3153407 ], [ -126.4267144, 54.3154447 ], [ -126.4266287, 54.315568600000013 ], [ -126.4266412, 54.3156227 ], [ -126.4267221, 54.3157865 ], [ -126.4268959, 54.3159702 ], [ -126.427209, 54.3161468 ], [ -126.4272985, 54.3161768 ], [ -126.427671, 54.3163648 ], [ -126.4277983, 54.3165285 ], [ -126.427840799999984, 54.3166012 ], [ -126.427841199999975, 54.3168262 ], [ -126.4277376, 54.3170213 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17084143, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 3488.4382498792102, "blue_line_key": 360846413, "length_metre": 333.24745746744497, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.30452, 54.4773374 ], [ -126.3048547, 54.4772093 ], [ -126.305073400000012, 54.4771523 ], [ -126.3052965, 54.4770483 ], [ -126.3054517, 54.4770255 ], [ -126.3055604, 54.4770369 ], [ -126.305770400000014, 54.4771224 ], [ -126.3058766, 54.4771338 ], [ -126.306109100000015, 54.477121 ], [ -126.3062052, 54.4770782 ], [ -126.306272600000014, 54.4769985 ], [ -126.306311, 54.4768831 ], [ -126.3063763, 54.4768304 ], [ -126.3065941, 54.4768176 ], [ -126.306798399999977, 54.4767321 ], [ -126.3070661, 54.4766752 ], [ -126.3072074, 54.4766154 ], [ -126.3072898, 54.4765627 ], [ -126.3073556, 54.4765014 ], [ -126.307629099999986, 54.4763106 ], [ -126.3077613, 54.4761867 ], [ -126.3077977, 54.4761254 ], [ -126.307947699999986, 54.4759303 ], [ -126.3080685, 54.4757623 ], [ -126.3081171, 54.475701 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099123, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 26168.027294567299, "blue_line_key": 360880905, "length_metre": 996.46908018204704, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4175041, 54.2928852 ], [ -126.417626899999988, 54.2932384 ], [ -126.417333899999988, 54.293519 ], [ -126.4169753, 54.2937511 ], [ -126.4169621, 54.2939591 ], [ -126.4180061, 54.295423199999988 ], [ -126.4184168, 54.2955784 ], [ -126.4189213, 54.2956283 ], [ -126.4197192, 54.2953961 ], [ -126.4207413, 54.2953904 ], [ -126.422632799999988, 54.295718 ], [ -126.4231705, 54.2958661 ], [ -126.4234054, 54.2960626 ], [ -126.4236514, 54.2969328 ], [ -126.4240873, 54.297729 ], [ -126.4245111, 54.2980323 ], [ -126.42517620000001, 54.29833 ], [ -126.4252701, 54.2984226 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17080848, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 7324.4813374362802, "blue_line_key": 360875052, "length_metre": 565.24092447956798, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4015035, 54.4936907 ], [ -126.4040736, 54.4930664 ], [ -126.40823060000001, 54.490594 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17095095, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 6111.6789137410797, "blue_line_key": 360886221, "length_metre": 241.74912854457099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6254875, 54.3661138 ], [ -126.6249542, 54.3658005 ], [ -126.6243696, 54.364963 ], [ -126.624298, 54.3646155 ], [ -126.6243911, 54.364147 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17103011, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 9654.7447791639006, "blue_line_key": 360880905, "length_metre": 83.850308153947296, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4554401, 54.2319405 ], [ -126.4553597, 54.2319746 ], [ -126.455283499999979, 54.2319832 ], [ -126.4551755, 54.2319989 ], [ -126.4550201, 54.2320316 ], [ -126.4548944, 54.2320558 ], [ -126.4548017, 54.232063 ], [ -126.4546949, 54.2320686 ], [ -126.454616799999982, 54.2320758 ], [ -126.454524799999987, 54.2320743 ], [ -126.4544321, 54.2320815 ], [ -126.454341099999979, 54.2320701 ], [ -126.4542056, 54.2320402 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092971, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 18797.780488965302, "blue_line_key": 360862508, "length_metre": 78.7053086870784, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3442408, 54.4025636 ], [ -126.3441415, 54.402444 ], [ -126.3440153, 54.4022346 ], [ -126.3438552, 54.4021135 ], [ -126.3437508, 54.4020495 ], [ -126.3436009, 54.4019825 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099301, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 6684.2475090662401, "blue_line_key": 360877225, "length_metre": 278.81262538793499, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1847427, 54.2914439 ], [ -126.1848968, 54.2914297 ], [ -126.185052, 54.2914055 ], [ -126.185377699999989, 54.2913684 ], [ -126.185685699999979, 54.29134 ], [ -126.1860554, 54.29133 ], [ -126.1861019, 54.2913229 ], [ -126.1861502, 54.2913243 ], [ -126.186241200000012, 54.291308600000015 ], [ -126.186397, 54.2913029 ], [ -126.1864441, 54.2912944 ], [ -126.1865504, 54.2912972 ], [ -126.1866439, 54.291281600000012 ], [ -126.186927700000012, 54.2911719 ], [ -126.1869448, 54.2911449 ], [ -126.1870416, 54.2910665 ], [ -126.187093600000011, 54.2909768 ], [ -126.187171799999973, 54.2907546 ], [ -126.1872372, 54.2907019 ], [ -126.1874478, 54.2905453 ], [ -126.1877029, 54.2904071 ], [ -126.187750600000015, 54.29039 ], [ -126.1877818, 54.2903644 ], [ -126.1878601, 54.290330200000014 ], [ -126.1880942, 54.2902903 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080306, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 224045.92681514099, "blue_line_key": 360873822, "length_metre": 27.5697939559597, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.295969199999988, 54.4939993 ], [ -126.295698300000012, 54.4938084 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17093646, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 172034.07024734499, "blue_line_key": 360873822, "length_metre": 148.09525663725501, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6901996, 54.3936067 ], [ -126.690063, 54.3933732 ], [ -126.6900847, 54.3927052 ], [ -126.690401200000011, 54.3923363 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17088471, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 14.449745741968799, "blue_line_key": 360862508, "length_metre": 2063.5494656221599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5214777, 54.4575395 ], [ -126.521391400000013, 54.4574569 ], [ -126.521242399999977, 54.4573643 ], [ -126.5208656, 54.4571948 ], [ -126.5207611, 54.4571293 ], [ -126.5205362, 54.4570439 ], [ -126.520231200000012, 54.4569841 ], [ -126.5198955, 54.456914299999987 ], [ -126.519788299999988, 54.4568844 ], [ -126.519485, 54.456806 ], [ -126.519364, 54.4567946 ], [ -126.518993599999988, 54.4567961 ], [ -126.5187012, 54.4567633 ], [ -126.518456500000013, 54.4567135 ], [ -126.5181066, 54.4566351 ], [ -126.5178906, 54.4566294 ], [ -126.517518900000013, 54.4566764 ], [ -126.5173165, 54.4566807 ], [ -126.5172265, 54.4566437 ], [ -126.5171236, 54.4565596 ], [ -126.5169674, 54.4563688 ], [ -126.5167558, 54.4562734 ], [ -126.5166659, 54.4562364 ], [ -126.5165116, 54.456215 ], [ -126.5161433, 54.4561893 ], [ -126.5159921, 54.4561594 ], [ -126.515641100000011, 54.4560982 ], [ -126.5155198, 54.4560598 ], [ -126.5152225, 54.4558732 ], [ -126.51493880000001, 54.455696599999989 ], [ -126.514741, 54.4556667 ], [ -126.514467599999989, 54.4555798 ], [ -126.514242400000015, 54.4554673 ], [ -126.5141577, 54.4553662 ], [ -126.514031499999987, 54.4551668 ], [ -126.513868, 54.4550457 ], [ -126.5138075, 54.4550087 ], [ -126.513612900000012, 54.4549417 ], [ -126.513411, 54.4549375 ], [ -126.5131185, 54.4549403 ], [ -126.5127762, 54.4549873 ], [ -126.5124552, 54.4549175 ], [ -126.5122153, 54.454805 ], [ -126.5120533, 54.4546939 ], [ -126.5117889, 54.4544903 ], [ -126.5115208, 54.4543322 ], [ -126.5113364, 54.4542923 ], [ -126.511152199999984, 54.4542795 ], [ -126.5107818, 54.4542809 ], [ -126.51042910000001, 54.4542738 ], [ -126.510307200000014, 54.4542439 ], [ -126.510232, 54.4542069 ], [ -126.510173, 54.4541513 ], [ -126.5101607, 54.4540886 ], [ -126.5101502, 54.4540345 ], [ -126.510223, 54.4538195 ], [ -126.51022780000001, 54.4537568 ], [ -126.5101871, 54.4536842 ], [ -126.510066, 54.4536101 ], [ -126.509734, 54.4534948 ], [ -126.5096759, 54.4534577 ], [ -126.5094313, 54.4534079 ], [ -126.5092195, 54.4533409 ], [ -126.5090695, 54.4532655 ], [ -126.5089812, 54.4532099 ], [ -126.508908599999984, 54.4531373 ], [ -126.5087971, 54.452945 ], [ -126.5087431, 54.4527912 ], [ -126.508664599999989, 54.4525747 ], [ -126.508652699999985, 54.4525106 ], [ -126.5086641, 54.4523312 ], [ -126.508623, 54.4522315 ], [ -126.508329, 54.4520008 ], [ -126.508227800000014, 54.4518911 ], [ -126.508035, 54.45177 ], [ -126.507853700000013, 54.451686 ], [ -126.5077233, 54.4515479 ], [ -126.5077128, 54.4514937 ], [ -126.5077628, 54.451414 ], [ -126.5080201, 54.4512388 ], [ -126.508053800000013, 54.4511776 ], [ -126.5080336, 54.4510323 ], [ -126.5079752, 54.4509682 ], [ -126.5078566, 54.4508941 ], [ -126.5077819, 54.4508486 ], [ -126.507481, 54.450707599999987 ], [ -126.5074245, 54.450652 ], [ -126.507369499999982, 54.4505153 ], [ -126.507394, 54.4503544 ], [ -126.507468799999984, 54.4501407 ], [ -126.507477, 54.4500054 ], [ -126.50748440000001, 54.4499072 ], [ -126.5074613, 54.4497633 ], [ -126.5074824, 54.4496821 ], [ -126.5076627, 54.4495241 ], [ -126.5077358, 54.4493361 ], [ -126.5076798, 54.4492093 ], [ -126.5076238, 54.4491452 ], [ -126.5075325, 54.4490982 ], [ -126.5072622, 54.4490028 ], [ -126.5071886, 54.4489472 ], [ -126.5071615, 54.4488846 ], [ -126.5071497, 54.448820499999989 ], [ -126.5071534, 54.4487678 ], [ -126.507170500000015, 54.448705100000012 ], [ -126.5071819, 54.4485257 ], [ -126.5071001, 54.448353300000015 ], [ -126.5069876, 54.4481711 ], [ -126.5069627, 54.4480884 ], [ -126.5070024, 54.447919 ], [ -126.5070609, 54.447731 ], [ -126.5070659, 54.4476327 ], [ -126.50708, 54.4474177 ], [ -126.5070561, 54.447318 ], [ -126.50700040000001, 54.4472183 ], [ -126.5068989, 54.4470815 ], [ -126.506875, 54.4469818 ], [ -126.5068701, 54.446828 ], [ -126.5068802, 54.4466315 ], [ -126.506886, 54.4465588 ], [ -126.5069301, 54.4463352 ], [ -126.5069698, 54.4461658 ], [ -126.506981200000013, 54.4459863 ], [ -126.5070732, 54.4457727 ], [ -126.507222899999988, 54.445569 ], [ -126.507328199999989, 54.4453454 ], [ -126.5073375, 54.445193 ], [ -126.5073297, 54.4451033 ], [ -126.5072774, 54.444931 ], [ -126.5072565, 54.4447601 ], [ -126.5072305, 54.4446874 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100679, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 9827.8734935314496, "blue_line_key": 360877225, "length_metre": 906.56377937672005, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.196737, 54.2707744 ], [ -126.196896699999982, 54.2706704 ], [ -126.1969444, 54.2706533 ], [ -126.1970098, 54.2706006 ], [ -126.1971046, 54.2705679 ], [ -126.197149200000013, 54.2705593 ], [ -126.1971969, 54.2705422 ], [ -126.197367899999989, 54.270528 ], [ -126.1976739, 54.2705451 ], [ -126.1980084, 54.2705707 ], [ -126.198332, 54.2705864 ], [ -126.198467, 54.270617699999988 ], [ -126.1987365, 54.2707217 ], [ -126.198781700000012, 54.2707317 ], [ -126.19906850000001, 54.2708014 ], [ -126.1993884, 54.2708541 ], [ -126.199565799999974, 54.2709567 ], [ -126.1997401, 54.2711148 ], [ -126.199752299999986, 54.2711418 ], [ -126.1998101, 54.2711974 ], [ -126.1998247, 54.2712244 ], [ -126.1998539, 54.2712515 ], [ -126.199866, 54.2712785 ], [ -126.199880600000014, 54.2713056 ], [ -126.1999659, 54.2714067 ], [ -126.199995699999974, 54.2714252 ], [ -126.200052399999976, 54.2714908 ], [ -126.200201099999987, 54.2715648 ], [ -126.200412300000011, 54.2716147 ], [ -126.200518599999981, 54.2716175 ], [ -126.2007373, 54.2715862 ], [ -126.2009396, 54.2715463 ], [ -126.2011539, 54.2715335 ], [ -126.2012951, 54.2715007 ], [ -126.2016392, 54.2714195 ], [ -126.2017791, 54.2713768 ], [ -126.202078, 54.2712857 ], [ -126.2021727, 54.271233 ], [ -126.2025378, 54.2710806 ], [ -126.2027305, 54.2709595 ], [ -126.202796, 54.2708798 ], [ -126.2028195, 54.2707815 ], [ -126.2028328, 54.2705565 ], [ -126.2028226, 54.2704838 ], [ -126.2027903, 54.2702773 ], [ -126.202739900000012, 54.2701406 ], [ -126.202645100000012, 54.2699583 ], [ -126.2025631, 54.2697945 ], [ -126.2024391, 54.2695852 ], [ -126.2023577, 54.2694399 ], [ -126.2023443, 54.2693758 ], [ -126.202385599999985, 54.2692419 ], [ -126.202569399999987, 54.2690312 ], [ -126.2025733, 54.2689599 ], [ -126.2025212, 54.2688147 ], [ -126.202436600000013, 54.268705 ], [ -126.20236460000001, 54.268648 ], [ -126.2021377, 54.2685811 ], [ -126.2017599, 54.2684999 ], [ -126.20165440000001, 54.2684615 ], [ -126.2014763, 54.2683675 ], [ -126.2014081, 54.2682663 ], [ -126.2014356, 54.2680698 ], [ -126.2016607, 54.2679131 ], [ -126.201958399999981, 54.267597 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076546, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 209395.034475947, "blue_line_key": 360873822, "length_metre": 1609.1739839920399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4241378, 54.5131292 ], [ -126.4236347, 54.5129056 ], [ -126.4228539, 54.512760400000012 ], [ -126.4222403, 54.5127262 ], [ -126.4215533, 54.5128245 ], [ -126.421107699999979, 54.5128287 ], [ -126.4197842, 54.512608 ], [ -126.418777299999988, 54.512373 ], [ -126.4180615, 54.5123716 ], [ -126.4178002, 54.512494 ], [ -126.417553200000015, 54.5127646 ], [ -126.4173786, 54.5134169 ], [ -126.4170295, 54.514035 ], [ -126.4166271, 54.5145535 ], [ -126.4162257, 54.5148027 ], [ -126.4159188, 54.5149223 ], [ -126.4154175, 54.515050500000015 ], [ -126.4149648, 54.515103200000013 ], [ -126.41374110000001, 54.5150875 ], [ -126.41248109999998, 54.5149793 ], [ -126.411708, 54.5147001 ], [ -126.4114612, 54.5145435 ], [ -126.4112407, 54.5142487 ], [ -126.410906599999976, 54.5140749 ], [ -126.4095599, 54.5138015 ], [ -126.4090232, 54.5137716 ], [ -126.408415, 54.5138129 ], [ -126.408081700000011, 54.5139097 ], [ -126.407443300000011, 54.5142472 ], [ -126.4070527, 54.5146475 ], [ -126.4068802, 54.51525130000001 ], [ -126.4070365, 54.5156942 ], [ -126.4070381, 54.5163893 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17083340, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1613.71944150903, "blue_line_key": 360875052, "length_metre": 142.76421965176101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.339124799999979, 54.4796233 ], [ -126.3392421, 54.4797073 ], [ -126.339385299999989, 54.479864 ], [ -126.3394333, 54.480089 ], [ -126.3394094, 54.4802329 ], [ -126.3394261, 54.4804493 ], [ -126.3394438, 54.4806558 ], [ -126.339436100000015, 54.4807541 ], [ -126.3393989, 54.4808524 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17073147, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1585.14923194585, "blue_line_key": 360881632, "length_metre": 302.85104915537102, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.650744499999988, 54.5316354 ], [ -126.6507655, 54.5315101 ], [ -126.6508023, 54.5314389 ], [ -126.650935300000015, 54.5312523 ], [ -126.6513347, 54.5310543 ], [ -126.651669, 54.5308891 ], [ -126.6519625, 54.5308777 ], [ -126.652178, 54.530872 ], [ -126.652416500000015, 54.530778 ], [ -126.652626099999978, 54.5306114 ], [ -126.6527276, 54.5304875 ], [ -126.6528124, 54.5303266 ], [ -126.6528649, 54.5302383 ], [ -126.652854600000012, 54.53014 ], [ -126.6528884, 54.5300773 ], [ -126.653080800000012, 54.5299819 ], [ -126.653303099999988, 54.5298779 ], [ -126.653415900000013, 54.5297996 ], [ -126.653498399999989, 54.5297028 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092121, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 15490.9781226183, "blue_line_key": 360862508, "length_metre": 33.115807847907298, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.367308499999979, 54.4121841 ], [ -126.3670674, 54.4121257 ], [ -126.36682, 54.4121471 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080240, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 224174.532695228, "blue_line_key": 360873822, "length_metre": 218.03202161943699, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2944117, 54.4941388 ], [ -126.2940922, 54.494314 ], [ -126.294055199999974, 54.4944806 ], [ -126.2940767, 54.494544700000013 ], [ -126.294541, 54.494868 ], [ -126.2945099, 54.4950389 ], [ -126.294332099999977, 54.4951187 ], [ -126.2939736, 54.4951614 ], [ -126.293446300000014, 54.4950717 ], [ -126.293211699999986, 54.4952355 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101254, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 16974.662856415202, "blue_line_key": 360880905, "length_metre": 421.89431401603798, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3897148, 54.257901 ], [ -126.3895263, 54.2579779 ], [ -126.3893641, 54.2581103 ], [ -126.3892701, 54.2581345 ], [ -126.389148100000014, 54.258141599999988 ], [ -126.3888386, 54.2581616 ], [ -126.3884876, 54.2581274 ], [ -126.388288599999981, 54.2581317 ], [ -126.387949800000015, 54.2581246 ], [ -126.3875969, 54.258116 ], [ -126.387335600000014, 54.2581374 ], [ -126.387009800000016, 54.2582029 ], [ -126.386698, 54.2582769 ], [ -126.38652350000001, 54.2583624 ], [ -126.3864888, 54.2584251 ], [ -126.386481, 54.2585148 ], [ -126.386382199999986, 54.2586202 ], [ -126.3863347, 54.2586643 ], [ -126.385963600000011, 54.2587199 ], [ -126.385609, 54.2587298 ], [ -126.3853178, 54.2587327 ], [ -126.3852073, 54.2587484 ], [ -126.3851146, 54.2587825 ], [ -126.3849131, 54.2587868 ], [ -126.3848357, 54.2588124 ], [ -126.384533100000013, 54.2589762 ], [ -126.3843463, 54.2590076 ], [ -126.384080900000015, 54.2591016 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17060330, "stream_order": 4, "gnis_name": "Richfield Creek", "downstream_route_measure": 19943.505694936401, "blue_line_key": 360788426, "length_metre": 110.038782679942, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1754153, 54.5982699 ], [ -126.1753393, 54.5982414 ], [ -126.1752388, 54.5981574 ], [ -126.1750987, 54.597921 ], [ -126.175084399999974, 54.5977045 ], [ -126.174995599999988, 54.5976219 ], [ -126.174624900000012, 54.5976133 ], [ -126.174532500000012, 54.5976105 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17098398, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 28191.1386889366, "blue_line_key": 360880905, "length_metre": 97.306199459328397, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.427165699999989, 54.3057359 ], [ -126.4271629, 54.3057985 ], [ -126.427235900000014, 54.3058541 ], [ -126.4273417, 54.3058655 ], [ -126.4274154, 54.3059395 ], [ -126.427282100000014, 54.3060805 ], [ -126.4272594, 54.3062059 ], [ -126.4272831, 54.3063312 ], [ -126.427249199999977, 54.3063853 ], [ -126.427168599999987, 54.3064195 ], [ -126.427061599999988, 54.3064252 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17095237, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 6353.42804228565, "blue_line_key": 360886221, "length_metre": 451.40704660747599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6243911, 54.364147 ], [ -126.6245648, 54.3638949 ], [ -126.6251289, 54.3634705 ], [ -126.625319599999983, 54.36317 ], [ -126.6251382, 54.3622841 ], [ -126.6250515, 54.3620847 ], [ -126.6248786, 54.3619152 ], [ -126.624068099999988, 54.3615563 ], [ -126.623132399999989, 54.3606819 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101641, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 14933.2678529491, "blue_line_key": 360880905, "length_metre": 212.28710754201299, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4107107, 54.2516928 ], [ -126.4106949, 54.2517099 ], [ -126.4105956, 54.2518167 ], [ -126.410548599999984, 54.2518595 ], [ -126.410450499999982, 54.2519292 ], [ -126.4103261, 54.2519634 ], [ -126.4102028, 54.2519876 ], [ -126.410093, 54.2519948 ], [ -126.409954500000012, 54.2520005 ], [ -126.4098165, 54.2519976 ], [ -126.409683399999977, 54.2519406 ], [ -126.4096106, 54.251858 ], [ -126.4095977, 54.2518125 ], [ -126.409603, 54.2517227 ], [ -126.4096213, 54.2516786 ], [ -126.409629099999975, 54.2515889 ], [ -126.4095703, 54.2515148 ], [ -126.409453, 54.2514407 ], [ -126.4093773, 54.2514208 ], [ -126.4092851, 54.2514194 ], [ -126.409193, 54.251418 ], [ -126.4091173, 54.2514251 ], [ -126.4090233, 54.2514222 ], [ -126.408808499999978, 54.2514365 ], [ -126.4086999, 54.2514607 ], [ -126.4086194, 54.2514949 ], [ -126.4085719, 54.251539 ], [ -126.4085542, 54.2515746 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17077784, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 217682.84333808301, "blue_line_key": 360873822, "length_metre": 165.495219385703, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.344089, 54.5075478 ], [ -126.3438302, 54.5073982 ], [ -126.343891, 54.5069126 ], [ -126.3437942, 54.5065608 ], [ -126.343597800000012, 54.5064568 ], [ -126.343367699999988, 54.5064554 ], [ -126.3431567, 54.5065252 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17071864, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 626.07733945099596, "blue_line_key": 360881632, "length_metre": 36.880574329118403, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.640203, 54.5369947 ], [ -126.640464099999988, 54.5368281 ], [ -126.64058630000001, 54.5367498 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17097253, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 10031.8753386956, "blue_line_key": 360886221, "length_metre": 2183.86930347831, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6128381, 54.3389883 ], [ -126.612828, 54.3388986 ], [ -126.6129424, 54.3387747 ], [ -126.613071600000012, 54.3386778 ], [ -126.6133701, 54.3385582 ], [ -126.6134945, 54.338524 ], [ -126.6136197, 54.3385084 ], [ -126.6139741, 54.3384799 ], [ -126.6143609, 54.3384428 ], [ -126.6145795, 54.3384115 ], [ -126.6149033, 54.3383731 ], [ -126.615244100000012, 54.3383346 ], [ -126.6153699, 54.3383104 ], [ -126.615667800000011, 54.3381993 ], [ -126.616045599999978, 54.3380626 ], [ -126.616251699999978, 54.3379415 ], [ -126.6164306, 54.3378005 ], [ -126.6164947, 54.3377293 ], [ -126.6166129, 54.3375527 ], [ -126.6166487, 54.3374715 ], [ -126.616719300000014, 54.337312 ], [ -126.616819, 54.3371881 ], [ -126.6170457, 54.3369944 ], [ -126.6170729, 54.336770800000011 ], [ -126.617024199999989, 54.3365543 ], [ -126.6168965, 54.3363891 ], [ -126.616720299999983, 54.336251 ], [ -126.616589100000013, 54.3360957 ], [ -126.6164329, 54.3358864 ], [ -126.6164106, 54.3357411 ], [ -126.616403, 54.3355887 ], [ -126.616424199999983, 54.3355075 ], [ -126.616434, 54.3353196 ], [ -126.616468200000014, 54.3352569 ], [ -126.616527399999981, 54.3350603 ], [ -126.6165472, 54.3349621 ], [ -126.616555599999984, 54.3348268 ], [ -126.6165502, 54.3346473 ], [ -126.6165089, 54.3345562 ], [ -126.616444, 54.3343582 ], [ -126.6164006, 54.3342941 ], [ -126.616167300000015, 54.3340819 ], [ -126.616140399999978, 54.3340193 ], [ -126.6161382, 54.3338028 ], [ -126.616253699999987, 54.3336618 ], [ -126.616508400000015, 54.3335137 ], [ -126.6168063, 54.3334026 ], [ -126.6170122, 54.3333171 ], [ -126.617106400000011, 54.3332644 ], [ -126.617366, 54.3330536 ], [ -126.617499400000014, 54.3328685 ], [ -126.6176599, 54.3327731 ], [ -126.617822, 54.3325965 ], [ -126.6178622, 54.3324612 ], [ -126.617854, 54.3323173 ], [ -126.6179412, 54.3321664 ], [ -126.6182416, 54.3319926 ], [ -126.6185392, 54.3319171 ], [ -126.6187586, 54.3318416 ], [ -126.6190687, 54.3317932 ], [ -126.6192713, 54.3317519 ], [ -126.6193226, 54.3316821 ], [ -126.619485099999977, 54.3315326 ], [ -126.6196029, 54.331336 ], [ -126.6196561, 54.3312121 ], [ -126.6198185, 54.3310626 ], [ -126.6201061, 54.3308974 ], [ -126.6203155, 54.3307393 ], [ -126.620523499999976, 54.3305641 ], [ -126.6207597, 54.3304687 ], [ -126.6208406, 54.330426 ], [ -126.620955, 54.3303021 ], [ -126.6209751, 54.33023080000001 ], [ -126.62101819999998, 54.3300243 ], [ -126.6210259, 54.3298634 ], [ -126.6210544, 54.3296569 ], [ -126.6211098, 54.3295059 ], [ -126.621243100000015, 54.3293279 ], [ -126.621328399999982, 54.3291684 ], [ -126.6215573, 54.3289476 ], [ -126.6216253, 54.3288237 ], [ -126.621704799999989, 54.328771 ], [ -126.6218061, 54.3286286 ], [ -126.6218591, 54.3284776 ], [ -126.621963099999988, 54.3282996 ], [ -126.622029599999976, 54.3282284 ], [ -126.6221755, 54.3280703 ], [ -126.622240299999987, 54.3280176 ], [ -126.622510299999988, 54.327861 ], [ -126.622712799999974, 54.3278197 ], [ -126.6227772, 54.3277755 ], [ -126.6228274, 54.3277228 ], [ -126.6228445, 54.3276601 ], [ -126.6228204, 54.3275619 ], [ -126.6227623, 54.3274978 ], [ -126.6225073, 54.3273753 ], [ -126.622160900000011, 54.3272699 ], [ -126.6220699, 54.3272229 ], [ -126.6219687, 54.3271218 ], [ -126.6219282, 54.3270492 ], [ -126.6219242, 54.3268241 ], [ -126.6219666, 54.3266547 ], [ -126.6220502, 54.3265208 ], [ -126.622196300000013, 54.3263898 ], [ -126.6225143, 54.3262075 ], [ -126.622785799999988, 54.3260323 ], [ -126.622989499999989, 54.3259739 ], [ -126.6231133, 54.3259483 ], [ -126.6233952, 54.3258827 ], [ -126.623768499999983, 54.3258001 ], [ -126.624018, 54.3257503 ], [ -126.62434660000001, 54.3256492 ], [ -126.6244726, 54.3255894 ], [ -126.6246186, 54.3254654 ], [ -126.624828499999978, 54.3252988 ], [ -126.6250371, 54.3251151 ], [ -126.6251816, 54.3250097 ], [ -126.625455800000012, 54.3247989 ], [ -126.6256345, 54.3246237 ], [ -126.625736300000014, 54.3244728 ], [ -126.6257559, 54.3244101 ], [ -126.6257907, 54.3243389 ], [ -126.6258901, 54.3241879 ], [ -126.6260068, 54.324064 ], [ -126.626183900000015, 54.3239145 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17070561, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 5303.2456743687899, "blue_line_key": 360856488, "length_metre": 216.080662825188, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.432146, 54.5445772 ], [ -126.4322494, 54.5446328 ], [ -126.432502, 54.5448094 ], [ -126.4326623, 54.5449831 ], [ -126.432743, 54.545174 ], [ -126.432915600000015, 54.5453477 ], [ -126.4329663, 54.5455471 ], [ -126.433037599999977, 54.5456382 ], [ -126.4333013, 54.5458604 ], [ -126.433386700000014, 54.5459957 ], [ -126.4333945, 54.5461139 ], [ -126.433273399999976, 54.5462991 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091660, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 6860.0608005802496, "blue_line_key": 360862508, "length_metre": 49.454600955133202, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4741343, 54.4167772 ], [ -126.4739943, 54.4166604 ], [ -126.4738797, 54.416367 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17092673, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 177078.90148859899, "blue_line_key": 360873822, "length_metre": 1460.53749863046, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6403039, 54.4044991 ], [ -126.639889, 54.4046785 ], [ -126.639940699999983, 54.4048181 ], [ -126.640421299999986, 54.4053422 ], [ -126.640582, 54.405731 ], [ -126.640554099999989, 54.4062537 ], [ -126.6402876, 54.4064289 ], [ -126.640016800000012, 54.4064688 ], [ -126.639710099999988, 54.406436 ], [ -126.639017599999974, 54.406127 ], [ -126.6387013, 54.4060372 ], [ -126.6380825, 54.4060928 ], [ -126.637734, 54.4064118 ], [ -126.637525199999985, 54.4070185 ], [ -126.637393100000011, 54.4072151 ], [ -126.636733299999989, 54.4075426 ], [ -126.6364392, 54.4075512 ], [ -126.636139, 54.4074928 ], [ -126.634752299999988, 54.4063876 ], [ -126.634309699999989, 54.4061056 ], [ -126.6337965, 54.4059703 ], [ -126.633144899999976, 54.4060216 ], [ -126.6328801, 54.4061284 ], [ -126.632655499999984, 54.4064289 ], [ -126.6325807, 54.406728 ], [ -126.6326352, 54.4074073 ], [ -126.632529299999973, 54.407648 ], [ -126.6322215, 54.4078645 ], [ -126.631784200000013, 54.4080027 ], [ -126.6311833, 54.4081052 ], [ -126.629282299999986, 54.4082163 ], [ -126.6287517, 54.4083487 ], [ -126.6279422, 54.4084527 ], [ -126.6274606, 54.4086621 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17103799, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 31950.2707837829, "blue_line_key": 360881038, "length_metre": 343.69537785750998, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0611628, 54.2242597 ], [ -126.0610822, 54.2241144 ], [ -126.0610802, 54.2239079 ], [ -126.06104, 54.2238253 ], [ -126.060940699999989, 54.2237242 ], [ -126.060894399999981, 54.2237043 ], [ -126.060849399999981, 54.2236943 ], [ -126.0605433, 54.2236786 ], [ -126.0604969, 54.2236857 ], [ -126.0603763, 54.2236558 ], [ -126.060318599999988, 54.2236274 ], [ -126.06028950000001, 54.2236003 ], [ -126.0600223, 54.2234593 ], [ -126.0599619, 54.2234579 ], [ -126.059641899999988, 54.2234137 ], [ -126.059524, 54.2233568 ], [ -126.0594679, 54.2232841 ], [ -126.059461700000014, 54.2231488 ], [ -126.059532800000014, 54.2230149 ], [ -126.0595985, 54.2229622 ], [ -126.0596152, 54.2229366 ], [ -126.0596471, 54.2229096 ], [ -126.0597223, 54.2227315 ], [ -126.0596933, 54.2227045 ], [ -126.0596789, 54.2226774 ], [ -126.0595193, 54.2225749 ], [ -126.059427299999982, 54.2225535 ], [ -126.059183300000015, 54.2225478 ], [ -126.059138299999987, 54.2225378 ], [ -126.0590781, 54.2225093 ], [ -126.0588113, 54.222386899999989 ], [ -126.058590400000014, 54.2222459 ], [ -126.0585141, 54.2222345 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17066274, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 3795.88673887203, "blue_line_key": 360851751, "length_metre": 260.31077055619198, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1873826, 54.5684398 ], [ -126.1873737, 54.5683401 ], [ -126.1871705, 54.568165 ], [ -126.1869175, 54.5680055 ], [ -126.1865541, 54.5678801 ], [ -126.186188699999988, 54.5678089 ], [ -126.185902399999989, 54.567695 ], [ -126.1856369, 54.5675084 ], [ -126.185306, 54.5673745 ], [ -126.1849719, 54.5672777 ], [ -126.184685, 54.5671723 ], [ -126.1843227, 54.567037 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17094486, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 1347.6470296259999, "blue_line_key": 360886524, "length_metre": 236.50645590346801, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1545508, 54.3794942 ], [ -126.1547785, 54.3793105 ], [ -126.1548366, 54.3791496 ], [ -126.154981, 54.3790542 ], [ -126.1551513, 54.3790499 ], [ -126.15525719999998, 54.3790613 ], [ -126.1555517, 54.3790584 ], [ -126.1558003, 54.37902 ], [ -126.156059899999988, 54.3790527 ], [ -126.1561609, 54.3789288 ], [ -126.15632, 54.3788334 ], [ -126.1564468, 54.3788007 ], [ -126.1565717, 54.3787864 ], [ -126.1568497, 54.378775 ], [ -126.1570824, 54.3787266 ], [ -126.157256899999979, 54.3786497 ], [ -126.1573854, 54.3785714 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17070949, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 15019.6112134584, "blue_line_key": 360875378, "length_metre": 1612.8992026952999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.618465500000013, 54.5486861 ], [ -126.6186393, 54.5486091 ], [ -126.618764, 54.548575 ], [ -126.6190808, 54.5484824 ], [ -126.6193194, 54.5483528 ], [ -126.619696499999989, 54.5482346 ], [ -126.6199366, 54.5481221 ], [ -126.6202445, 54.5481192 ], [ -126.620494, 54.5481149 ], [ -126.62088, 54.5481135 ], [ -126.621251299999983, 54.5481121 ], [ -126.6214536, 54.548080800000015 ], [ -126.62162690000001, 54.5480124 ], [ -126.6218689, 54.5478728 ], [ -126.622074200000014, 54.5477689 ], [ -126.622325600000011, 54.5477019 ], [ -126.6225284, 54.5476692 ], [ -126.62262410000001, 54.5476264 ], [ -126.6229207, 54.547578 ], [ -126.6231103, 54.5475196 ], [ -126.623317500000013, 54.5474242 ], [ -126.623478, 54.5472932 ], [ -126.623636100000013, 54.5472334 ], [ -126.6238998, 54.5472376 ], [ -126.6241463, 54.5472348 ], [ -126.624256299999985, 54.5472006 ], [ -126.624573, 54.547108 ], [ -126.6248882, 54.547005500000012 ], [ -126.6251224, 54.5469385 ], [ -126.625311, 54.5468973 ], [ -126.6254838, 54.5468374 ], [ -126.625566299999974, 54.5467762 ], [ -126.6258721, 54.5465583 ], [ -126.626036099999979, 54.5463817 ], [ -126.6262044, 54.546178 ], [ -126.6263497, 54.5460555 ], [ -126.626428799999985, 54.5460114 ], [ -126.6267813, 54.5458291 ], [ -126.627080299999989, 54.5457095 ], [ -126.627190200000015, 54.5456753 ], [ -126.6274146, 54.5455727 ], [ -126.6275737, 54.5454673 ], [ -126.627796600000011, 54.5453548 ], [ -126.6280283, 54.5453591 ], [ -126.628139800000014, 54.5453349 ], [ -126.628176599999989, 54.54522810000001 ], [ -126.6282163, 54.5450842 ], [ -126.6282658, 54.5450045 ], [ -126.628287899999989, 54.5448977 ], [ -126.62831629999998, 54.5446726 ], [ -126.6283869, 54.5445032 ], [ -126.6284742, 54.5443351 ], [ -126.6285581, 54.5442197 ], [ -126.6285787, 54.5441385 ], [ -126.628569899999988, 54.5440218 ], [ -126.628561499999989, 54.5438964 ], [ -126.628419, 54.5437042 ], [ -126.6283929, 54.543623 ], [ -126.628386, 54.5434791 ], [ -126.628420299999988, 54.5434079 ], [ -126.628506699999988, 54.543257 ], [ -126.6286554, 54.5430889 ], [ -126.628799699999973, 54.5429835 ], [ -126.6290722, 54.5428269 ], [ -126.6292484, 54.5427143 ], [ -126.629329399999989, 54.5426787 ], [ -126.629663699999981, 54.5425064 ], [ -126.6300222, 54.54244940000001 ], [ -126.6302554, 54.5424281 ], [ -126.6306167, 54.542327 ], [ -126.630948600000011, 54.5422258 ], [ -126.6310723, 54.5422016 ], [ -126.6314494, 54.542119 ], [ -126.6315422, 54.5420848 ], [ -126.631877499999987, 54.5419382 ], [ -126.6320631, 54.5419054 ], [ -126.6321873, 54.5419082 ], [ -126.632559499999985, 54.5418968 ], [ -126.632884100000012, 54.5418954 ], [ -126.6331777, 54.5418912 ], [ -126.633516500000013, 54.5419339 ], [ -126.633868100000015, 54.5420037 ], [ -126.634115099999988, 54.5419994 ], [ -126.6344254, 54.5419965 ], [ -126.6345467, 54.5420079 ], [ -126.634683699999982, 54.5420378 ], [ -126.6347932, 54.5420407 ], [ -126.635133, 54.542037799999989 ], [ -126.635504200000014, 54.5420364 ], [ -126.6358901, 54.542035 ], [ -126.636186199999983, 54.5419951 ], [ -126.6362672, 54.5419524 ], [ -126.6365563, 54.5417687 ], [ -126.6366063, 54.5416804 ], [ -126.636612700000015, 54.5415906 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17094791, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 4971.5075322285502, "blue_line_key": 360886221, "length_metre": 322.31171133943701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6310117, 54.3726267 ], [ -126.63125, 54.3724416 ], [ -126.6314583, 54.3721325 ], [ -126.63143740000001, 54.3720243 ], [ -126.63103959999998, 54.3717494 ], [ -126.6306319, 54.3715657 ], [ -126.6302054, 54.371513 ], [ -126.6298162, 54.3715842 ], [ -126.6294178, 54.3717309 ], [ -126.6290346, 54.3717081 ], [ -126.628645600000013, 54.3715059 ], [ -126.628553299999979, 54.3712452 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080354, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 225280.61183671001, "blue_line_key": 360873822, "length_metre": 8.9706130519313696, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2877947, 54.4935321 ], [ -126.2878715, 54.4935991 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17068790, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 6415.3815888536701, "blue_line_key": 360856488, "length_metre": 477.87971705377498, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.438349, 54.5526824 ], [ -126.4383448, 54.5527365 ], [ -126.4383354, 54.5528974 ], [ -126.4383611, 54.5529786 ], [ -126.4385972, 54.5531467 ], [ -126.438603500000013, 54.5532905 ], [ -126.4385536, 54.5533703 ], [ -126.438394100000011, 54.5534472 ], [ -126.4381513, 54.5536224 ], [ -126.4378903, 54.5538146 ], [ -126.437787499999985, 54.5539827 ], [ -126.4376579, 54.5540795 ], [ -126.4375704, 54.5542391 ], [ -126.4375813, 54.5543202 ], [ -126.4376381, 54.5543758 ], [ -126.437836300000015, 54.55443420000001 ], [ -126.4381836, 54.5545581 ], [ -126.4383498, 54.5546236 ], [ -126.4384962, 54.5547532 ], [ -126.4385151, 54.5549597 ], [ -126.4385665, 54.5551149 ], [ -126.4385859, 54.5553129 ], [ -126.4386279, 54.5553756 ], [ -126.438830900000013, 54.5555963 ], [ -126.438844, 54.5556504 ], [ -126.439037699999986, 54.5557359 ], [ -126.4392175, 54.555847 ], [ -126.4393172, 54.5559837 ], [ -126.4394006, 54.5561389 ], [ -126.4394735, 54.5562116 ], [ -126.439577, 54.55626 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17073939, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 2296.7139006037401, "blue_line_key": 360881632, "length_metre": 187.54432904967501, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.654808499999973, 54.526545299999988 ], [ -126.654848699999974, 54.5263573 ], [ -126.654891799999987, 54.5261608 ], [ -126.654932500000015, 54.5259998 ], [ -126.654954499999988, 54.5258645 ], [ -126.6549613, 54.5257663 ], [ -126.655029500000012, 54.5256324 ], [ -126.6550511, 54.5255341 ], [ -126.6550741, 54.5253817 ], [ -126.6551167, 54.5251937 ], [ -126.6551506, 54.5251311 ], [ -126.6552673, 54.5249986 ], [ -126.655349300000012, 54.5249103 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17075878, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 212504.41410738599, "blue_line_key": 360873822, "length_metre": 200.751735831834, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3959042, 54.5162696 ], [ -126.3954044, 54.5160788 ], [ -126.3950226, 54.5160133 ], [ -126.3947157, 54.5160489 ], [ -126.3942554, 54.5162767 ], [ -126.3938154, 54.516412 ], [ -126.393434, 54.516422 ], [ -126.3931375, 54.516365 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091723, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 12579.3420107038, "blue_line_key": 360846413, "length_metre": 316.93807971637801, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2803309, 54.4190383 ], [ -126.2807297, 54.4162082 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17104990, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1133.84065129377, "blue_line_key": 360747189, "length_metre": 83.118997950958601, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.9908587, 54.2049873 ], [ -125.991023700000014, 54.204956 ], [ -125.991328099999976, 54.2049033 ], [ -125.991524, 54.2048805 ], [ -125.9916176, 54.2048776 ], [ -125.9919831, 54.2048506 ], [ -125.9920282, 54.2048406 ], [ -125.9921042, 54.2048392 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17102128, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 13863.026231596799, "blue_line_key": 360877225, "length_metre": 78.513172845776495, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.204231299999989, 54.2449207 ], [ -126.2043629, 54.2448068 ], [ -126.2044424, 54.244762600000016 ], [ -126.204731099999989, 54.2445718 ], [ -126.20501920000001, 54.244389500000011 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17096457, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 12220.385984180401, "blue_line_key": 360886524, "length_metre": 1437.71812092706, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.270448699999989, 54.347243 ], [ -126.270268699999988, 54.3471932 ], [ -126.270054399999978, 54.3471433 ], [ -126.269738, 54.347065 ], [ -126.2696675, 54.3469553 ], [ -126.2696575, 54.3468742 ], [ -126.2696846, 54.3467033 ], [ -126.269696599999989, 54.3465338 ], [ -126.269746, 54.3464711 ], [ -126.2698633, 54.3463486 ], [ -126.2700369, 54.3462803 ], [ -126.270072200000016, 54.3462091 ], [ -126.270076899999978, 54.3461279 ], [ -126.2700205, 54.3460467 ], [ -126.2699617, 54.3459997 ], [ -126.269653, 54.3457775 ], [ -126.2696265, 54.345722 ], [ -126.269577200000015, 54.3455326 ], [ -126.2695873, 54.3453887 ], [ -126.269569799999985, 54.3451722 ], [ -126.269591099999985, 54.3450925 ], [ -126.2696424, 54.3450312 ], [ -126.269721800000013, 54.3449871 ], [ -126.2698324, 54.344944399999989 ], [ -126.2699701, 54.3449486 ], [ -126.2702667, 54.3448917 ], [ -126.2704832, 54.3448874 ], [ -126.270592099999973, 54.3448632 ], [ -126.2707663, 54.3447863 ], [ -126.2708316, 54.3447336 ], [ -126.2708658, 54.3446723 ], [ -126.2708576, 54.3445456 ], [ -126.2708213, 54.3444017 ], [ -126.2707808, 54.3443376 ], [ -126.270654399999984, 54.3441454 ], [ -126.2706127, 54.3440913 ], [ -126.270425100000011, 54.3439061 ], [ -126.2703511, 54.3438605 ], [ -126.270307500000015, 54.343805 ], [ -126.27018240000001, 54.3436227 ], [ -126.2700659, 54.3435116 ], [ -126.269877799999989, 54.3433279 ], [ -126.269779, 54.3431812 ], [ -126.2697268, 54.3430544 ], [ -126.2697756, 54.3429932 ], [ -126.2699387, 54.3428793 ], [ -126.2699777, 54.3427368 ], [ -126.2700124, 54.3426742 ], [ -126.270123099999978, 54.3426585 ], [ -126.270429600000014, 54.3426485 ], [ -126.270567199999988, 54.3426599 ], [ -126.2708113, 54.3427012 ], [ -126.2710009, 54.3426428 ], [ -126.2710944, 54.3426001 ], [ -126.2711145, 54.3425374 ], [ -126.2710752, 54.3424563 ], [ -126.270909300000014, 54.3423808 ], [ -126.270777599999988, 54.3423053 ], [ -126.270437699999988, 54.3420817 ], [ -126.270395400000012, 54.3420361 ], [ -126.2702231, 54.3418424 ], [ -126.2702045, 54.341663 ], [ -126.270254499999979, 54.3415918 ], [ -126.2703981, 54.3415049 ], [ -126.2704941, 54.3414622 ], [ -126.2707601, 54.3413881 ], [ -126.270936099999986, 54.3412927 ], [ -126.2710326, 54.3412144 ], [ -126.271133299999974, 54.3410904 ], [ -126.271127, 54.3409651 ], [ -126.271085199999987, 54.3408911 ], [ -126.271044199999977, 54.3408284 ], [ -126.2709383, 54.3407899 ], [ -126.2707796, 54.3406333 ], [ -126.2707726, 54.3405165 ], [ -126.270827399999988, 54.3403641 ], [ -126.2710499, 54.3402616 ], [ -126.2711441, 54.3402373 ], [ -126.271488299999987, 54.3401633 ], [ -126.2715678, 54.340112 ], [ -126.2716025, 54.3400494 ], [ -126.2716226, 54.3399867 ], [ -126.271580199999988, 54.3399141 ], [ -126.2714192, 54.3398115 ], [ -126.2712629, 54.3396278 ], [ -126.2712352, 54.3395552 ], [ -126.2712399, 54.339474 ], [ -126.271236699999989, 54.339313 ], [ -126.2713667, 54.3392162 ], [ -126.2714027, 54.3391364 ], [ -126.271381699999978, 54.338984 ], [ -126.271297699999977, 54.3388644 ], [ -126.2713207, 54.3387391 ], [ -126.271386100000015, 54.3386864 ], [ -126.2715903, 54.338628 ], [ -126.2716685, 54.3385938 ], [ -126.271657399999981, 54.3385226 ], [ -126.2715998, 54.3384585 ], [ -126.2714382, 54.3383645 ], [ -126.27128, 54.3381722 ], [ -126.2712695, 54.3380996 ], [ -126.2712932, 54.3379928 ], [ -126.2713227, 54.3377678 ], [ -126.2713581, 54.3376966 ], [ -126.2715278, 54.3374758 ], [ -126.271697800000013, 54.337444499999989 ], [ -126.271780299999989, 54.3373918 ], [ -126.2717868, 54.3372579 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101200, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 25557.9436052446, "blue_line_key": 360881038, "length_metre": 148.09415915598001, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0705192, 54.2598151 ], [ -126.0705515, 54.2598065 ], [ -126.0706578, 54.2598094 ], [ -126.0707327, 54.2598379 ], [ -126.0708201, 54.2599119 ], [ -126.0708346, 54.259939 ], [ -126.0709381, 54.259996 ], [ -126.0712511, 54.260119900000014 ], [ -126.0713122, 54.2601128 ], [ -126.0713606, 54.2600871 ], [ -126.0713932, 54.2600515 ], [ -126.0713773, 54.2598621 ], [ -126.0713436, 54.2596812 ], [ -126.07136220000001, 54.2596371 ], [ -126.0714431, 54.2595758 ], [ -126.071506199999988, 54.2595502 ], [ -126.0717065, 54.2595559 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17085163, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 857.19159527352201, "blue_line_key": 360846413, "length_metre": 649.92284855067999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2706848, 54.470779 ], [ -126.270978, 54.4707676 ], [ -126.2711799, 54.4707718 ], [ -126.2713941, 54.4707761 ], [ -126.2717348, 54.4707761 ], [ -126.2720127, 54.4707733 ], [ -126.272199699999987, 54.4707505 ], [ -126.272433299999975, 54.4707277 ], [ -126.2726031, 54.4707049 ], [ -126.27285449999998, 54.4706664 ], [ -126.272964699999989, 54.4706323 ], [ -126.2733261, 54.4705326 ], [ -126.2735312, 54.4704656 ], [ -126.2736722, 54.4704414 ], [ -126.2737807, 54.4704257 ], [ -126.2741371, 54.4704158 ], [ -126.274477, 54.4703973 ], [ -126.274726399999977, 54.4703574 ], [ -126.275088399999987, 54.4702491 ], [ -126.2752601, 54.4702349 ], [ -126.275522, 54.4702221 ], [ -126.2756779, 54.4702178 ], [ -126.2758813, 54.4701765 ], [ -126.2762278, 54.4700498 ], [ -126.2766023, 54.4699956 ], [ -126.2767735, 54.4699899 ], [ -126.2771128, 54.46998 ], [ -126.2773436, 54.469985699999988 ], [ -126.277514700000012, 54.46998 ], [ -126.2778398, 54.4699686 ], [ -126.278182500000014, 54.4699145 ], [ -126.278538900000015, 54.4699045 ], [ -126.2786946, 54.4698803 ], [ -126.2789737, 54.4698603 ], [ -126.2793302, 54.4698504 ], [ -126.2795767, 54.4698461 ], [ -126.279913400000012, 54.4698988 ], [ -126.2800487, 54.4699387 ], [ -126.280397799999989, 54.4700184 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102123, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 13761.6823714491, "blue_line_key": 360880905, "length_metre": 436.954603181138, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4169393, 54.2439323 ], [ -126.4168777, 54.2439409 ], [ -126.416796599999984, 54.2440106 ], [ -126.4167784, 54.2440548 ], [ -126.416756600000014, 54.244136 ], [ -126.4167512, 54.2442257 ], [ -126.4167177, 54.2442784 ], [ -126.416716, 54.244324 ], [ -126.416678300000015, 54.2444222 ], [ -126.4166101, 54.2445105 ], [ -126.41648450000001, 54.2445889 ], [ -126.416326, 54.2446572 ], [ -126.4162302, 54.2447 ], [ -126.416136200000011, 54.2447242 ], [ -126.4160442, 54.2447498 ], [ -126.415918499999975, 54.244774 ], [ -126.4158105, 54.2447897 ], [ -126.4156532, 54.244841 ], [ -126.4156051, 54.2448936 ], [ -126.4156008, 54.2449463 ], [ -126.415610699999974, 54.2450275 ], [ -126.4156084, 54.2450816 ], [ -126.4155884, 54.2451714 ], [ -126.415598800000012, 54.2452169 ], [ -126.4156075, 54.2453423 ], [ -126.4155711, 54.2454235 ], [ -126.415444900000011, 54.2454833 ], [ -126.4152594, 54.2454975 ], [ -126.4151209, 54.2455032 ], [ -126.415028799999988, 54.2455018 ], [ -126.4149232, 54.2454904 ], [ -126.4148462, 54.2454875 ], [ -126.414693, 54.2454932 ], [ -126.414552699999987, 54.2455175 ], [ -126.414488100000014, 54.2455616 ], [ -126.4144535, 54.2456243 ], [ -126.4144492, 54.245677 ], [ -126.414444499999973, 54.2457852 ], [ -126.414422699999989, 54.2458664 ], [ -126.414387499999975, 54.2459376 ], [ -126.4143546, 54.2459817 ], [ -126.4143052, 54.2460515 ], [ -126.41424, 54.2461042 ], [ -126.41409729999998, 54.2461826 ], [ -126.4139405, 54.2462324 ], [ -126.4138467, 54.2462495 ], [ -126.4137227, 54.246255200000014 ], [ -126.4136147, 54.2462709 ], [ -126.4135489, 54.2463321 ], [ -126.4135296, 54.2464133 ], [ -126.413509499999989, 54.2464759 ], [ -126.4135036, 54.2465742 ], [ -126.413501799999977, 54.2466198 ] ] } }, @@ -306,285 +664,563 @@ { "type": "Feature", "properties": { "linear_feature_id": 17054702, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 20333.244196646701, "blue_line_key": 360856488, "length_metre": 158.39467616795599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5175048, 54.6287323 ], [ -126.5175705, 54.6289417 ], [ -126.5176341, 54.6291496 ], [ -126.5177003, 54.6293575 ], [ -126.5177879, 54.6294316 ], [ -126.5180272, 54.6295797 ], [ -126.518162599999982, 54.6296367 ], [ -126.5183733, 54.6297392 ], [ -126.5184777, 54.6297862 ], [ -126.5186574, 54.6299073 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17095033, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 3289.6711200609302, "blue_line_key": 360881038, "length_metre": 1825.2311658665201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1488125, 54.3718334 ], [ -126.149144199999981, 54.3719303 ], [ -126.1493396, 54.3719986 ], [ -126.1495685, 54.3720485 ], [ -126.149827399999978, 54.3720898 ], [ -126.1501017, 54.3721154 ], [ -126.1503454, 54.3721653 ], [ -126.150573099999988, 54.3722251 ], [ -126.150799600000013, 54.3722749 ], [ -126.150995, 54.3723433 ], [ -126.151190199999988, 54.3724188 ], [ -126.151400900000013, 54.3724786 ], [ -126.151644499999989, 54.3725284 ], [ -126.1519366, 54.3725455 ], [ -126.1522292, 54.3725341 ], [ -126.152479, 54.3724857 ], [ -126.1526981, 54.3724273 ], [ -126.152918499999984, 54.3723789 ], [ -126.153136499999988, 54.3723305 ], [ -126.153399099999987, 54.3723006 ], [ -126.153415099999975, 54.3723105 ], [ -126.153675299999989, 54.3723348 ], [ -126.153925, 54.3722863 ], [ -126.1540995, 54.3722094 ], [ -126.1542617, 54.3721055 ], [ -126.154377400000016, 54.3719815 ], [ -126.1543706, 54.3718377 ], [ -126.1542868, 54.371711 ], [ -126.1541882, 54.3715913 ], [ -126.154213899999988, 54.3714389 ], [ -126.1543437, 54.3713435 ], [ -126.1545046, 54.3712566 ], [ -126.154722, 54.3712167 ], [ -126.154884299999978, 54.3713293 ], [ -126.1549834, 54.3714475 ], [ -126.1550514, 54.3715842 ], [ -126.1552283, 54.371696699999987 ], [ -126.155366, 54.3717081 ], [ -126.1554885, 54.3717209 ], [ -126.1557376, 54.371681 ], [ -126.1561478, 54.3715472 ], [ -126.156366399999982, 54.3714902 ], [ -126.156447199999988, 54.371429 ], [ -126.156512, 54.3713848 ], [ -126.156476, 54.371241 ], [ -126.1564349, 54.3711854 ], [ -126.156377400000011, 54.3711213 ], [ -126.1562463, 54.3710102 ], [ -126.1561753, 54.3709091 ], [ -126.1562567, 54.3708393 ], [ -126.1563363, 54.3708151 ], [ -126.15656220000001, 54.3708735 ], [ -126.156792399999986, 54.3709063 ], [ -126.1570538, 54.3706969 ], [ -126.1571394, 54.3705545 ], [ -126.157162, 54.3704377 ], [ -126.1571664, 54.370385 ], [ -126.157147900000012, 54.3702127 ], [ -126.1570653, 54.370076 ], [ -126.1569484, 54.3699663 ], [ -126.1568658, 54.3698296 ], [ -126.1568326, 54.3696572 ], [ -126.1569036, 54.369514799999983 ], [ -126.157079400000015, 54.3694208 ], [ -126.157132600000011, 54.369314 ], [ -126.1569379, 54.3692371 ], [ -126.1567916, 54.3691346 ], [ -126.1567078, 54.3690078 ], [ -126.1567346, 54.3688454 ], [ -126.1569091, 54.3687685 ], [ -126.157168099999978, 54.3688027 ], [ -126.1573309, 54.3688867 ], [ -126.1575287, 54.368955099999987 ], [ -126.1577061, 54.3690391 ], [ -126.1578218, 54.369158799999987 ], [ -126.1578714, 54.369312600000015 ], [ -126.1579394, 54.3694493 ], [ -126.1579554, 54.3694593 ], [ -126.1581727, 54.3694194 ], [ -126.1583343, 54.369324 ], [ -126.1586097, 54.3691232 ], [ -126.158770100000012, 54.3690377 ], [ -126.1589728, 54.3689708 ], [ -126.1591343, 54.3688753 ], [ -126.159190599999974, 54.3687329 ], [ -126.159201, 54.368562 ], [ -126.159103699999989, 54.3684253 ], [ -126.158972, 54.3683228 ], [ -126.158809199999979, 54.3682387 ], [ -126.15858080000001, 54.3681875 ], [ -126.1583324, 54.3682188 ], [ -126.158187899999973, 54.3683142 ], [ -126.1580128, 54.3683997 ], [ -126.1577826, 54.3683669 ], [ -126.157636900000014, 54.3682558 ], [ -126.1575537, 54.3681276 ], [ -126.157534099999978, 54.3679653 ], [ -126.157591, 54.3678143 ], [ -126.157678, 54.3676819 ], [ -126.1577936, 54.367558 ], [ -126.157938699999988, 54.367454 ], [ -126.158113199999974, 54.3673771 ], [ -126.1583329, 54.3673101 ], [ -126.158611499999978, 54.3673173 ], [ -126.158808, 54.3673757 ], [ -126.1589849, 54.3674611 ], [ -126.1591317, 54.3675622 ], [ -126.1593118, 54.3676391 ], [ -126.159506499999978, 54.367716 ], [ -126.159687, 54.3677915 ], [ -126.1598351, 54.3678756 ], [ -126.1600004, 54.368149 ], [ -126.1603598, 54.3683114 ], [ -126.1605539, 54.3683968 ], [ -126.160749799999977, 54.3684637 ], [ -126.160825, 54.3684652 ], [ -126.1610993, 54.3683014 ], [ -126.161274400000011, 54.3682159 ], [ -126.161459799999989, 54.3682102 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17105931, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 44778.245494320203, "blue_line_key": 360886221, "length_metre": 20.7250942292284, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5240225, 54.1885534 ], [ -126.5239933, 54.1885534 ], [ -126.523901400000014, 54.1885519 ], [ -126.52381050000001, 54.1885405 ], [ -126.5237185, 54.1885121 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17053937, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 96.869875166867303, "blue_line_key": 360851779, "length_metre": 402.65203898265099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5219625, 54.6341642 ], [ -126.522031, 54.634301 ], [ -126.522157799999974, 54.6345189 ], [ -126.522254499999988, 54.6347097 ], [ -126.5222487, 54.6347909 ], [ -126.5222377, 54.6349874 ], [ -126.5223048, 54.635142699999989 ], [ -126.5224112, 54.6351982 ], [ -126.522502300000014, 54.6352267 ], [ -126.5226329, 54.6353549 ], [ -126.5229181, 54.6355415 ], [ -126.5230225, 54.6355885 ], [ -126.5232523, 54.6356283 ], [ -126.523359199999987, 54.6356753 ], [ -126.5235022, 54.6358676 ], [ -126.5235551, 54.6360214 ], [ -126.5235955, 54.636104 ], [ -126.5237719, 54.6362422 ], [ -126.5240004, 54.6363362 ], [ -126.5241683, 54.6363846 ], [ -126.5245136, 54.6365541 ], [ -126.5248288, 54.6367036 ], [ -126.5249667, 54.6367606 ], [ -126.5252385, 54.6368646 ], [ -126.52534390000001, 54.6369301 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092183, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 9280.2263588617898, "blue_line_key": 360862508, "length_metre": 108.108306872211, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4470319, 54.4113795 ], [ -126.4469065, 54.4113951 ], [ -126.4467998, 54.4113923 ], [ -126.4464611, 54.4113951 ], [ -126.4462135, 54.411389400000012 ], [ -126.4460905, 54.4114051 ], [ -126.4459963, 54.4114293 ], [ -126.4457113, 54.4115504 ], [ -126.4456038, 54.411529 ], [ -126.445499099999978, 54.4114649 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17087748, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 191026.94662381499, "blue_line_key": 360873822, "length_metre": 67.938783521957404, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5455447, 54.4502746 ], [ -126.544555, 54.4504783 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102323, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 28837.272166988299, "blue_line_key": 360881038, "length_metre": 73.907101203611305, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0675893, 54.241608 ], [ -126.067785199999989, 54.2414328 ], [ -126.067906799999989, 54.2412477 ], [ -126.0678333, 54.2411822 ], [ -126.0677756, 54.2411537 ], [ -126.067564799999985, 54.2411038 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17082387, "stream_order": 4, "gnis_name": "Ailport Creek", "downstream_route_measure": 12365.3941330166, "blue_line_key": 360878058, "length_metre": 2149.4223257806002, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1330131, 54.4852831 ], [ -126.1329676, 54.4852731 ], [ -126.1324864, 54.485288800000014 ], [ -126.1323488, 54.485276 ], [ -126.132244899999989, 54.4852375 ], [ -126.131934699999988, 54.4850154 ], [ -126.1316646, 54.4849 ], [ -126.1315437, 54.4848886 ], [ -126.1312172, 54.4849171 ], [ -126.1308453, 54.4849356 ], [ -126.1304745, 54.4849441 ], [ -126.1303806, 54.4849598 ], [ -126.130005099999977, 54.4850225 ], [ -126.1296786, 54.485051 ], [ -126.12918329999998, 54.4850581 ], [ -126.1288733, 54.485068 ], [ -126.128532100000015, 54.4850965 ], [ -126.128064499999979, 54.4851563 ], [ -126.1277387, 54.4852033 ], [ -126.127302899999989, 54.485229 ], [ -126.126822300000015, 54.4852703 ], [ -126.1264633, 54.4853073 ], [ -126.126354799999987, 54.485323 ], [ -126.1260141, 54.48535 ], [ -126.1256711, 54.48537 ], [ -126.125346299999975, 54.4853799 ], [ -126.1249903, 54.4854156 ], [ -126.1244861, 54.4855295 ], [ -126.124124299999977, 54.4856292 ], [ -126.1237472, 54.4857374 ], [ -126.123353400000013, 54.4858442 ], [ -126.123067800000015, 54.4859639 ], [ -126.1228984, 54.486149 ], [ -126.1227559, 54.486451 ], [ -126.1224436, 54.4866859 ], [ -126.1221166, 54.48675 ], [ -126.121745300000015, 54.48676 ], [ -126.1214476, 54.486797 ], [ -126.121336199999973, 54.4868754 ], [ -126.1211385, 54.4870505 ], [ -126.1208594, 54.4872685 ], [ -126.1206876, 54.4873098 ], [ -126.120254800000012, 54.4872998 ], [ -126.1198579, 54.4872442 ], [ -126.11944170000001, 54.4872357 ], [ -126.119144099999986, 54.4872998 ], [ -126.1188886, 54.4874109 ], [ -126.118827899999985, 54.487607399999987 ], [ -126.118849199999985, 54.4877327 ], [ -126.118883699999984, 54.4879236 ], [ -126.1189458, 54.488113 ], [ -126.1190559, 54.4883323 ], [ -126.119212, 54.4885331 ], [ -126.119338500000012, 54.4887069 ], [ -126.1195093, 54.4889006 ], [ -126.119711400000014, 54.4891028 ], [ -126.119899499999988, 54.4892965 ], [ -126.1200076, 54.4894874 ], [ -126.120103500000013, 54.4896782 ], [ -126.120150900000013, 54.4898947 ], [ -126.119981, 54.4900884 ], [ -126.1198724, 54.4901041 ], [ -126.1194679, 54.4901311 ], [ -126.119171, 54.4902137 ], [ -126.1188965, 54.4903504 ], [ -126.118516899999989, 54.4904857 ], [ -126.118083599999977, 54.4905114 ], [ -126.1177269, 54.4905213 ], [ -126.117356, 54.4905299 ], [ -126.1172781, 54.490528499999989 ], [ -126.11692429999998, 54.4905099 ], [ -126.116558199999986, 54.4904573 ], [ -126.116144100000014, 54.4904017 ], [ -126.1156192, 54.490416 ], [ -126.1153134, 54.4905712 ], [ -126.1152804, 54.4906153 ], [ -126.1152557, 54.4907321 ], [ -126.1152601, 54.4909116 ], [ -126.1152466, 54.4910996 ], [ -126.115165799999986, 54.4911608 ], [ -126.114950399999984, 54.4913445 ], [ -126.114891500000013, 54.4915496 ], [ -126.114799, 54.4917462 ], [ -126.114642599999982, 54.491984 ], [ -126.1144434, 54.4922048 ], [ -126.114320699999979, 54.492417 ], [ -126.1141827, 54.4926035 ], [ -126.114044599999986, 54.4927972 ], [ -126.113918, 54.4930821 ], [ -126.113900500000014, 54.4933156 ], [ -126.1138848, 54.4935578 ], [ -126.1138241, 54.4937543 ], [ -126.113714500000015, 54.493985 ], [ -126.113591299999982, 54.4941987 ], [ -126.1134857, 54.494383799999987 ], [ -126.113304700000015, 54.4945604 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102345, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 24315.235276873598, "blue_line_key": 360886221, "length_metre": 2135.3902262127599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6326654, 54.2517541 ], [ -126.632697400000012, 54.2517185 ], [ -126.632777600000011, 54.2516572 ], [ -126.632843099999974, 54.251596 ], [ -126.6329086, 54.2515347 ], [ -126.6329727, 54.2514635 ], [ -126.6330247, 54.2513923 ], [ -126.6330419, 54.2513297 ], [ -126.6330474, 54.2512314 ], [ -126.633037199999976, 54.2511773 ], [ -126.633010899999988, 54.2510861 ], [ -126.6329841, 54.2509964 ], [ -126.632948200000016, 54.2508426 ], [ -126.6329202, 54.250769899999987 ], [ -126.6328975, 54.2506617 ], [ -126.6328883, 54.2505634 ], [ -126.632848799999977, 54.2504267 ], [ -126.632821600000014, 54.2503726 ], [ -126.6327489, 54.2502814 ], [ -126.6326481, 54.2501803 ], [ -126.632530499999973, 54.2501063 ], [ -126.6324246, 54.2500678 ], [ -126.63231709999998, 54.2500479 ], [ -126.6321968, 54.2500365 ], [ -126.632026599999989, 54.2500422 ], [ -126.631874, 54.2500393 ], [ -126.631719, 54.2500365 ], [ -126.6315816, 54.2500251 ], [ -126.6314605, 54.2499952 ], [ -126.6313729, 54.2499396 ], [ -126.6312851, 54.249857 ], [ -126.631244099999989, 54.2497659 ], [ -126.631176599999989, 54.2496121 ], [ -126.63113340000001, 54.249548 ], [ -126.631063200000014, 54.2494568 ], [ -126.630958899999982, 54.2493657 ], [ -126.6308552, 54.2493002 ], [ -126.6307516, 54.2492346 ], [ -126.6306481, 54.249162 ], [ -126.630576699999978, 54.2490879 ], [ -126.6305041, 54.2489968 ], [ -126.630462799999989, 54.2489413 ], [ -126.6304067, 54.2488515 ], [ -126.630395600000014, 54.2487518 ], [ -126.6304196, 54.248608 ], [ -126.6304399, 54.2485368 ], [ -126.63052230000001, 54.2484485 ], [ -126.630619299999978, 54.2483602 ], [ -126.630762499999989, 54.2482377 ], [ -126.630828, 54.2481765 ], [ -126.6309244, 54.2480967 ], [ -126.631022, 54.2479998 ], [ -126.63105849999998, 54.2479101 ], [ -126.631063399999988, 54.2478204 ], [ -126.6310696, 54.2477406 ], [ -126.6310013, 54.2475683 ], [ -126.6308411, 54.247421599999988 ], [ -126.630722299999988, 54.2473647 ], [ -126.630569499999979, 54.2473347 ], [ -126.6302957, 54.2472749 ], [ -126.630158900000012, 54.247255 ], [ -126.629915900000015, 54.2472322 ], [ -126.629687499999989, 54.2472094 ], [ -126.6295648, 54.247198 ], [ -126.629473199999978, 54.2471881 ], [ -126.6292747, 54.2471567 ], [ -126.6290784, 54.2470983 ], [ -126.628956799999983, 54.2470698 ], [ -126.6288664, 54.2470499 ], [ -126.62868490000001, 54.2470186 ], [ -126.628425400000012, 54.2469872 ], [ -126.6283027, 54.2469758 ], [ -126.6282105, 54.2469744 ], [ -126.6280448, 54.246926 ], [ -126.6278812, 54.2468235 ], [ -126.6277973, 54.246695299999985 ], [ -126.6278022, 54.246605599999988 ], [ -126.6278694, 54.2465258 ], [ -126.6279659, 54.2464389 ], [ -126.628029399999988, 54.2463763 ], [ -126.628097200000013, 54.2462879 ], [ -126.628146699999988, 54.2462167 ], [ -126.6282843, 54.245986 ], [ -126.6283988, 54.2458621 ], [ -126.628588, 54.2457681 ], [ -126.628697, 54.2457425 ], [ -126.628834900000015, 54.2457453 ], [ -126.6289869, 54.2457567 ], [ -126.629124799999985, 54.2457596 ], [ -126.6292616, 54.2457724 ], [ -126.629371400000011, 54.2457653 ], [ -126.6294645, 54.2457225 ], [ -126.629545099999987, 54.2456599 ], [ -126.6296112, 54.2455901 ], [ -126.6296608, 54.2455189 ], [ -126.6297273, 54.2454477 ], [ -126.629759799999988, 54.245376500000013 ], [ -126.6298129, 54.2452882 ], [ -126.6298471, 54.2451984 ], [ -126.629882599999988, 54.2451187 ], [ -126.6298843, 54.2451002 ], [ -126.6299045, 54.245029 ], [ -126.6299218, 54.2449663 ], [ -126.6299567, 54.2448951 ], [ -126.629975300000012, 54.2448424 ], [ -126.6300271, 54.2447441 ], [ -126.630093500000015, 54.2446458 ], [ -126.6301284, 54.2445746 ], [ -126.6301465, 54.2445305 ], [ -126.6301848, 54.2444151 ], [ -126.6302076, 54.2442884 ], [ -126.6302103, 54.2442257 ], [ -126.6302143, 54.244173 ], [ -126.6301896, 54.2440633 ], [ -126.630103, 54.2439636 ], [ -126.62997, 54.2438711 ], [ -126.629805800000014, 54.2437771 ], [ -126.6296718, 54.2437215 ], [ -126.62948750000001, 54.2437258 ], [ -126.6293611, 54.243787 ], [ -126.629281499999976, 54.2438397 ], [ -126.6291693, 54.2439366 ], [ -126.6290134, 54.2439779 ], [ -126.628782799999982, 54.2439822 ], [ -126.6287058, 54.2439722 ], [ -126.628587599999989, 54.2439067 ], [ -126.628454, 54.2438226 ], [ -126.628138799999988, 54.2436731 ], [ -126.628049, 54.2436446 ], [ -126.6278821, 54.2436133 ], [ -126.6277296, 54.2436104 ], [ -126.6276221, 54.2435905 ], [ -126.627533899999989, 54.243543499999987 ], [ -126.627446100000014, 54.2434609 ], [ -126.627421, 54.2433527 ], [ -126.627396, 54.2432715 ], [ -126.627383499999979, 54.2432174 ], [ -126.6273736, 54.2431006 ], [ -126.6273961, 54.2430023 ], [ -126.6274134, 54.2429396 ], [ -126.6274348, 54.2428585 ], [ -126.627474600000014, 54.2426975 ], [ -126.62754480000001, 54.2425195 ], [ -126.627582, 54.2424212 ], [ -126.6276163, 54.2423586 ], [ -126.627670899999984, 54.2422247 ], [ -126.627724500000014, 54.2421008 ], [ -126.627756600000012, 54.2420652 ], [ -126.6278247, 54.2419413 ], [ -126.6278731, 54.2418871 ], [ -126.6280634, 54.2417832 ], [ -126.6282685, 54.2417063 ], [ -126.6283787, 54.2416635 ], [ -126.628470100000015, 54.2416393 ], [ -126.6286746, 54.241571 ], [ -126.628862200000015, 54.2415297 ], [ -126.629017, 54.2415055 ], [ -126.629184200000012, 54.2415083 ], [ -126.629200699999984, 54.2415097 ], [ -126.6292752, 54.2415197 ], [ -126.629457899999977, 54.2415681 ], [ -126.629547800000012, 54.2415966 ], [ -126.629696599999988, 54.2416721 ], [ -126.6298624, 54.2417476 ], [ -126.630027, 54.241813099999987 ], [ -126.6301334, 54.241843 ], [ -126.6302232, 54.2418715 ], [ -126.630390599999984, 54.2419014 ], [ -126.6305133, 54.2419128 ], [ -126.6305906, 54.2418871 ], [ -126.6306685, 54.241853 ], [ -126.630748, 54.2418003 ], [ -126.6308141, 54.2417305 ], [ -126.6308637, 54.2416593 ], [ -126.6308682, 54.2416052 ], [ -126.6308702, 54.241551 ], [ -126.6308747, 54.2414969 ], [ -126.630878, 54.2414257 ], [ -126.6308682, 54.241336 ], [ -126.630872, 54.2412633 ], [ -126.63087969999998, 54.241138 ], [ -126.6308557, 54.2410198 ], [ -126.630844299999978, 54.2409486 ], [ -126.630816900000013, 54.2408674 ], [ -126.6308044, 54.2408133 ], [ -126.6307347, 54.2407207 ], [ -126.6306469, 54.2406381 ], [ -126.6302752, 54.2404074 ], [ -126.629921, 54.2401752 ], [ -126.629908, 54.2401567 ], [ -126.6299086, 54.2401482 ], [ -126.629877799999988, 54.2401112 ], [ -126.6298026, 54.2400827 ], [ -126.6297298, 54.2400542 ], [ -126.6296381, 54.2400172 ], [ -126.6295662, 54.2399516 ], [ -126.6294469, 54.2398961 ], [ -126.629341700000012, 54.2398491 ], [ -126.629236499999976, 54.2398021 ], [ -126.629209300000014, 54.239748 ], [ -126.629180800000015, 54.2396839 ], [ -126.629184200000012, 54.2396397 ], [ -126.6291579, 54.2395486 ], [ -126.6291613, 54.2395044 ], [ -126.629165699999973, 54.2394233 ], [ -126.629232800000011, 54.2393435 ], [ -126.6292633, 54.2393264 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17098394, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 16953.922175223899, "blue_line_key": 360886524, "length_metre": 839.25088673355697, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2606865, 54.3124154 ], [ -126.2605716, 54.3122872 ], [ -126.2602757, 54.3120921 ], [ -126.2599223, 54.31186 ], [ -126.2598391, 54.3117318 ], [ -126.259730799999986, 54.3115039 ], [ -126.2597039, 54.3114498 ], [ -126.2595638, 54.311249 ], [ -126.259554699999981, 54.3111593 ], [ -126.259558200000015, 54.3110952 ], [ -126.259626699999984, 54.3110069 ], [ -126.259706199999982, 54.3109556 ], [ -126.259741, 54.3108929 ], [ -126.2597537, 54.310695 ], [ -126.2597281, 54.3106238 ], [ -126.259648, 54.310432899999988 ], [ -126.259608199999988, 54.3103603 ], [ -126.2594999, 54.3101324 ], [ -126.259473, 54.3100783 ], [ -126.259346400000013, 54.3098946 ], [ -126.2593372, 54.3098048 ], [ -126.2592968, 54.3097137 ], [ -126.2592437, 54.3095698 ], [ -126.259251, 54.3094887 ], [ -126.2592307, 54.3093078 ], [ -126.259161699999979, 54.3092081 ], [ -126.259021, 54.3090158 ], [ -126.2587208, 54.3089005 ], [ -126.258473900000013, 54.3088948 ], [ -126.258258200000014, 54.3089176 ], [ -126.25815, 54.3089062 ], [ -126.2579097, 54.3088549 ], [ -126.2578193, 54.3088079 ], [ -126.2576738, 54.3086697 ], [ -126.25749350000001, 54.3086213 ], [ -126.2571469, 54.308533 ], [ -126.257069800000011, 54.308503099999989 ], [ -126.2569562, 54.3083849 ], [ -126.256945099999982, 54.3083208 ], [ -126.2569794, 54.3082596 ], [ -126.2570442, 54.3082154 ], [ -126.2570949, 54.3081357 ], [ -126.2570912, 54.3079833 ], [ -126.2570062, 54.3078736 ], [ -126.2569781, 54.3078095 ], [ -126.256972499999989, 54.3076828 ], [ -126.2569946, 54.3075674 ], [ -126.25703, 54.3074962 ], [ -126.257176, 54.3073823 ], [ -126.2573655, 54.3072968 ], [ -126.2574969, 54.3071829 ], [ -126.257517100000015, 54.3071202 ], [ -126.257591, 54.3069151 ], [ -126.2575873, 54.3067357 ], [ -126.257537199999987, 54.3065904 ], [ -126.257449799999975, 54.3065078 ], [ -126.2572713, 54.3064138 ], [ -126.2570818, 54.3062557 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17083821, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 200519.25973262399, "blue_line_key": 360873822, "length_metre": 335.05999465025099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.485728599999987, 54.4768162 ], [ -126.484878099999989, 54.4775026 ], [ -126.484677300000016, 54.478511 ], [ -126.4844387, 54.4789197 ], [ -126.4839907, 54.479149 ], [ -126.483386700000011, 54.4792501 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17081267, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 202661.238376322, "blue_line_key": 360873822, "length_metre": 242.36727077919301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4847761, 54.4883095 ], [ -126.4847735, 54.4884434 ], [ -126.4851198, 54.4889818 ], [ -126.485496399999988, 54.4898477 ], [ -126.485705099999976, 54.4900642 ], [ -126.486077599999987, 54.4903034 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093918, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 17693.009623456699, "blue_line_key": 360846413, "length_metre": 459.92409035032898, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2751593, 54.3908491 ], [ -126.282257800000011, 54.390922 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17103043, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 9626.1716485316392, "blue_line_key": 360880905, "length_metre": 28.5731306322592, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4555909, 54.2317097 ], [ -126.4555892, 54.2317283 ], [ -126.4555698, 54.2318094 ], [ -126.455537, 54.2318536 ], [ -126.4554852, 54.2319234 ], [ -126.4554401, 54.2319405 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17082150, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 2613.5268944365298, "blue_line_key": 360875052, "length_metre": 474.72676876309799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3455852, 54.48546540000001 ], [ -126.345672400000012, 54.4855309 ], [ -126.345819799999987, 54.4856691 ], [ -126.3458467, 54.4857317 ], [ -126.345863799999989, 54.4859126 ], [ -126.3459277, 54.4861205 ], [ -126.345934699999987, 54.486274400000013 ], [ -126.345899699999975, 54.4863456 ], [ -126.3456234, 54.486545 ], [ -126.3455874, 54.4866261 ], [ -126.3455818, 54.4866973 ], [ -126.3456818, 54.486817 ], [ -126.3459047, 54.4869565 ], [ -126.3460365, 54.4870762 ], [ -126.346104599999975, 54.4872029 ], [ -126.346131, 54.487267 ], [ -126.346167099999988, 54.487456400000013 ], [ -126.3462066, 54.487539 ], [ -126.346400300000013, 54.4876501 ], [ -126.3467023, 54.487774 ], [ -126.3467889, 54.4878481 ], [ -126.3468164, 54.4879022 ], [ -126.346827, 54.4879834 ], [ -126.3467937, 54.4880361 ], [ -126.346696099999988, 54.4880973 ], [ -126.34660070000001, 54.4881315 ], [ -126.3463512, 54.4881714 ], [ -126.346039300000015, 54.4882355 ], [ -126.34587590000001, 54.488358 ], [ -126.3458562, 54.4884206 ], [ -126.345873, 54.4886371 ], [ -126.345898299999988, 54.4887183 ], [ -126.3459502, 54.4888906 ], [ -126.345925099999988, 54.4890245 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17102313, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 13941.539404442599, "blue_line_key": 360877225, "length_metre": 395.02159259199601, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.20501920000001, 54.244389500000011 ], [ -126.2051082, 54.2442385 ], [ -126.205102099999976, 54.2440676 ], [ -126.205113700000012, 54.2439152 ], [ -126.205019100000015, 54.2437329 ], [ -126.2049063, 54.2435606 ], [ -126.204783099999986, 54.2433498 ], [ -126.2047476, 54.243206 ], [ -126.2046975, 54.2430422 ], [ -126.2046608, 54.2428884 ], [ -126.2045956, 54.242726 ], [ -126.204577299999983, 54.2425551 ], [ -126.2046659, 54.2423586 ], [ -126.204707899999974, 54.2422161 ], [ -126.204947, 54.242068 ], [ -126.2050622, 54.2419455 ], [ -126.205183699999978, 54.241759 ], [ -126.2052863, 54.2415909 ], [ -126.2054078, 54.2413773 ], [ -126.205573199999989, 54.2412106 ], [ -126.2056605, 54.2410511 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102880, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 30132.226454737902, "blue_line_key": 360881038, "length_metre": 13.396185716885, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.067590599999988, 54.2342434 ], [ -126.067489400000014, 54.2341608 ], [ -126.067488899999987, 54.2341423 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17091575, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 245160.833005369, "blue_line_key": 360873822, "length_metre": 1189.1232267794701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2125651, 54.4231491 ], [ -126.2125227, 54.4231035 ], [ -126.2124672, 54.4230124 ], [ -126.2124571, 54.4229312 ], [ -126.2124906, 54.4228785 ], [ -126.212650900000014, 54.422800200000012 ], [ -126.2129792, 54.4227446 ], [ -126.2131503, 54.4227318 ], [ -126.2133182, 54.4227347 ], [ -126.213566399999976, 54.4227318 ], [ -126.213703799999976, 54.4227446 ], [ -126.2140092, 54.4227874 ], [ -126.2143658, 54.4227418 ], [ -126.214512500000012, 54.4226464 ], [ -126.2145466, 54.4225923 ], [ -126.2145872, 54.4224584 ], [ -126.21458, 54.4223145 ], [ -126.214539299999984, 54.4222504 ], [ -126.214423, 54.4221308 ], [ -126.2142603, 54.4220382 ], [ -126.2141696, 54.422018300000012 ], [ -126.213875300000012, 54.4220197 ], [ -126.213583, 54.422022599999984 ], [ -126.2134615, 54.4219927 ], [ -126.213403699999986, 54.4219286 ], [ -126.2133846, 54.4217562 ], [ -126.2133457, 54.4216395 ], [ -126.2132437, 54.4215825 ], [ -126.2130745, 54.4215697 ], [ -126.212920699999984, 54.4215754 ], [ -126.212825200000012, 54.4216095 ], [ -126.2127132, 54.4216694 ], [ -126.2125311, 54.421836 ], [ -126.2124375, 54.4218787 ], [ -126.21231130000001, 54.4219029 ], [ -126.2122205, 54.421883 ], [ -126.2120559, 54.421789 ], [ -126.211886, 54.4215868 ], [ -126.2118896, 54.4215426 ], [ -126.211876, 54.4215056 ], [ -126.2118665, 54.4214159 ], [ -126.2117993, 54.4212891 ], [ -126.2117261, 54.4212065 ], [ -126.211563899999987, 54.4211125 ], [ -126.211463, 54.4210114 ], [ -126.211439899999988, 54.4208846 ], [ -126.21145989999998, 54.420822 ], [ -126.2115265, 54.4207522 ], [ -126.211621899999983, 54.4206909 ], [ -126.2116732, 54.4206297 ], [ -126.211668300000014, 54.4204588 ], [ -126.211597, 54.4203847 ], [ -126.2114915, 54.420364799999987 ], [ -126.211307, 54.4203605 ], [ -126.2110895, 54.4203733 ], [ -126.2107158, 54.4204189 ], [ -126.2104835, 54.4204317 ], [ -126.2103332, 54.4204004 ], [ -126.2100909, 54.420332 ], [ -126.2100006, 54.420276500000014 ], [ -126.209944499999978, 54.4201939 ], [ -126.209912, 54.4200045 ], [ -126.2098683, 54.4199489 ], [ -126.2097769, 54.4199375 ], [ -126.209655599999977, 54.4199347 ], [ -126.2094063, 54.4199746 ], [ -126.2091705, 54.4200315 ], [ -126.2089388, 54.4200358 ], [ -126.2088321, 54.4200059 ], [ -126.20865280000001, 54.4199119 ], [ -126.208634, 54.4197595 ], [ -126.2086687, 54.4196968 ], [ -126.2087648, 54.4196541 ], [ -126.2090924, 54.4195801 ], [ -126.2092964, 54.4195231 ], [ -126.209378299999983, 54.4194789 ], [ -126.209366499999987, 54.4194163 ], [ -126.2093104, 54.4193337 ], [ -126.209205499999982, 54.4192781 ], [ -126.2091011, 54.4192482 ], [ -126.208765, 54.4191685 ], [ -126.208600499999989, 54.4191015 ], [ -126.2083029, 54.4189691 ], [ -126.2081253, 54.418856500000011 ], [ -126.2081017, 54.4187312 ], [ -126.2081558, 54.4186144 ], [ -126.2082519, 54.4185717 ], [ -126.208391, 54.418566 ], [ -126.2087299, 54.418556 ], [ -126.2089304, 54.4185703 ], [ -126.2092227, 54.4185674 ], [ -126.2095069, 54.4184848 ], [ -126.2095562, 54.4184222 ], [ -126.209560399999987, 54.4183695 ], [ -126.2094861, 54.418331 ], [ -126.209380699999983, 54.4183111 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17069319, "stream_order": 4, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 18170.839523465002, "blue_line_key": 360875378, "length_metre": 232.184458499828, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.649671699999985, 54.549495 ], [ -126.6498112, 54.5494893 ], [ -126.6499649, 54.5494922 ], [ -126.6501353, 54.5495035 ], [ -126.6503766, 54.5495805 ], [ -126.650742099999988, 54.5496958 ], [ -126.6508325, 54.5497328 ], [ -126.6509962, 54.5498354 ], [ -126.6510999, 54.5499265 ], [ -126.651231199999984, 54.5500732 ], [ -126.651442, 54.5501672 ], [ -126.651581, 54.5501701 ], [ -126.6518737, 54.5501758 ], [ -126.652230299999985, 54.5501743 ], [ -126.652522, 54.550197099999984 ], [ -126.6527843, 54.5502199 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17103115, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 30325.0583013178, "blue_line_key": 360881038, "length_metre": 330.14167586356001, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.065828200000013, 54.233104 ], [ -126.065988799999985, 54.2330186 ], [ -126.0660492, 54.23302 ], [ -126.0660942, 54.23303 ], [ -126.0664122, 54.2330998 ], [ -126.06653009999998, 54.2331567 ], [ -126.0667843, 54.2332806 ], [ -126.0668454, 54.2332735 ], [ -126.0669085, 54.2332479 ], [ -126.066941, 54.2332123 ], [ -126.0669472, 54.2331226 ], [ -126.066935199999989, 54.2330955 ], [ -126.0669532, 54.2330599 ], [ -126.067001600000012, 54.2330343 ], [ -126.067230899999984, 54.23304 ], [ -126.0672933, 54.2330229 ], [ -126.067342400000015, 54.2329887 ], [ -126.0673756, 54.232944499999981 ], [ -126.0673837, 54.2328363 ], [ -126.0673693, 54.2328092 ], [ -126.0673621, 54.2327095 ], [ -126.0672372, 54.2325187 ], [ -126.0669512, 54.2324219 ], [ -126.066910100000015, 54.2323478 ], [ -126.066929300000012, 54.2323222 ], [ -126.06696119999998, 54.2322951 ], [ -126.067121199999974, 54.2321911 ], [ -126.0672296, 54.231969 ], [ -126.0672358, 54.2318792 ], [ -126.067269, 54.2318351 ], [ -126.067334, 54.2318109 ], [ -126.067472, 54.2317866 ], [ -126.06756, 54.2318522 ], [ -126.0675871, 54.2318977 ], [ -126.067646599999989, 54.2319348 ], [ -126.0677075, 54.2319547 ], [ -126.0677692, 54.2319462 ], [ -126.0678151, 54.2319205 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101452, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 16066.564056977, "blue_line_key": 360880905, "length_metre": 98.124556766618397, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3997277, 54.2544686 ], [ -126.399568500000015, 54.2545455 ], [ -126.399409899999981, 54.2546409 ], [ -126.3990897, 54.2548403 ], [ -126.3989001, 54.2549272 ], [ -126.3985877, 54.2550369 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17086678, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 233259.444902174, "blue_line_key": 360873822, "length_metre": 527.24318766517001, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2509569, 54.4636422 ], [ -126.2509489, 54.463534 ], [ -126.25091639999998, 54.463336 ], [ -126.2508601, 54.4632534 ], [ -126.250773099999989, 54.4631879 ], [ -126.250569, 54.4630042 ], [ -126.2503654, 54.4628191 ], [ -126.2502222, 54.4626638 ], [ -126.2500514, 54.4624345 ], [ -126.2500123, 54.4623448 ], [ -126.2499932, 54.4621368 ], [ -126.2499757, 54.4619659 ], [ -126.2499602, 54.4617409 ], [ -126.2500107, 54.4616612 ], [ -126.250160099999974, 54.4615031 ], [ -126.2501964, 54.4614219 ], [ -126.250221199999984, 54.4612695 ], [ -126.2501956, 54.4611969 ], [ -126.2499592, 54.4610488 ], [ -126.249754, 54.4608821 ], [ -126.2497125, 54.4608266 ], [ -126.2495101, 54.4606243 ], [ -126.2493963, 54.4604691 ], [ -126.2492916, 54.4604121 ], [ -126.249080299999974, 54.4603452 ], [ -126.2488342, 54.460348 ], [ -126.248492499999983, 54.460358 ], [ -126.2482636, 54.4603267 ], [ -126.2482044, 54.4602797 ], [ -126.2481948, 54.460217 ], [ -126.2481441, 54.4600361 ], [ -126.2480481, 54.4598724 ], [ -126.2480042, 54.4598168 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091484, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 12322.563293822601, "blue_line_key": 360846413, "length_metre": 256.77871688118, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2816002, 54.4212178 ], [ -126.2803309, 54.4190383 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17070320, "stream_order": 4, "gnis_name": "Perow Creek", "downstream_route_measure": 5254.02116012036, "blue_line_key": 360836816, "length_metre": 148.79667269882199, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4892453, 54.5456496 ], [ -126.489400499999974, 54.5456625 ], [ -126.489724, 54.5456781 ], [ -126.48995330000001, 54.545718 ], [ -126.490167199999988, 54.5457593 ], [ -126.4903802, 54.5458177 ], [ -126.490729499999986, 54.545914499999988 ], [ -126.4909709, 54.5460185 ], [ -126.4911974, 54.5461225 ], [ -126.4913186, 54.5461695 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17078112, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 218574.47897975901, "blue_line_key": 360873822, "length_metre": 991.92323104164302, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.338616699999989, 54.5053274 ], [ -126.338527, 54.505081 ], [ -126.3379295, 54.5047791 ], [ -126.337328, 54.5046623 ], [ -126.336920400000011, 54.5046566 ], [ -126.3367322, 54.5046965 ], [ -126.3366471, 54.5048403 ], [ -126.336806700000011, 54.5051181 ], [ -126.3371263, 54.505269 ], [ -126.3376525, 54.5053559 ], [ -126.3377531, 54.5054115 ], [ -126.3377707, 54.5055354 ], [ -126.3376763, 54.5057476 ], [ -126.337147, 54.5061563 ], [ -126.3368155, 54.5066163 ], [ -126.3365237, 54.5066092 ], [ -126.336275, 54.5065423 ], [ -126.3356942, 54.5062418 ], [ -126.3358858, 54.5060324 ], [ -126.3364305, 54.5057675 ], [ -126.3365676, 54.5055596 ], [ -126.3359415, 54.5052762 ], [ -126.335438, 54.5049443 ], [ -126.3350451, 54.5048204 ], [ -126.334915, 54.5048346 ], [ -126.3347244, 54.5049785 ], [ -126.334785599999975, 54.5055282 ], [ -126.3345146, 54.5057262 ], [ -126.333928399999976, 54.5058444 ], [ -126.3329814, 54.5058102 ], [ -126.3326831, 54.5059811 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17057508, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 17298.614264666499, "blue_line_key": 360856488, "length_metre": 179.76730237043799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5045713, 54.6132198 ], [ -126.504568400000011, 54.6132925 ], [ -126.504593899999989, 54.6133466 ], [ -126.504668699999982, 54.6133936 ], [ -126.50477690000001, 54.6134221 ], [ -126.504916599999973, 54.6134164 ], [ -126.5051468, 54.6134477 ], [ -126.505325899999988, 54.6135417 ], [ -126.5053785, 54.6136955 ], [ -126.5053549, 54.6138208 ], [ -126.505137, 54.6138607 ], [ -126.5050721, 54.6139134 ], [ -126.505066700000015, 54.6139861 ], [ -126.505155699999975, 54.6140416 ], [ -126.505246700000015, 54.6140701 ], [ -126.505524599999987, 54.6140843 ], [ -126.505662399999977, 54.6141057 ], [ -126.505707099999981, 54.6141612 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17088848, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 186706.44233462101, "blue_line_key": 360873822, "length_metre": 613.43049225843299, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.581635499999976, 54.4413235 ], [ -126.5807111, 54.4412494 ], [ -126.579484, 54.4412779 ], [ -126.5782281, 54.4413818 ], [ -126.577415500000015, 54.4415983 ], [ -126.5771308, 54.4418177 ], [ -126.577240300000014, 54.442178 ], [ -126.5784595, 54.4429029 ], [ -126.5784904, 54.4430952 ], [ -126.5782933, 54.4434427 ], [ -126.5777129, 54.4436463 ], [ -126.5771024, 54.4437959 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101423, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 16164.6886137437, "blue_line_key": 360880905, "length_metre": 176.81651442651901, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3985877, 54.2550369 ], [ -126.398462599999988, 54.2550525 ], [ -126.3982191, 54.2550383 ], [ -126.3978949, 54.2550312 ], [ -126.3978046, 54.2550383 ], [ -126.3976472, 54.2550967 ], [ -126.39752270000001, 54.2551038 ], [ -126.397185099999987, 54.2551138 ], [ -126.396875200000011, 54.2551351 ], [ -126.3967671, 54.2551508 ], [ -126.396454699999978, 54.2552334 ], [ -126.3963443, 54.2552761 ], [ -126.3960013, 54.2553758 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17087881, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 236891.27579347999, "blue_line_key": 360873822, "length_metre": 265.54424014131098, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.225688, 54.4502889 ], [ -126.225353699999985, 54.4504156 ], [ -126.225177599999981, 54.450511 ], [ -126.2249832, 54.4506506 ], [ -126.2246467, 54.4508315 ], [ -126.224535899999978, 54.4508742 ], [ -126.2242853, 54.4509312 ], [ -126.2241455, 54.450945399999988 ], [ -126.2240216, 54.4509426 ], [ -126.223930699999983, 54.4509226 ], [ -126.2236922, 54.4508087 ], [ -126.223374099999987, 54.4507389 ], [ -126.223283099999989, 54.4506919 ], [ -126.2232412, 54.4506378 ], [ -126.223220199999986, 54.450484 ], [ -126.223134, 54.4504099 ], [ -126.223012399999973, 54.45038 ], [ -126.222827700000011, 54.4503757 ], [ -126.2227168, 54.4503914 ], [ -126.22253, 54.4504412 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17098078, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 29071.9698080573, "blue_line_key": 360880905, "length_metre": 109.833193953619, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4262423, 54.3124311 ], [ -126.4264866, 54.3127117 ], [ -126.427206200000015, 54.3132343 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17079367, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 5589.3470071203901, "blue_line_key": 360875052, "length_metre": 14.1379509155291, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3778959, 54.4978774 ], [ -126.378002200000012, 54.4978888 ], [ -126.3781115, 54.4978987 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17064479, "stream_order": 4, "gnis_name": "Johnny David Creek", "downstream_route_measure": 9721.6692803928199, "blue_line_key": 360866287, "length_metre": 995.80637437446205, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4350523, 54.576095 ], [ -126.435097399999989, 54.5761491 ], [ -126.4351962, 54.5762958 ], [ -126.435326499999974, 54.5764154 ], [ -126.435415299999974, 54.576471 ], [ -126.4355543, 54.5765094 ], [ -126.4358431, 54.5765692 ], [ -126.435932400000013, 54.5766162 ], [ -126.436246200000014, 54.5768299 ], [ -126.4364374, 54.5769865 ], [ -126.436479, 54.5770506 ], [ -126.4365352, 54.5771503 ], [ -126.4365879, 54.5772956 ], [ -126.436605, 54.5774935 ], [ -126.436609800000014, 54.5776915 ], [ -126.4365965, 54.5778709 ], [ -126.436588699999973, 54.5780063 ], [ -126.4365941, 54.5781672 ], [ -126.4365838, 54.5783381 ], [ -126.436512600000015, 54.578472 ], [ -126.436395099999984, 54.57864 ], [ -126.4363885, 54.5787298 ], [ -126.436447299999983, 54.5787938 ], [ -126.4365685, 54.578840799999988 ], [ -126.4367823, 54.5788551 ], [ -126.436889799999989, 54.578885 ], [ -126.4369796, 54.5789306 ], [ -126.43705270000001, 54.5789961 ], [ -126.437259, 54.5791798 ], [ -126.4373594, 54.579308 ], [ -126.437518699999984, 54.5794646 ], [ -126.4376978, 54.5795572 ], [ -126.4377912, 54.5795501 ], [ -126.438094, 54.5796826 ], [ -126.438422300000013, 54.5798691 ], [ -126.4385847, 54.5799816 ], [ -126.4387119, 54.580181 ], [ -126.4387011, 54.580360500000012 ], [ -126.438657799999987, 54.5805485 ], [ -126.438602300000014, 54.5807009 ], [ -126.438529, 54.5808974 ], [ -126.43853249999998, 54.581049799999988 ], [ -126.4386776, 54.581205 ], [ -126.4387521, 54.581252 ], [ -126.4390597, 54.5812862 ], [ -126.439182500000015, 54.5813147 ], [ -126.439272300000013, 54.5813531 ], [ -126.4393449, 54.5814272 ], [ -126.4394579, 54.5816181 ], [ -126.439541, 54.5817818 ], [ -126.439696200000014, 54.5819997 ], [ -126.4398758, 54.5821123 ], [ -126.4401883, 54.5823159 ], [ -126.4405313, 54.582531 ], [ -126.44066119999998, 54.5826591 ], [ -126.440759599999978, 54.5828144 ], [ -126.440784400000013, 54.5829127 ], [ -126.440822299999979, 54.5830579 ], [ -126.440814100000011, 54.5832018 ], [ -126.440743900000015, 54.5833257 ], [ -126.4406937, 54.5833784 ], [ -126.4406271, 54.5834496 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17080661, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 3959.3083751896702, "blue_line_key": 360875052, "length_metre": 974.88895543100102, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3573862, 54.4918174 ], [ -126.365185, 54.493081 ], [ -126.371955599999978, 54.4940819 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17062444, "stream_order": 4, "gnis_name": "Richfield Creek", "downstream_route_measure": 16178.2367506595, "blue_line_key": 360788426, "length_metre": 509.54935206059997, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2240026, 54.5869332 ], [ -126.2238482, 54.5869389 ], [ -126.2235856, 54.5869517 ], [ -126.223244, 54.5869517 ], [ -126.2230896, 54.58695740000001 ], [ -126.2228393, 54.5869702 ], [ -126.222543, 54.5870087 ], [ -126.2224337, 54.5870329 ], [ -126.222195099999979, 54.5871169 ], [ -126.221910099999974, 54.587228 ], [ -126.2216565, 54.587285 ], [ -126.2213305, 54.5873035 ], [ -126.221222900000015, 54.5873021 ], [ -126.220854499999987, 54.5872665 ], [ -126.2207296, 54.5872722 ], [ -126.2205533, 54.5873676 ], [ -126.220517500000014, 54.5874203 ], [ -126.2204129, 54.5875983 ], [ -126.2202929, 54.587792 ], [ -126.2201738, 54.5879344 ], [ -126.220109, 54.5879857 ], [ -126.220011700000015, 54.5880384 ], [ -126.219791500000014, 54.5881053 ], [ -126.2195567, 54.5881438 ], [ -126.219430699999975, 54.588159399999988 ], [ -126.219276900000011, 54.5881566 ], [ -126.2189976, 54.588168 ], [ -126.218686800000015, 54.588178 ], [ -126.2183146, 54.5881879 ], [ -126.2182044, 54.5881936 ], [ -126.21785, 54.588195 ], [ -126.217555100000013, 54.5881879 ], [ -126.217230199999989, 54.5881893 ], [ -126.2171058, 54.5881865 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17070925, "stream_order": 4, "gnis_name": "Perow Creek", "downstream_route_measure": 4815.8241420273498, "blue_line_key": 360836816, "length_metre": 316.18318967658797, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4862304, 54.5423953 ], [ -126.4862881, 54.5424694 ], [ -126.4864183, 54.542589 ], [ -126.4865196, 54.5427072 ], [ -126.4866355, 54.5428539 ], [ -126.486738299999985, 54.5429465 ], [ -126.4868837, 54.5430932 ], [ -126.486985, 54.5432114 ], [ -126.487098499999988, 54.5433581 ], [ -126.487213399999987, 54.5435219 ], [ -126.487265400000013, 54.5436757 ], [ -126.487376799999979, 54.543885 ], [ -126.4874319, 54.5439947 ], [ -126.4874699, 54.5441115 ], [ -126.4875367, 54.5442653 ], [ -126.4875812, 54.5443209 ], [ -126.4876448, 54.5445473 ], [ -126.4876559, 54.5446285 ], [ -126.487656199999989, 54.5448535 ], [ -126.4877113, 54.5449703 ], [ -126.487799, 54.5450358 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17070963, "stream_order": 4, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 16632.510416153698, "blue_line_key": 360875378, "length_metre": 1010.19954057964, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.636612700000015, 54.5415906 ], [ -126.6367811, 54.5415935 ], [ -126.637017199999988, 54.5415351 ], [ -126.6372819, 54.5415223 ], [ -126.6375745, 54.541528 ], [ -126.6379605, 54.5415266 ], [ -126.638331699999981, 54.5415251 ], [ -126.6384687, 54.541555 ], [ -126.638805600000012, 54.5416248 ], [ -126.6389136, 54.5416533 ], [ -126.6392308, 54.541758699999988 ], [ -126.639516699999987, 54.5418983 ], [ -126.6397107, 54.5420193 ], [ -126.6398905, 54.5421034 ], [ -126.6401198, 54.5421717 ], [ -126.6402426, 54.5422002 ], [ -126.6405191, 54.5422244 ], [ -126.640839299999982, 54.5422928 ], [ -126.640977799999987, 54.5423042 ], [ -126.641209, 54.5423099 ], [ -126.641487899999987, 54.5423056 ], [ -126.6418439, 54.5423127 ], [ -126.642116, 54.5423996 ], [ -126.642314399999989, 54.5424651 ], [ -126.6425404, 54.5425506 ], [ -126.6428596, 54.5426645 ], [ -126.643194, 54.5427343 ], [ -126.6434205, 54.5428468 ], [ -126.6434932, 54.5429209 ], [ -126.6435203, 54.5429921 ], [ -126.643513, 54.5431274 ], [ -126.643476199999981, 54.5431986 ], [ -126.6433104, 54.5434022 ], [ -126.6433341, 54.543519 ], [ -126.643498699999981, 54.5436401 ], [ -126.6436652, 54.5437056 ], [ -126.6437713, 54.5437255 ], [ -126.644096299999987, 54.5437227 ], [ -126.6442358, 54.543717 ], [ -126.644521399999988, 54.5435788 ], [ -126.6447399, 54.5435646 ], [ -126.6448608, 54.5435845 ], [ -126.6449354, 54.5436315 ], [ -126.644994399999973, 54.5436956 ], [ -126.64502, 54.5437853 ], [ -126.64502610000001, 54.543974800000015 ], [ -126.6451377, 54.5441571 ], [ -126.6452276, 54.5442311 ], [ -126.6454555, 54.5442895 ], [ -126.645514, 54.5443266 ], [ -126.645541099999988, 54.5443978 ], [ -126.6455628, 54.5445701 ], [ -126.6455437, 54.5446328 ], [ -126.6454869, 54.5448193 ], [ -126.645478200000014, 54.5449731 ], [ -126.6454586, 54.5450443 ], [ -126.645339, 54.545221 ], [ -126.645319899999976, 54.5452836 ], [ -126.64536360000001, 54.5453563 ], [ -126.645453499999988, 54.5453947 ], [ -126.64579329999998, 54.5453919 ], [ -126.646042799999989, 54.545352 ], [ -126.646280799999985, 54.5452665 ], [ -126.646495399999978, 54.5452708 ], [ -126.646572099999986, 54.5452907 ], [ -126.64669, 54.5453833 ], [ -126.6467328, 54.545473 ], [ -126.6467727, 54.5455642 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17083835, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 3447.5521409286298, "blue_line_key": 360846413, "length_metre": 40.886108950578098, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3041313, 54.4776251 ], [ -126.304212400000011, 54.4775553 ], [ -126.3044412, 54.4773802 ], [ -126.30452, 54.4773374 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17085789, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 196972.89002404001, "blue_line_key": 360873822, "length_metre": 448.11682427567899, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.516201, 54.4653456 ], [ -126.5147928, 54.4654766 ], [ -126.5141855, 54.4654752 ], [ -126.513638, 54.465394 ], [ -126.5133484, 54.4651291 ], [ -126.5131846, 54.465050800000014 ], [ -126.5126653, 54.4651134 ], [ -126.512381300000015, 54.4652388 ], [ -126.5122267, 54.4653727 ], [ -126.5118242, 54.4659352 ], [ -126.5117761, 54.4663112 ], [ -126.511950399999989, 54.46671 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100895, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 0.0, "blue_line_key": 360874778, "length_metre": 507.08156478234298, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3678457, 54.2642045 ], [ -126.36774, 54.2641661 ], [ -126.367415899999983, 54.264213 ], [ -126.367308499999979, 54.2642202 ], [ -126.366969700000013, 54.2642131 ], [ -126.3668616, 54.2642287 ], [ -126.366594299999988, 54.2643213 ], [ -126.3664363, 54.2644082 ], [ -126.366187200000013, 54.2644295 ], [ -126.3659747, 54.2644238 ], [ -126.365669399999987, 54.2643911 ], [ -126.3654417, 54.2643327 ], [ -126.365336, 54.2643213 ], [ -126.3650118, 54.2643142 ], [ -126.364875, 54.2643284 ], [ -126.3647645, 54.2643441 ], [ -126.364452599999979, 54.2644181 ], [ -126.364248799999984, 54.2645036 ], [ -126.364140100000014, 54.2645278 ], [ -126.364048, 54.2645264 ], [ -126.363754300000011, 54.2645292 ], [ -126.3634496, 54.2645221 ], [ -126.363264699999988, 54.2645278 ], [ -126.3631554, 54.2645606 ], [ -126.3631047, 54.2646133 ], [ -126.363005899999976, 54.2647186 ], [ -126.3629365, 54.264844 ], [ -126.362857800000015, 54.2648867 ], [ -126.362792499999983, 54.26493940000001 ], [ -126.3624875, 54.2651573 ], [ -126.362122500000012, 54.2653382 ], [ -126.361904700000011, 54.265388 ], [ -126.361793, 54.2654478 ], [ -126.3617216, 54.2655717 ], [ -126.3615337, 54.2656401 ], [ -126.361420199999984, 54.2657455 ], [ -126.3613414, 54.2657612 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17098803, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 3722.3682149381698, "blue_line_key": 360877225, "length_metre": 539.81991452209502, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.148189, 54.3010673 ], [ -126.1483774, 54.3010189 ], [ -126.148613399999988, 54.3009605 ], [ -126.1488013, 54.3008936 ], [ -126.1490062, 54.3008266 ], [ -126.149313, 54.3008152 ], [ -126.1495562, 54.300858 ], [ -126.1498152, 54.3008907 ], [ -126.150059599999977, 54.3009235 ], [ -126.150254899999979, 54.3009904 ], [ -126.150449099999989, 54.3010673 ], [ -126.1505394, 54.3010873 ], [ -126.1506654, 54.301063 ], [ -126.1510276, 54.3009192 ], [ -126.1512771, 54.3008708 ], [ -126.1514063, 54.3007839 ], [ -126.1515233, 54.30067 ], [ -126.151638599999984, 54.3005475 ], [ -126.1517532, 54.3004335 ], [ -126.1518537, 54.3003182 ], [ -126.1519543, 54.3001957 ], [ -126.152069399999988, 54.3000803 ], [ -126.1521833, 54.300002 ], [ -126.1522483, 54.2999507 ], [ -126.1524576, 54.2998112 ], [ -126.1526835, 54.299673 ], [ -126.1529248, 54.2994993 ], [ -126.1531227, 54.2993241 ], [ -126.1533327, 54.299176 ], [ -126.1535434, 54.2990193 ], [ -126.1537521, 54.2988612 ], [ -126.1540385, 54.2987245 ], [ -126.154318499999974, 54.298686 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17094375, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 219.16202746339101, "blue_line_key": 360881038, "length_metre": 61.053150460927299, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1255738, 54.3815494 ], [ -126.1257685, 54.3814098 ], [ -126.1259277, 54.3813144 ], [ -126.1260385, 54.3812717 ], [ -126.126169, 54.3811677 ], [ -126.1262161, 54.3811592 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17068831, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 9808.1629224895205, "blue_line_key": 360875378, "length_metre": 225.86458619778901, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5557762, 54.552003 ], [ -126.5559893, 54.5520614 ], [ -126.5563059, 54.552211 ], [ -126.5566191, 54.5524061 ], [ -126.556677, 54.5524517 ], [ -126.556791699999977, 54.5526169 ], [ -126.55684620000001, 54.552708 ], [ -126.556927, 54.5529074 ], [ -126.5569721, 54.5529615 ], [ -126.5572219, 54.5531552 ], [ -126.5573142, 54.5531937 ], [ -126.5574507, 54.553232099999988 ], [ -126.5575431, 54.5532421 ], [ -126.557914899999986, 54.5532321 ], [ -126.5581295, 54.5532364 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17054549, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 20491.638872814601, "blue_line_key": 360856488, "length_metre": 264.19458350793502, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5186574, 54.6299073 ], [ -126.518743199999975, 54.630044 ], [ -126.5188217, 54.6302519 ], [ -126.518890699999986, 54.6304157 ], [ -126.519080399999979, 54.630608 ], [ -126.5191986, 54.6307006 ], [ -126.5194803, 54.63090420000001 ], [ -126.5195833, 54.6310054 ], [ -126.519668, 54.6311236 ], [ -126.519738499999988, 54.6312332 ], [ -126.5198066, 54.6313785 ], [ -126.5198657, 54.6314426 ], [ -126.520038199999988, 54.6316705 ], [ -126.5201821, 54.631852800000011 ], [ -126.520225, 54.6318998 ], [ -126.520355099999989, 54.6320365 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17096245, "stream_order": 4, "gnis_name": "Dungate Creek", "downstream_route_measure": 6106.1060526711799, "blue_line_key": 360760898, "length_metre": 395.35856792941502, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.566455099999985, 54.341531900000014 ], [ -126.5663813, 54.341485 ], [ -126.5660829, 54.3412984 ], [ -126.565766, 54.34122 ], [ -126.5654453, 54.3411873 ], [ -126.5652141, 54.3411916 ], [ -126.56493540000001, 54.3412129 ], [ -126.564842, 54.3412286 ], [ -126.564483599999988, 54.3413027 ], [ -126.5641728, 54.3413596 ], [ -126.5638618, 54.3413895 ], [ -126.5635242, 54.341391 ], [ -126.5632936, 54.3413867 ], [ -126.5631882, 54.3413667 ], [ -126.562850899999987, 54.3413326 ], [ -126.562729499999975, 54.3413027 ], [ -126.5625036, 54.3412087 ], [ -126.5622362, 54.3410591 ], [ -126.5619672, 54.3409281 ], [ -126.5617568, 54.3408526 ], [ -126.5616078, 54.3407415 ], [ -126.5613725, 54.3405564 ], [ -126.5612237, 54.3404723 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17084683, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 80.090705178640704, "blue_line_key": 360875052, "length_metre": 382.60130438228902, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.323064, 54.4725706 ], [ -126.3232796, 54.4725849 ], [ -126.3233866, 54.4726148 ], [ -126.323586299999974, 54.4726461 ], [ -126.323786399999975, 54.4726418 ], [ -126.3238948, 54.4726262 ], [ -126.3242001, 54.4724353 ], [ -126.3242955, 54.4724011 ], [ -126.3246277, 54.472273 ], [ -126.32472150000001, 54.4722573 ], [ -126.3249068, 54.472253 ], [ -126.325055400000011, 54.4723456 ], [ -126.325114700000015, 54.4723926 ], [ -126.3251399, 54.4724738 ], [ -126.3252145, 54.4725193 ], [ -126.325303800000015, 54.4725578 ], [ -126.32559, 54.4726632 ], [ -126.325753899999981, 54.4727472 ], [ -126.3259785, 54.4728882 ], [ -126.326193300000014, 54.4728839 ], [ -126.326301699999988, 54.4728683 ], [ -126.3265392, 54.4727928 ], [ -126.3266779, 54.4727956 ], [ -126.3268995, 54.4729523 ], [ -126.3271413, 54.473030599999987 ], [ -126.327215899999985, 54.4730762 ], [ -126.3273409, 54.473277 ], [ -126.3275286, 54.4734878 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17067692, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 534.53759854496798, "blue_line_key": 360881574, "length_metre": 7.05533053586083, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5969773, 54.5582938 ], [ -126.597061599999975, 54.558334 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101558, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 15546.0800862858, "blue_line_key": 360880905, "length_metre": 388.96404122243803, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4052261, 54.2527524 ], [ -126.4050987, 54.2528222 ], [ -126.4049541, 54.2528991 ], [ -126.404875, 54.2529703 ], [ -126.4047938, 54.2530131 ], [ -126.4047286, 54.2530658 ], [ -126.404603, 54.253117 ], [ -126.404492, 54.2531954 ], [ -126.404424400000011, 54.2532751 ], [ -126.404390899999981, 54.2533278 ], [ -126.4043715, 54.2533819 ], [ -126.4043838, 54.2534361 ], [ -126.4045017, 54.2535016 ], [ -126.4046073, 54.25354 ], [ -126.404759899999988, 54.2535699 ], [ -126.4048656, 54.2536084 ], [ -126.4049218, 54.2536896 ], [ -126.404917700000013, 54.2537351 ], [ -126.4048994, 54.2537793 ], [ -126.4048513, 54.253832 ], [ -126.404786699999974, 54.2538761 ], [ -126.404659799999976, 54.2539445 ], [ -126.4045659, 54.2539616 ], [ -126.4044261, 54.2539844 ], [ -126.404288099999988, 54.2539815 ], [ -126.4041801, 54.2539972 ], [ -126.4041143, 54.2540584 ], [ -126.404065, 54.2541211 ], [ -126.4040456, 54.2541752 ], [ -126.4039663, 54.2542265 ], [ -126.4038882, 54.2542336 ], [ -126.403796, 54.2542322 ], [ -126.4036898, 54.2542293 ], [ -126.4035806, 54.2542279 ], [ -126.4034597, 54.2542251 ], [ -126.403367, 54.2542322 ], [ -126.403243, 54.2542379 ], [ -126.4031363, 54.2542365 ], [ -126.4030123, 54.2542422 ], [ -126.402888399999981, 54.2542479 ], [ -126.4027664, 54.254255 ], [ -126.402642399999976, 54.2542607 ], [ -126.402551, 54.2542778 ], [ -126.402427, 54.2542835 ], [ -126.4023343, 54.2542906 ], [ -126.4022263, 54.2543063 ], [ -126.4021189, 54.2543134 ], [ -126.4020102, 54.2543105 ], [ -126.4018716, 54.2543162 ], [ -126.401749599999988, 54.2543233 ], [ -126.4017038, 54.2543219 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17081633, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 227603.019933045, "blue_line_key": 360873822, "length_metre": 150.29909780779201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.270157399999988, 54.4886485 ], [ -126.2699404, 54.4884377 ], [ -126.2698988, 54.4883822 ], [ -126.2697728, 54.4881913 ], [ -126.269744100000011, 54.4881272 ], [ -126.2696805, 54.4879193 ], [ -126.2695824, 54.4877812 ], [ -126.26942360000001, 54.4876345 ], [ -126.2693847, 54.4875163 ], [ -126.26946860000001, 54.4874109 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17084865, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 5198.3741129206201, "blue_line_key": 360846413, "length_metre": 102.44936446381, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.322121199999984, 54.4723883 ], [ -126.3221896, 54.4722644 ], [ -126.3222571, 54.4721846 ], [ -126.3223915, 54.4720266 ], [ -126.3224154, 54.4718827 ], [ -126.322412, 54.4716848 ], [ -126.322441200000014, 54.4715053 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17086742, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 233786.68808983901, "blue_line_key": 360873822, "length_metre": 408.35509487658402, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2480042, 54.4598168 ], [ -126.2478268, 54.4596958 ], [ -126.2476291, 54.459673 ], [ -126.2473648, 54.4596858 ], [ -126.2472097, 54.4597086 ], [ -126.2469551, 54.4598111 ], [ -126.2468892, 54.4598724 ], [ -126.246869300000014, 54.459935 ], [ -126.2469661, 54.4601173 ], [ -126.2469456, 54.4601885 ], [ -126.24689570000001, 54.4602597 ], [ -126.246749, 54.4603552 ], [ -126.2466416, 54.4603609 ], [ -126.2464853, 54.4603666 ], [ -126.2463474, 54.4603822 ], [ -126.2461642, 54.4603324 ], [ -126.2461233, 54.460268299999989 ], [ -126.2461181, 54.4600974 ], [ -126.2461181, 54.4598909 ], [ -126.246188499999988, 54.4597485 ], [ -126.2462544, 54.4596872 ], [ -126.2462595, 54.4596245 ], [ -126.2462214, 54.4594978 ], [ -126.246132, 54.4594323 ], [ -126.2458637, 54.4592913 ], [ -126.2457717, 54.4592813 ], [ -126.245556499999978, 54.4592941 ], [ -126.2454455, 54.4593098 ], [ -126.2450903, 54.4593098 ], [ -126.244847100000015, 54.459277 ], [ -126.2446346, 54.4592272 ], [ -126.244470299999989, 54.4591517 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104771, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 6685.4140664077004, "blue_line_key": 360882583, "length_metre": 403.98001776136903, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.974858700000013, 54.211372 ], [ -125.9748448, 54.2113635 ], [ -125.9747923, 54.2112752 ], [ -125.9747872, 54.2112296 ], [ -125.9748141, 54.211157 ], [ -125.9748412, 54.2111299 ], [ -125.974856099999982, 54.2111029 ], [ -125.9748837, 54.2110744 ], [ -125.9750089, 54.2109006 ], [ -125.9750389, 54.2108721 ], [ -125.9750662, 54.210818 ], [ -125.9752212, 54.2106428 ], [ -125.9754409, 54.2105033 ], [ -125.9755033, 54.2102953 ], [ -125.9754836, 54.2102498 ], [ -125.9752607, 54.2101216 ], [ -125.9749763, 54.2100019 ], [ -125.974928, 54.2099678 ], [ -125.9748911, 54.2098966 ], [ -125.9749048, 54.2098595 ], [ -125.974934300000015, 54.2098325 ], [ -125.9750983, 54.209784 ], [ -125.9754325, 54.2097299 ], [ -125.975476899999975, 54.2097285 ], [ -125.9756146, 54.2096986 ], [ -125.975963400000012, 54.2096445 ], [ -125.9761725, 54.2095861 ], [ -125.9763059, 54.209502 ], [ -125.976322, 54.2092941 ], [ -125.976267799999988, 54.2091973 ], [ -125.976148, 54.2090207 ], [ -125.9760289, 54.2088426 ], [ -125.9759238, 54.208666 ], [ -125.975875599999981, 54.2086319 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17106352, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 10891.755997366099, "blue_line_key": 360882583, "length_metre": 67.8156530459283, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.955385399999983, 54.1835458 ], [ -125.9552082, 54.1834333 ], [ -125.955212, 54.1832724 ], [ -125.9551782, 54.1832453 ], [ -125.955218800000011, 54.1831556 ], [ -125.9554915, 54.1831029 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17082724, "stream_order": 5, "gnis_name": "Ailport Creek", "downstream_route_measure": 8884.9617045994091, "blue_line_key": 360878058, "length_metre": 793.027779109422, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1658442, 54.4861661 ], [ -126.1658287, 54.4861476 ], [ -126.1657822, 54.4859211 ], [ -126.1656708, 54.4857388 ], [ -126.16562660000001, 54.4857118 ], [ -126.1653047, 54.4856862 ], [ -126.16500259999998, 54.4858044 ], [ -126.1647312, 54.4859325 ], [ -126.1644042, 54.4859696 ], [ -126.1642701, 54.4859126 ], [ -126.164115599999988, 54.4856933 ], [ -126.1639162, 54.4854554 ], [ -126.1638845, 54.485256 ], [ -126.163617399999978, 54.485098 ], [ -126.1635139, 54.4850239 ], [ -126.163502499999979, 54.4849598 ], [ -126.16350030000001, 54.4847533 ], [ -126.163484, 54.4845454 ], [ -126.16368030000001, 54.4843802 ], [ -126.1639234, 54.484242 ], [ -126.1641118, 54.4839757 ], [ -126.164110799999989, 54.4837521 ], [ -126.164084699999989, 54.483688 ], [ -126.1638841, 54.4834672 ], [ -126.163619399999988, 54.4832821 ], [ -126.163239, 54.4832009 ], [ -126.163082, 54.4832422 ], [ -126.1627491, 54.4833504 ], [ -126.1625479, 54.4833647 ], [ -126.162409599999989, 54.4833334 ], [ -126.162208400000011, 54.4833476 ], [ -126.162057, 54.4835242 ], [ -126.1619648, 54.4835214 ], [ -126.1618437, 54.4834829 ], [ -126.1615919, 54.4833234 ], [ -126.1612775, 54.483181 ], [ -126.1609091, 54.4831553 ], [ -126.1604889, 54.4831995 ], [ -126.160220400000014, 54.4832921 ], [ -126.16011060000001, 54.4833248 ], [ -126.159763, 54.4834331 ], [ -126.159740899999989, 54.4835498 ], [ -126.1597976, 54.483596800000015 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076385, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 208186.55326202401, "blue_line_key": 360873822, "length_metre": 1208.4812139231201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4372383, 54.5158509 ], [ -126.435928, 54.5155917 ], [ -126.4350612, 54.5151872 ], [ -126.4346304, 54.5150932 ], [ -126.433367499999989, 54.5151545 ], [ -126.432532, 54.515396599999988 ], [ -126.4319948, 54.5154664 ], [ -126.431704400000015, 54.5154479 ], [ -126.4314544, 54.5153909 ], [ -126.4309248, 54.5149836 ], [ -126.4303803, 54.514681599999989 ], [ -126.4296293, 54.5146403 ], [ -126.4292587, 54.5146546 ], [ -126.429096, 54.514713 ], [ -126.428497799999988, 54.5151673 ], [ -126.427520199999989, 54.5156259 ], [ -126.4270795, 54.5157213 ], [ -126.4262649, 54.5158053 ], [ -126.4258778, 54.5157968 ], [ -126.425302699999975, 54.5157156 ], [ -126.4248213, 54.515549 ], [ -126.424644399999977, 54.5154094 ], [ -126.424433099999987, 54.5150391 ], [ -126.4243631, 54.5145734 ], [ -126.4240196, 54.5142373 ], [ -126.4240093, 54.5139724 ], [ -126.4242258, 54.513438300000011 ], [ -126.4241378, 54.5131292 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17089486, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 276472.84944245103, "blue_line_key": 360873822, "length_metre": 295.677037366685, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1428258, 54.4369198 ], [ -126.1428617, 54.4370651 ], [ -126.1428805, 54.4372445 ], [ -126.1428933, 54.4374881 ], [ -126.142910299999983, 54.437686 ], [ -126.1428743, 54.4379908 ], [ -126.142767400000011, 54.4381859 ], [ -126.1426295, 54.4384266 ], [ -126.1425733, 54.438767 ], [ -126.1426528, 54.4389749 ], [ -126.1427583, 54.4392199 ], [ -126.142814199999989, 54.4395275 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17100095, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 19465.524851717499, "blue_line_key": 360886221, "length_metre": 1308.1712219513199, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6416949, 54.2853469 ], [ -126.6416336, 54.2853269 ], [ -126.6415426, 54.2853084 ], [ -126.641346, 54.28525 ], [ -126.641180600000013, 54.2851931 ], [ -126.641090600000013, 54.2851646 ], [ -126.640984, 54.2851347 ], [ -126.640879700000013, 54.2850706 ], [ -126.6408211, 54.2850151 ], [ -126.640762599999988, 54.2849595 ], [ -126.640705499999981, 54.2849139 ], [ -126.6406481, 54.284841299999989 ], [ -126.6405899, 54.2847502 ], [ -126.6405484, 54.2846946 ], [ -126.640504, 54.2846405 ], [ -126.640419799999989, 54.2845123 ], [ -126.6403771, 54.2844397 ], [ -126.6403235, 54.2843215 ], [ -126.640296799999987, 54.2842588 ], [ -126.6402905, 54.2840964 ], [ -126.6403132, 54.2839626 ], [ -126.640333399999989, 54.2838913 ], [ -126.64035, 54.2838372 ], [ -126.6404505, 54.2837318 ], [ -126.640532, 54.283625 ], [ -126.640580899999989, 54.2835624 ], [ -126.6406458, 54.2835097 ], [ -126.6407761, 54.2833957 ], [ -126.6409206, 54.2832903 ], [ -126.6410639, 54.2831949 ], [ -126.6414644, 54.2828887 ], [ -126.641532899999987, 54.2827634 ], [ -126.641616899999988, 54.2826566 ], [ -126.641714400000012, 54.2825597 ], [ -126.6418108, 54.2824728 ], [ -126.641892, 54.2824016 ], [ -126.64195740000001, 54.2823404 ], [ -126.6420071, 54.2822962 ], [ -126.6420403, 54.2822435 ], [ -126.642072899999988, 54.2821994 ], [ -126.642121800000012, 54.2821367 ], [ -126.6421235, 54.2821182 ], [ -126.6421566, 54.2820655 ], [ -126.6421804, 54.2819217 ], [ -126.6422208, 54.2817792 ], [ -126.6422407, 54.281681 ], [ -126.642262, 54.2815998 ], [ -126.642286299999981, 54.2814474 ], [ -126.642309, 54.2813135 ], [ -126.642300600000013, 54.2811782 ], [ -126.6422594, 54.2810871 ], [ -126.642176400000011, 54.2809418 ], [ -126.6421058, 54.2808236 ], [ -126.642018900000011, 54.2807239 ], [ -126.641949, 54.2806313 ], [ -126.6418616, 54.280540200000011 ], [ -126.641804499999978, 54.2804319 ], [ -126.6417766, 54.2803864 ], [ -126.641681, 54.280187 ], [ -126.6416437, 54.2800503 ], [ -126.641618400000013, 54.279942 ], [ -126.641606799999977, 54.2798708 ], [ -126.641611, 54.2797896 ], [ -126.641605, 54.2796543 ], [ -126.6416271, 54.279529 ], [ -126.6416161, 54.2794564 ], [ -126.641618600000015, 54.2793937 ], [ -126.6416262, 54.2792684 ], [ -126.641647799999987, 54.2791516 ], [ -126.641624299999989, 54.2790519 ], [ -126.641549900000015, 54.2789793 ], [ -126.641431399999988, 54.2789137 ], [ -126.641296199999985, 54.2788753 ], [ -126.641204, 54.2788739 ], [ -126.640925699999983, 54.2788952 ], [ -126.6407266, 54.2788995 ], [ -126.6406173, 54.2788981 ], [ -126.6405099, 54.2789052 ], [ -126.640311399999987, 54.278900899999989 ], [ -126.640097399999974, 54.2788781 ], [ -126.640019899999984, 54.2788767 ], [ -126.6398835, 54.2788482 ], [ -126.639701599999981, 54.2787898 ], [ -126.639553699999979, 54.2786973 ], [ -126.6394521, 54.2786047 ], [ -126.6393647, 54.2785135 ], [ -126.6392621, 54.2784309 ], [ -126.6391136, 54.2783469 ], [ -126.638949900000014, 54.2782714 ], [ -126.638830200000015, 54.278188799999988 ], [ -126.638806699999975, 54.278089099999988 ], [ -126.6388272, 54.2779823 ], [ -126.638846899999976, 54.2779196 ], [ -126.6388817, 54.2778484 ], [ -126.638966, 54.277706 ], [ -126.6390497, 54.2775721 ], [ -126.639085099999974, 54.2774924 ], [ -126.6391194, 54.2774297 ], [ -126.6391586, 54.2773044 ], [ -126.639195, 54.2771805 ], [ -126.639214599999988, 54.2771178 ], [ -126.6392171, 54.2770551 ], [ -126.639223, 54.2769555 ], [ -126.6392448, 54.276865699999981 ], [ -126.639293200000012, 54.2768045 ], [ -126.6393128, 54.2767418 ], [ -126.639314199999987, 54.276696199999989 ], [ -126.639320399999988, 54.2766165 ], [ -126.6393414, 54.2765083 ], [ -126.6393467, 54.27641 ], [ -126.639353199999988, 54.2763017 ], [ -126.6393455, 54.276185 ], [ -126.639333400000012, 54.2761223 ], [ -126.6393208, 54.2760682 ], [ -126.639312, 54.2759685 ], [ -126.6392709, 54.2758773 ], [ -126.6392436, 54.2758232 ], [ -126.639156, 54.275705 ], [ -126.639085599999987, 54.2756138 ], [ -126.639056599999975, 54.2755854 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17095087, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 8218.9713193151001, "blue_line_key": 360886524, "length_metre": 685.42077451597004, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2312144, 54.3656239 ], [ -126.231354700000011, 54.3656281 ], [ -126.2314759, 54.365631 ], [ -126.2318285, 54.3656837 ], [ -126.231993800000012, 54.365740700000011 ], [ -126.2322268, 54.3659087 ], [ -126.232471, 54.36595 ], [ -126.2326265, 54.3659529 ], [ -126.232812, 54.3659401 ], [ -126.23301450000001, 54.3658731 ], [ -126.2331405, 54.3658489 ], [ -126.233233500000011, 54.3658418 ], [ -126.233477099999988, 54.365864599999988 ], [ -126.2335874, 54.3658503 ], [ -126.2337911, 54.3658005 ], [ -126.2338976, 54.3658033 ], [ -126.2339624, 54.3657592 ], [ -126.2341013, 54.3657535 ], [ -126.234456799999975, 54.3657165 ], [ -126.2346618, 54.3656766 ], [ -126.234740699999989, 54.3656339 ], [ -126.2349403, 54.3656296 ], [ -126.2352299, 54.3656808 ], [ -126.2355765, 54.3658048 ], [ -126.2358196, 54.365856 ], [ -126.2359085, 54.3658945 ], [ -126.236013199999988, 54.36595 ], [ -126.236344, 54.3660568 ], [ -126.2364523, 54.3660682 ], [ -126.2368078, 54.3660312 ], [ -126.237084, 54.3660383 ], [ -126.2374383, 54.3660454 ], [ -126.2376727, 54.3660056 ], [ -126.2377663, 54.3659899 ], [ -126.2378735, 54.3659842 ], [ -126.238229, 54.3659472 ], [ -126.2384603, 54.3659429 ], [ -126.238581599999989, 54.3659728 ], [ -126.238690600000012, 54.3659757 ], [ -126.239026, 54.3660013 ], [ -126.239149699999984, 54.3660041 ], [ -126.2394753, 54.3659757 ], [ -126.2397849, 54.3659643 ], [ -126.2398951, 54.365923 ], [ -126.2402418, 54.3657948 ], [ -126.240465, 54.3656837 ], [ -126.240681599999988, 54.3656524 ], [ -126.241040899999987, 54.3655982 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17060845, "stream_order": 4, "gnis_name": "Richfield Creek", "downstream_route_measure": 18502.0571777306, "blue_line_key": 360788426, "length_metre": 381.00367269285499, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.195173099999977, 54.5951423 ], [ -126.19488170000001, 54.5953061 ], [ -126.1947013, 54.5954827 ], [ -126.19434889999998, 54.5956451 ], [ -126.1939705, 54.5957348 ], [ -126.1935149, 54.5958416 ], [ -126.1930909, 54.5959214 ], [ -126.1926669, 54.5960011 ], [ -126.1926207, 54.5959997 ], [ -126.192401499999974, 54.5960496 ], [ -126.1920688, 54.5961493 ], [ -126.1917514, 54.5962404 ], [ -126.1913479, 54.596276 ], [ -126.191037199999982, 54.5962789 ], [ -126.190556, 54.5963116 ], [ -126.190194099999985, 54.5963757 ], [ -126.1898967, 54.5964313 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17078682, "stream_order": 4, "gnis_name": "Ailport Creek", "downstream_route_measure": 15573.249108035299, "blue_line_key": 360878058, "length_metre": 43.693770243165901, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.103636499999979, 54.5017185 ], [ -126.1035912, 54.5017356 ], [ -126.1032775, 54.5017826 ], [ -126.1029952, 54.5018381 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17061607, "stream_order": 4, "gnis_name": "Richfield Creek", "downstream_route_measure": 17883.9384816739, "blue_line_key": 360788426, "length_metre": 139.43643964762001, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2008109, 54.5910563 ], [ -126.200677200000015, 54.5911702 ], [ -126.200517600000012, 54.5912742 ], [ -126.200224, 54.591465 ], [ -126.199996599999977, 54.5916217 ], [ -126.1997115, 54.5917328 ], [ -126.199425, 54.5918339 ], [ -126.199235300000012, 54.5918837 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099251, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 6489.7550714244699, "blue_line_key": 360877225, "length_metre": 80.412677005623195, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1818488, 54.2912958 ], [ -126.182154900000015, 54.291293 ], [ -126.1824928, 54.291283 ], [ -126.18280390000001, 54.291246 ], [ -126.18308, 54.2912517 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102490, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 29249.6623214541, "blue_line_key": 360881038, "length_metre": 77.048926691568695, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0667784, 54.2394218 ], [ -126.0669184, 54.239379100000015 ], [ -126.0671181, 54.2393663 ], [ -126.0672633, 54.2392894 ], [ -126.067317299999985, 54.2391555 ], [ -126.067257200000014, 54.2389476 ], [ -126.0672567, 54.2389291 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100190, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 9323.7760488283493, "blue_line_key": 360877225, "length_metre": 52.921332560013603, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.19460260000001, 54.2748334 ], [ -126.1945734, 54.2748063 ], [ -126.194505199999981, 54.2746781 ], [ -126.194506, 54.2746425 ], [ -126.1944799, 54.2745799 ], [ -126.1944798, 54.2743719 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17094190, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 256778.56008638701, "blue_line_key": 360873822, "length_metre": 1304.4974807113799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1453276, 54.3874399 ], [ -126.1452718, 54.3873573 ], [ -126.145106899999988, 54.3872719 ], [ -126.1448803, 54.387222 ], [ -126.14465, 54.3872163 ], [ -126.1446183, 54.3872163 ], [ -126.144532, 54.3873402 ], [ -126.1444928, 54.3874826 ], [ -126.144318299999981, 54.3875595 ], [ -126.1440231, 54.3875709 ], [ -126.1437628, 54.3875467 ], [ -126.1435196, 54.3874955 ], [ -126.143293, 54.3874456 ], [ -126.143065799999988, 54.3873773 ], [ -126.142870300000013, 54.3873089 ], [ -126.1426768, 54.387242 ], [ -126.142479499999979, 54.387165 ], [ -126.142332, 54.3870725 ], [ -126.1422339, 54.3869443 ], [ -126.1421659, 54.3868076 ], [ -126.142003500000015, 54.3867221 ], [ -126.1417432, 54.3866979 ], [ -126.1414634, 54.3867278 ], [ -126.141258900000011, 54.3867862 ], [ -126.141097699999989, 54.3868802 ], [ -126.141012699999976, 54.3870141 ], [ -126.14106240000001, 54.3871679 ], [ -126.141178200000013, 54.3872875 ], [ -126.1412456, 54.3874328 ], [ -126.141265899999979, 54.3875866 ], [ -126.1411054, 54.3876721 ], [ -126.140856199999988, 54.3877119 ], [ -126.1405629, 54.3877048 ], [ -126.1402529, 54.3875268 ], [ -126.140121799999989, 54.3874157 ], [ -126.1399594, 54.3873302 ], [ -126.1396157, 54.3871508 ], [ -126.139404499999983, 54.3870924 ], [ -126.1392085, 54.3870255 ], [ -126.1389831, 54.3869657 ], [ -126.138656, 54.3867876 ], [ -126.1383135, 54.3866253 ], [ -126.1380698, 54.3865754 ], [ -126.1378426, 54.3865341 ], [ -126.1376625, 54.3864572 ], [ -126.137351399999986, 54.3862621 ], [ -126.1371744, 54.3861766 ], [ -126.1369459, 54.3861254 ], [ -126.1366531, 54.3861097 ], [ -126.1363622, 54.3861026 ], [ -126.136102600000015, 54.3860698 ], [ -126.1358924, 54.3860015 ], [ -126.1358226, 54.3858833 ], [ -126.135725899999983, 54.385738 ], [ -126.1356579, 54.3856013 ], [ -126.1355108, 54.3855073 ], [ -126.1353161, 54.3854304 ], [ -126.1350387, 54.3854061 ], [ -126.134789500000011, 54.385446 ], [ -126.1345414, 54.3854759 ], [ -126.1342621, 54.3855044 ], [ -126.1339534, 54.3855058 ], [ -126.1336638, 54.3854816 ], [ -126.133404200000015, 54.3854489 ], [ -126.133145, 54.3854147 ], [ -126.1328676, 54.3853905 ], [ -126.1325443, 54.3853919 ], [ -126.1322516, 54.3854033 ], [ -126.1319435, 54.3853962 ], [ -126.131653300000011, 54.3853805 ], [ -126.1313458, 54.385372 ], [ -126.131036599999973, 54.3853748 ], [ -126.1307719, 54.3854033 ], [ -126.130464499999988, 54.3854147 ], [ -126.1301559, 54.385416100000015 ], [ -126.129928, 54.3853563 ], [ -126.1297174, 54.3852894 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104924, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 34155.018670860998, "blue_line_key": 360881038, "length_metre": 494.100942472177, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0573712, 54.2087558 ], [ -126.0573415, 54.2087372 ], [ -126.0571151, 54.2086774 ], [ -126.057043799999988, 54.2086133 ], [ -126.0570187, 54.2085492 ], [ -126.0569966, 54.2084239 ], [ -126.0568929, 54.2083484 ], [ -126.0568479, 54.2083385 ], [ -126.056527899999978, 54.2083214 ], [ -126.0564809, 54.2083299 ], [ -126.056389400000015, 54.2083271 ], [ -126.056187899999983, 54.208358399999987 ], [ -126.055904, 54.2084681 ], [ -126.0557339, 54.2084738 ], [ -126.0556888, 54.2084638 ], [ -126.0556311, 54.2084353 ], [ -126.0556027, 54.2084068 ], [ -126.0554132, 54.2082402 ], [ -126.0554013, 54.2082131 ], [ -126.0553418, 54.2081761 ], [ -126.055281, 54.2081562 ], [ -126.0552068, 54.2081462 ], [ -126.0548556, 54.2081277 ], [ -126.0547341, 54.2080807 ], [ -126.0546328, 54.2080052 ], [ -126.0546199, 54.2079611 ], [ -126.0545733, 54.2077702 ], [ -126.054589900000011, 54.2075466 ], [ -126.054575500000013, 54.2075195 ], [ -126.054583, 54.2074199 ], [ -126.0545409, 54.2073558 ], [ -126.05449729999998, 54.2073287 ], [ -126.0543407, 54.207172 ], [ -126.0543098, 54.2071436 ], [ -126.0542744, 54.2070083 ], [ -126.0543042, 54.2068017 ], [ -126.0544095, 54.2066152 ], [ -126.054403799999989, 54.2064984 ], [ -126.0541844, 54.2063403 ], [ -126.0541394, 54.206330300000012 ], [ -126.0538743, 54.2061708 ], [ -126.053757300000015, 54.2058803 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17092030, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 246349.95623214901, "blue_line_key": 360873822, "length_metre": 1418.3180725570601, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.209380699999983, 54.4183111 ], [ -126.209008, 54.4183196 ], [ -126.2088712, 54.4182983 ], [ -126.2086189, 54.4181487 ], [ -126.208564099999975, 54.4180761 ], [ -126.2085286, 54.4178952 ], [ -126.2085516, 54.4177969 ], [ -126.208592200000012, 54.4176631 ], [ -126.2087088, 54.417522100000014 ], [ -126.2089055, 54.4173284 ], [ -126.2090205, 54.417233 ], [ -126.2090722, 54.4171432 ], [ -126.209094199999981, 54.417082 ], [ -126.2090976, 54.4170179 ], [ -126.209064, 54.4168384 ], [ -126.2090203, 54.4167829 ], [ -126.2089472, 54.4167274 ], [ -126.2088275, 54.4166789 ], [ -126.2086613, 54.4166305 ], [ -126.208491399999986, 54.4166262 ], [ -126.208261599999986, 54.416612 ], [ -126.2081407, 54.4165735 ], [ -126.2080517, 54.4165351 ], [ -126.2080081, 54.4164724 ], [ -126.207982800000011, 54.4163998 ], [ -126.208021, 54.416293 ], [ -126.208240800000013, 54.416226 ], [ -126.2085454, 54.4160523 ], [ -126.2085961, 54.4159996 ], [ -126.2086009, 54.4159455 ], [ -126.2085683, 54.415729 ], [ -126.208510499999988, 54.415664899999989 ], [ -126.2084357, 54.4156279 ], [ -126.2083596, 54.4156079 ], [ -126.2081138, 54.4156108 ], [ -126.207768, 54.415729 ], [ -126.2074384, 54.4158016 ], [ -126.2073129, 54.4158173 ], [ -126.2070064, 54.4158187 ], [ -126.2067111, 54.4158301 ], [ -126.206473, 54.4159412 ], [ -126.2062531, 54.415981099999989 ], [ -126.205993299999989, 54.4159754 ], [ -126.2057687, 54.4158714 ], [ -126.2057091, 54.4158258 ], [ -126.2057038, 54.4156905 ], [ -126.2057762, 54.4155296 ], [ -126.206014900000014, 54.41541 ], [ -126.2062649, 54.4153886 ], [ -126.206403299999977, 54.4153915 ], [ -126.206493, 54.4154214 ], [ -126.2066161, 54.4154328 ], [ -126.2069557, 54.4154142 ], [ -126.2072226, 54.4153388 ], [ -126.207273300000011, 54.4152861 ], [ -126.207255499999988, 54.4150966 ], [ -126.207126299999985, 54.4149314 ], [ -126.2070927, 54.414752 ], [ -126.207114499999989, 54.4146708 ], [ -126.207196400000015, 54.4145925 ], [ -126.2073095, 54.4145227 ], [ -126.2073643, 54.4143974 ], [ -126.2073684, 54.4143176 ], [ -126.2072422, 54.4141438 ], [ -126.2071225, 54.4140954 ], [ -126.206998700000014, 54.4140926 ], [ -126.206906300000014, 54.4141182 ], [ -126.206741900000011, 54.4142492 ], [ -126.2066559, 54.4144002 ], [ -126.2065816, 54.4145597 ], [ -126.20647790000001, 54.4147192 ], [ -126.2064119, 54.4147805 ], [ -126.206318900000014, 54.4148146 ], [ -126.2062099, 54.4148389 ], [ -126.2061007, 54.414836 ], [ -126.2060112, 54.414799 ], [ -126.2059393, 54.4147335 ], [ -126.205896199999984, 54.4146694 ], [ -126.205757599999984, 54.4144415 ], [ -126.205691500000015, 54.4142777 ], [ -126.2056851, 54.4141524 ], [ -126.2057517, 54.4140826 ], [ -126.2059432, 54.4139786 ], [ -126.205994499999989, 54.4139174 ], [ -126.2060032, 54.4137906 ], [ -126.2059779, 54.413718 ], [ -126.2059037, 54.4136724 ], [ -126.2057975, 54.413634 ], [ -126.205468599999989, 54.4135001 ], [ -126.205214, 54.4133776 ], [ -126.2049852, 54.413326299999987 ], [ -126.2048338, 54.413305 ], [ -126.204694699999976, 54.4133107 ], [ -126.2045398, 54.4133263 ], [ -126.204428299999989, 54.4133506 ], [ -126.204316899999981, 54.4134018 ], [ -126.2042833, 54.4134545 ], [ -126.204281, 54.4135086 ], [ -126.2042975, 54.4137152 ], [ -126.2044514, 54.4139345 ], [ -126.204462, 54.4140071 ], [ -126.2044561, 54.4140783 ], [ -126.2043907, 54.414131 ], [ -126.2042983, 54.4141567 ], [ -126.2039304, 54.4141111 ], [ -126.2036994, 54.4141068 ], [ -126.203545, 54.4141211 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17085777, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 232051.907826045, "blue_line_key": 360873822, "length_metre": 866.35336201638802, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2539224, 54.4698319 ], [ -126.254019700000015, 54.469772 ], [ -126.254130499999988, 54.4697293 ], [ -126.254488599999988, 54.4697008 ], [ -126.2546107, 54.4696951 ], [ -126.254998499999985, 54.4696866 ], [ -126.255294, 54.4696481 ], [ -126.255402499999988, 54.4696325 ], [ -126.255498, 54.4695983 ], [ -126.2555769, 54.4695556 ], [ -126.2556139, 54.4694929 ], [ -126.255569499999979, 54.4694388 ], [ -126.2554387, 54.4693448 ], [ -126.2551971, 54.4692593 ], [ -126.255106, 54.4692123 ], [ -126.2550503, 54.4691482 ], [ -126.254955099999975, 54.4689474 ], [ -126.2548669, 54.4688648 ], [ -126.2547344, 54.4687893 ], [ -126.2543656, 54.4687722 ], [ -126.254090299999987, 54.4687124 ], [ -126.2540169, 54.4686569 ], [ -126.25399130000001, 54.4685842 ], [ -126.2539965, 54.4685216 ], [ -126.2540446, 54.468468900000012 ], [ -126.254190099999988, 54.4683906 ], [ -126.2542839, 54.4683749 ], [ -126.254593, 54.4683464 ], [ -126.2548234, 54.4683877 ], [ -126.2549627, 54.468382 ], [ -126.2551803, 54.4683421 ], [ -126.2553263, 54.4682553 ], [ -126.2553462, 54.4681926 ], [ -126.2552993, 54.4679661 ], [ -126.255060399999977, 54.467818 ], [ -126.2548643, 54.4677767 ], [ -126.254740899999973, 54.4677653 ], [ -126.2544926, 54.4677952 ], [ -126.2544118, 54.4678294 ], [ -126.254063, 54.4679832 ], [ -126.2539681, 54.4680089 ], [ -126.2537066, 54.4679932 ], [ -126.253615599999989, 54.4679733 ], [ -126.2532683, 54.467875 ], [ -126.2531478, 54.467828 ], [ -126.252861, 54.4677041 ], [ -126.2526662, 54.4676457 ], [ -126.252367599999985, 54.4674862 ], [ -126.252177499999988, 54.467311 ], [ -126.2520934, 54.4672099 ], [ -126.2518907, 54.4669806 ], [ -126.2516713, 54.4668054 ], [ -126.2515597, 54.4666231 ], [ -126.251551799999987, 54.4665419 ], [ -126.2515744, 54.4664166 ], [ -126.2516391, 54.4663724 ], [ -126.2517637, 54.4663668 ], [ -126.2519614, 54.4663895 ], [ -126.252071799999982, 54.4663824 ], [ -126.2521803, 54.4663668 ], [ -126.2522763, 54.466324 ], [ -126.2523422, 54.4662628 ], [ -126.2523596, 54.4662001 ], [ -126.2523648, 54.4661375 ], [ -126.2523711, 54.4660577 ], [ -126.2523602, 54.4659851 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080095, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 223605.98414054501, "blue_line_key": 360873822, "length_metre": 79.853540460789901, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2977845, 54.4947455 ], [ -126.2976396, 54.4948225 ], [ -126.2975097, 54.4949193 ], [ -126.297410500000012, 54.4950332 ], [ -126.297345299999989, 54.4950859 ], [ -126.297215799999989, 54.4951814 ], [ -126.297006799999977, 54.4952939 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17086839, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 0.0, "blue_line_key": 360862508, "length_metre": 14.449745741968799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.52155, 54.457662 ], [ -126.5214777, 54.4575395 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104615, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 6235.8653885331096, "blue_line_key": 360882583, "length_metre": 449.54867787459199, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.97852, 54.2140681 ], [ -125.9785178, 54.214041 ], [ -125.9784041, 54.2139271 ], [ -125.978356299999987, 54.2139114 ], [ -125.9780173, 54.2138929 ], [ -125.9779701, 54.2138758 ], [ -125.9779245, 54.2138672 ], [ -125.977810499999975, 54.2137804 ], [ -125.9777616, 54.2137547 ], [ -125.977728499999984, 54.2137191 ], [ -125.9775636, 54.2135525 ], [ -125.9774664, 54.2134927 ], [ -125.9774192, 54.21347560000001 ], [ -125.977131899999989, 54.2133303 ], [ -125.9771159, 54.2132947 ], [ -125.9770821, 54.2132677 ], [ -125.9770648, 54.213242 ], [ -125.976999, 54.213189299999989 ], [ -125.976982299999989, 54.2131623 ], [ -125.976969700000012, 54.2129657 ], [ -125.9769359, 54.2129387 ], [ -125.9769186, 54.212913 ], [ -125.9768754, 54.2127336 ], [ -125.9771419, 54.2125926 ], [ -125.97721030000001, 54.2125 ], [ -125.977205, 54.2124288 ], [ -125.977087, 54.2122607 ], [ -125.976970799999989, 54.2121468 ], [ -125.9766988, 54.2120001 ], [ -125.9766222, 54.212003 ], [ -125.976433199999988, 54.2119346 ], [ -125.9763948, 54.2118278 ], [ -125.976362400000014, 54.2117836 ], [ -125.976248899999973, 54.2117153 ], [ -125.9759378, 54.2116412 ], [ -125.9756113, 54.2115956 ], [ -125.975566899999976, 54.2115971 ], [ -125.9755033, 54.211571400000011 ], [ -125.975065, 54.211466 ], [ -125.974858700000013, 54.211372 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101600, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 26756.145836343901, "blue_line_key": 360881038, "length_metre": 177.73369829132301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.071366399999988, 54.2541439 ], [ -126.0712644, 54.2540698 ], [ -126.07120590000001, 54.2540499 ], [ -126.071117699999988, 54.2539844 ], [ -126.071078699999987, 54.2538847 ], [ -126.071112, 54.2538405 ], [ -126.071114600000016, 54.2538135 ], [ -126.0711638, 54.2537522 ], [ -126.0712408, 54.2535557 ], [ -126.071197, 54.2535286 ], [ -126.0709108, 54.2534318 ], [ -126.0708862, 54.2533592 ], [ -126.0709034, 54.2533321 ], [ -126.070969100000013, 54.2532794 ], [ -126.070987, 54.2532438 ], [ -126.0710516, 54.253174 ], [ -126.0710416, 54.2531014 ], [ -126.071012599999989, 54.2530743 ], [ -126.070954, 54.2530544 ], [ -126.070864700000016, 54.2529988 ], [ -126.070807699999989, 54.2529347 ], [ -126.0707978, 54.2528621 ], [ -126.0708311, 54.2528179 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17100460, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 20773.696073668802, "blue_line_key": 360886221, "length_metre": 960.49538014070697, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.639056599999975, 54.2755854 ], [ -126.638984, 54.2755213 ], [ -126.638881399999974, 54.2754387 ], [ -126.6387311, 54.2753461 ], [ -126.6385826, 54.2752621 ], [ -126.6384494, 54.2751695 ], [ -126.6383315, 54.2750954 ], [ -126.638213099999987, 54.2750299 ], [ -126.6381224, 54.2749829 ], [ -126.638004599999988, 54.2749089 ], [ -126.6379014, 54.2748348 ], [ -126.6375196, 54.2745129 ], [ -126.6374023, 54.2744303 ], [ -126.6373154, 54.2743378 ], [ -126.637244, 54.274256600000015 ], [ -126.6371718, 54.274164 ], [ -126.6370843, 54.2740729 ], [ -126.636998, 54.2739717 ], [ -126.6369112, 54.273872 ], [ -126.6368395, 54.2737709 ], [ -126.636739100000014, 54.2736613 ], [ -126.636651699999987, 54.2735701 ], [ -126.636580799999976, 54.2734875 ], [ -126.636508799999973, 54.2734149 ], [ -126.636419699999976, 54.2733494 ], [ -126.6362994, 54.2732753 ], [ -126.636197, 54.2732197 ], [ -126.6360757, 54.2731628 ], [ -126.6359426, 54.2730973 ], [ -126.6358224, 54.2730232 ], [ -126.635704, 54.2729577 ], [ -126.63569, 54.2729491 ], [ -126.635556099999988, 54.2728651 ], [ -126.6354229, 54.2727726 ], [ -126.6353498, 54.272717 ], [ -126.6353049, 54.2726714 ], [ -126.6351424, 54.2725789 ], [ -126.6349801, 54.2724578 ], [ -126.634906500000014, 54.2724037 ], [ -126.6348481, 54.2723481 ], [ -126.634714800000012, 54.2722556 ], [ -126.634597599999978, 54.272173 ], [ -126.6344644, 54.2720804 ], [ -126.6343306, 54.2719964 ], [ -126.6342144, 54.2719038 ], [ -126.6340947, 54.2718212 ], [ -126.6339769, 54.2717471 ], [ -126.633873799999989, 54.2716731 ], [ -126.6337548, 54.2716161 ], [ -126.633619400000015, 54.2715506 ], [ -126.6334699, 54.2714765 ], [ -126.6332023, 54.2713085 ], [ -126.633086699999978, 54.2712073 ], [ -126.6329262, 54.2710606 ], [ -126.6328667, 54.2710151 ], [ -126.6327351, 54.270904 ], [ -126.6326171, 54.2708029 ], [ -126.6324538, 54.2706918 ], [ -126.6323366, 54.2706092 ], [ -126.632249800000011, 54.2705166 ], [ -126.632163, 54.2704169 ], [ -126.6321368, 54.2703528 ], [ -126.6321095, 54.2702987 ], [ -126.632023600000011, 54.270162 ], [ -126.631971299999989, 54.2700267 ], [ -126.6319451, 54.2699626 ], [ -126.6319164, 54.2698985 ], [ -126.631892299999976, 54.2697732 ], [ -126.6318994, 54.2696564 ], [ -126.6318878, 54.2695923 ], [ -126.6318752, 54.2695382 ], [ -126.63182230000001, 54.2694114 ], [ -126.6317507, 54.2693032 ], [ -126.6316641, 54.2692377 ], [ -126.6315422, 54.2691821 ], [ -126.6313764, 54.2691337 ], [ -126.6309668, 54.269071 ], [ -126.63085860000001, 54.2690596 ], [ -126.6307372, 54.2690582 ], [ -126.630401600000013, 54.2690069 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17103258, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 30794.0720795528, "blue_line_key": 360881038, "length_metre": 124.788470944369, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0671889, 54.2307997 ], [ -126.067159799999985, 54.2307726 ], [ -126.0671202, 54.2306815 ], [ -126.0671415, 54.2306103 ], [ -126.067216699999989, 54.2304322 ], [ -126.067144, 54.2303582 ], [ -126.0671195, 54.2302855 ], [ -126.0670861, 54.2301047 ], [ -126.067136600000012, 54.2300334 ], [ -126.0671857, 54.22999930000001 ], [ -126.067410099999975, 54.2298526 ], [ -126.067460700000012, 54.2297814 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17077802, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 205218.53254216301, "blue_line_key": 360873822, "length_metre": 204.261376866457, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.470432699999989, 54.5059014 ], [ -126.4696557, 54.5062788 ], [ -126.469285299999981, 54.5065736 ], [ -126.4688988, 54.507055 ], [ -126.4689545, 54.5074011 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092117, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 15381.228039097599, "blue_line_key": 360862508, "length_metre": 109.750083520755, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.368968400000014, 54.4122653 ], [ -126.3683897, 54.412185600000015 ], [ -126.3674955, 54.4122297 ], [ -126.367308499999979, 54.4121841 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104083, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 4544.5160220374701, "blue_line_key": 360882583, "length_metre": 338.05958890368697, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.9977471, 54.2185814 ], [ -125.997596199999975, 54.2185942 ], [ -125.9972586, 54.2186113 ], [ -125.99695340000001, 54.2186198 ], [ -125.996905399999989, 54.2186113 ], [ -125.9965796, 54.2185572 ], [ -125.9963948, 54.2185429 ], [ -125.9961666, 54.2185671 ], [ -125.99580370000001, 54.2186398 ], [ -125.995470399999988, 54.218711 ], [ -125.995157, 54.2188078 ], [ -125.994857599999975, 54.2189061 ], [ -125.9945868, 54.218993 ], [ -125.9942699, 54.2190727 ], [ -125.9941166, 54.2190856 ], [ -125.9937353, 54.2190955 ], [ -125.993384299999988, 54.219122600000013 ], [ -125.9930521, 54.2192109 ], [ -125.992977200000013, 54.2192223 ], [ -125.9928558, 54.2192607 ], [ -125.9928261, 54.2192622 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17075808, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 211004.20845993899, "blue_line_key": 360873822, "length_metre": 196.534496248388, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4070381, 54.5163893 ], [ -126.4068703, 54.5167211 ], [ -126.40631, 54.5171925 ], [ -126.405773699999983, 54.5175044 ], [ -126.4051928, 54.5177266 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104793, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 7089.3940841690701, "blue_line_key": 360882583, "length_metre": 38.977718619523202, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.975875599999981, 54.2086319 ], [ -125.9756952, 54.2085008 ], [ -125.975652, 54.2083214 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104768, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 33643.232769654103, "blue_line_key": 360881038, "length_metre": 511.785901206917, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.05660970000001, 54.2129999 ], [ -126.056627, 54.2129728 ], [ -126.056676099999976, 54.2129387 ], [ -126.0568257, 54.2127706 ], [ -126.0568681, 54.2125826 ], [ -126.056852100000015, 54.2123946 ], [ -126.056818799999988, 54.2122137 ], [ -126.056785499999989, 54.2120329 ], [ -126.056768299999987, 54.2118349 ], [ -126.056674699999988, 54.2116526 ], [ -126.0565875, 54.2115785 ], [ -126.056413100000015, 54.2114304 ], [ -126.05637990000001, 54.2112495 ], [ -126.056377700000013, 54.2110701 ], [ -126.0565273, 54.210902 ], [ -126.0565465, 54.2108764 ], [ -126.0565784, 54.2108493 ], [ -126.0566124, 54.2107967 ], [ -126.056633, 54.210734 ], [ -126.056621299999989, 54.2106799 ], [ -126.0565772, 54.2106343 ], [ -126.0563617, 54.2104392 ], [ -126.056327900000014, 54.2102597 ], [ -126.0564044, 54.210071700000015 ], [ -126.056435799999974, 54.2100461 ], [ -126.0564871, 54.2099663 ], [ -126.05652090000001, 54.2099407 ], [ -126.0565381, 54.2099136 ], [ -126.0566567, 54.209737 ], [ -126.0567224, 54.2096843 ], [ -126.05673969999998, 54.2096573 ], [ -126.056771, 54.2096316 ], [ -126.0569675, 54.209475 ], [ -126.056984799999981, 54.2094479 ], [ -126.0570818, 54.2093696 ], [ -126.0570991, 54.2093425 ], [ -126.0571822, 54.2092557 ], [ -126.0572141, 54.2092286 ], [ -126.0572489, 54.2091674 ], [ -126.057283200000015, 54.2091403 ], [ -126.0574011, 54.2089722 ], [ -126.0573844, 54.2087928 ], [ -126.0573877, 54.2087572 ], [ -126.0573712, 54.2087558 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17066770, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 20249.300429927502, "blue_line_key": 360875378, "length_metre": 558.11866428406199, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.667560599999987, 54.563083399999989 ], [ -126.667974, 54.5639194 ], [ -126.6673334, 54.5666126 ], [ -126.6688343, 54.5677269 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17072554, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 5696.8398483474703, "blue_line_key": 360875378, "length_metre": 411.18123170155798, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5142395, 54.534129199999988 ], [ -126.5143475, 54.5341577 ], [ -126.5146601, 54.5343528 ], [ -126.5148208, 54.534491 ], [ -126.5150149, 54.5346035 ], [ -126.5152729, 54.5346804 ], [ -126.5155927, 54.5347772 ], [ -126.5156343, 54.5348413 ], [ -126.5156874, 54.5349852 ], [ -126.515681199999989, 54.5351019 ], [ -126.5156877, 54.5352458 ], [ -126.515692699999988, 54.5354082 ], [ -126.5156793, 54.5356232 ], [ -126.5156747, 54.5357144 ], [ -126.515682200000015, 54.5358482 ], [ -126.515671, 54.5360006 ], [ -126.5156769, 54.5361815 ], [ -126.5156808, 54.5363609 ], [ -126.5157304, 54.5365504 ], [ -126.5157373, 54.5367213 ], [ -126.515725, 54.5369192 ], [ -126.5157173, 54.5370545 ], [ -126.515706, 54.5372425 ], [ -126.5156957, 54.5374134 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17088061, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 237214.97975059101, "blue_line_key": 360873822, "length_metre": 659.32271207149097, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2223631, 54.4501678 ], [ -126.2223971, 54.4501137 ], [ -126.2223943, 54.449915700000012 ], [ -126.2223116, 54.449797499999988 ], [ -126.2221622, 54.449722 ], [ -126.221965599999976, 54.4496551 ], [ -126.2217673, 54.4496138 ], [ -126.2216611, 54.4496024 ], [ -126.221644499999982, 54.4495938 ], [ -126.2216298, 54.4495938 ], [ -126.2215991, 54.4495839 ], [ -126.221570199999974, 54.4495824 ], [ -126.2214616, 54.4495711 ], [ -126.2212969, 54.4495041 ], [ -126.2209596, 54.4494884 ], [ -126.2206634, 54.4495084 ], [ -126.2205009, 54.449648 ], [ -126.220196699999988, 54.4497932 ], [ -126.2200718, 54.4498274 ], [ -126.2199786, 54.4498345 ], [ -126.2197354, 54.4497747 ], [ -126.2196463, 54.4497363 ], [ -126.21949690000001, 54.4496608 ], [ -126.2193521, 54.4495312 ], [ -126.2193555, 54.44946 ], [ -126.2194356, 54.4494073 ], [ -126.2197529, 54.4493076 ], [ -126.2198476, 54.4492549 ], [ -126.2202006, 54.4490484 ], [ -126.220351900000011, 54.4488718 ], [ -126.2203139, 54.448745 ], [ -126.220227099999988, 54.4486795 ], [ -126.2200883, 54.4486496 ], [ -126.2199497, 54.4486467 ], [ -126.219718399999977, 54.4486496 ], [ -126.2196089, 54.4486752 ], [ -126.2193054, 54.448839 ], [ -126.2191599, 54.4489515 ], [ -126.2190638, 54.4489943 ], [ -126.218844399999981, 54.4490256 ], [ -126.218706900000015, 54.4490128 ], [ -126.218495100000013, 54.4489544 ], [ -126.2183611, 54.4488974 ], [ -126.2181077, 54.4487564 ], [ -126.2178056, 54.4486695 ], [ -126.2175442, 54.4486539 ], [ -126.2174358, 54.4486695 ], [ -126.2172942, 54.4487023 ], [ -126.21716570000001, 54.4487536 ], [ -126.2170583, 54.4487593 ], [ -126.2169197, 54.4487564 ], [ -126.2168448, 54.4487194 ], [ -126.2168346, 54.4486382 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17093728, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 170619.49505095999, "blue_line_key": 360873822, "length_metre": 457.17051096564199, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.7042956, 54.3941465 ], [ -126.7039571, 54.3942619 ], [ -126.7034149, 54.3943018 ], [ -126.7028014, 54.3941593 ], [ -126.702497799999989, 54.3939628 ], [ -126.7017859, 54.3931524 ], [ -126.7016935, 54.3928548 ], [ -126.7017684, 54.3924417 ], [ -126.7023765, 54.3917752 ], [ -126.7023527, 54.3914633 ], [ -126.7021542, 54.3912881 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17105099, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 8043.7563170676303, "blue_line_key": 360882583, "length_metre": 141.07493935671201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.9671717, 54.2036315 ], [ -125.966948699999975, 54.203510400000013 ], [ -125.9666772, 54.2033822 ], [ -125.966406100000015, 54.203227 ], [ -125.9661392, 54.2031259 ], [ -125.965870599999988, 54.2030162 ], [ -125.9657602, 54.202992 ], [ -125.965682499999986, 54.2029849 ], [ -125.9654029, 54.202937899999988 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17065780, "stream_order": 4, "gnis_name": "Redtop Creek", "downstream_route_measure": 1204.84151433342, "blue_line_key": 360883143, "length_metre": 40.465525013480601, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3052595, 54.5693257 ], [ -126.3051932, 54.5693955 ], [ -126.304935799999981, 54.5695336 ], [ -126.3048107, 54.5695678 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102242, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 13264.5788861408, "blue_line_key": 360880905, "length_metre": 185.52136010283499, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4214767, 54.2415752 ], [ -126.421365699999981, 54.2416265 ], [ -126.4212859, 54.2416792 ], [ -126.4212353, 54.2417319 ], [ -126.4211854, 54.2418031 ], [ -126.421166, 54.2418572 ], [ -126.4211307, 54.2419284 ], [ -126.4211143, 54.2419811 ], [ -126.421079, 54.2420524 ], [ -126.421043700000013, 54.2420965 ], [ -126.4209004, 54.2421834 ], [ -126.420746099999988, 54.242199 ], [ -126.420595299999974, 54.2421506 ], [ -126.4204914, 54.2420937 ], [ -126.4204035, 54.2420467 ], [ -126.4202381, 54.2419982 ], [ -126.4200526, 54.2420125 ], [ -126.419909300000015, 54.2420994 ], [ -126.4198441, 54.242152 ], [ -126.4197942, 54.2421962 ], [ -126.4197301, 54.2422389 ], [ -126.4196674, 54.2422916 ], [ -126.4196344, 54.2423087 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17073212, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 3616.45382303717, "blue_line_key": 360875378, "length_metre": 950.25091548007003, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4900047, 54.5318035 ], [ -126.4900829, 54.5317693 ], [ -126.4902091, 54.5317451 ], [ -126.490507299999976, 54.5316781 ], [ -126.4906463, 54.5316454 ], [ -126.490978500000011, 54.5315443 ], [ -126.4911982, 54.5314773 ], [ -126.4912915, 54.5314702 ], [ -126.491430900000012, 54.5314645 ], [ -126.4918192, 54.5314631 ], [ -126.492097, 54.5314688 ], [ -126.492451, 54.5314674 ], [ -126.4927004, 54.5314631 ], [ -126.4929924, 54.5314702 ], [ -126.4930867, 54.5314531 ], [ -126.493354599999989, 54.5313605 ], [ -126.493485, 54.5312466 ], [ -126.4935755, 54.5310501 ], [ -126.4936321, 54.5308806 ], [ -126.49370540000001, 54.530684 ], [ -126.4938673, 54.5305715 ], [ -126.493992599999984, 54.5305288 ], [ -126.4943426, 54.5303835 ], [ -126.4944705, 54.5303052 ], [ -126.494679600000012, 54.5301557 ], [ -126.4947938, 54.5300602 ], [ -126.4949039, 54.5300261 ], [ -126.4950899, 54.5300204 ], [ -126.4954777, 54.5300204 ], [ -126.4957377, 54.5300702 ], [ -126.4959444, 54.5302098 ], [ -126.4960041, 54.5302639 ], [ -126.4961772, 54.5304576 ], [ -126.4964289, 54.5306513 ], [ -126.4965318, 54.5307154 ], [ -126.496639199999976, 54.5307453 ], [ -126.496746699999989, 54.5307467 ], [ -126.497071100000014, 54.5307453 ], [ -126.4971797, 54.5307296 ], [ -126.4972613, 54.5306855 ], [ -126.497459799999973, 54.5304747 ], [ -126.497518, 54.5302511 ], [ -126.4975545, 54.5301884 ], [ -126.497632700000011, 54.5301542 ], [ -126.4977418, 54.53013 ], [ -126.4980839, 54.5301272 ], [ -126.498188899999988, 54.5301571 ], [ -126.4982633, 54.5302041 ], [ -126.4983235, 54.530249700000013 ], [ -126.4984805, 54.5304334 ], [ -126.4986384, 54.5306427 ], [ -126.498933600000015, 54.5308735 ], [ -126.499041, 54.5309034 ], [ -126.499178899999976, 54.5309233 ], [ -126.4995024, 54.530939 ], [ -126.499730500000013, 54.5309888 ], [ -126.5001177, 54.5309974 ], [ -126.5003956, 54.5310031 ], [ -126.500749, 54.5310102 ], [ -126.5010237, 54.53106 ], [ -126.50111840000001, 54.5310629 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17068028, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 11588.156034853901, "blue_line_key": 360875378, "length_metre": 424.20274561650302, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5787429, 54.5566801 ], [ -126.5789752, 54.5566759 ], [ -126.579210499999988, 54.5566274 ], [ -126.579496899999981, 54.5564807 ], [ -126.579660499999989, 54.5563483 ], [ -126.579756300000014, 54.5563056 ], [ -126.5798492, 54.5562714 ], [ -126.580081, 54.5562757 ], [ -126.580171900000011, 54.5563041 ], [ -126.580322200000012, 54.5563882 ], [ -126.5804994, 54.5565363 ], [ -126.580632, 54.5566645 ], [ -126.580673800000014, 54.5567286 ], [ -126.5808461, 54.5569479 ], [ -126.5809212, 54.5569935 ], [ -126.581183099999976, 54.5570177 ], [ -126.581462, 54.5570134 ], [ -126.581585299999986, 54.5569977 ], [ -126.5816964, 54.5569465 ], [ -126.5818266, 54.5568325 ], [ -126.581817699999988, 54.556751299999988 ], [ -126.581829599999978, 54.556553400000013 ], [ -126.582084, 54.5564423 ], [ -126.582334100000011, 54.5563654 ], [ -126.5825556, 54.556307 ], [ -126.5826779, 54.5563013 ], [ -126.582867, 54.5562515 ], [ -126.5832605, 54.5561503 ], [ -126.5835557, 54.5561204 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17071819, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 0.0, "blue_line_key": 360881632, "length_metre": 626.07733945099596, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.636612700000015, 54.5415906 ], [ -126.636625799999976, 54.5413742 ], [ -126.6366592, 54.5413129 ], [ -126.6367008, 54.541142 ], [ -126.6367734, 54.5409455 ], [ -126.636938300000011, 54.5407518 ], [ -126.63706040000001, 54.5405467 ], [ -126.6371909, 54.5403886 ], [ -126.637230599999981, 54.5402448 ], [ -126.637225699999988, 54.5400739 ], [ -126.637223600000013, 54.5398588 ], [ -126.6372333, 54.5396879 ], [ -126.6372809, 54.5396352 ], [ -126.637392800000015, 54.539574 ], [ -126.6375028, 54.5395398 ], [ -126.6376466, 54.5394714 ], [ -126.6377134, 54.5393917 ], [ -126.637801599999975, 54.5392136 ], [ -126.6378266, 54.5390342 ], [ -126.6378526, 54.5388733 ], [ -126.637937400000013, 54.5387123 ], [ -126.6380047, 54.538624 ], [ -126.638169499999989, 54.5384659 ], [ -126.6382481, 54.5384303 ], [ -126.6384651, 54.5384346 ], [ -126.638788599999984, 54.5384503 ], [ -126.639159299999989, 54.5384574 ], [ -126.6392678, 54.5384417 ], [ -126.6394254, 54.5383904 ], [ -126.6394907, 54.5383292 ], [ -126.6395451, 54.5382138 ], [ -126.6395647, 54.5381426 ], [ -126.6396059, 54.5379447 ], [ -126.6397565, 54.5377496 ], [ -126.639846299999974, 54.5375459 ], [ -126.6399468, 54.5374035 ], [ -126.6400892, 54.5373251 ], [ -126.640124500000013, 54.5372724 ], [ -126.640209399999989, 54.5371115 ], [ -126.640203, 54.5369947 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17105921, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 43252.877506898803, "blue_line_key": 360886221, "length_metre": 1525.3679874213401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.543091599999983, 54.1911554 ], [ -126.543047699999988, 54.1911283 ], [ -126.542929299999983, 54.1910714 ], [ -126.5427793, 54.1910144 ], [ -126.5425548, 54.1909204 ], [ -126.5425102, 54.1908748 ], [ -126.5424515, 54.1908278 ], [ -126.5422898, 54.1907082 ], [ -126.5421415, 54.1906327 ], [ -126.5420525, 54.1905957 ], [ -126.5419035, 54.1905287 ], [ -126.541710200000011, 54.1904362 ], [ -126.541485099999989, 54.1903507 ], [ -126.5413638, 54.1903293 ], [ -126.5412711, 54.1903094 ], [ -126.5410437, 54.1902781 ], [ -126.5408626, 54.1902467 ], [ -126.5406329, 54.1902425 ], [ -126.540475199999989, 54.1903023 ], [ -126.540393199999983, 54.190382 ], [ -126.5404196, 54.1904718 ], [ -126.540445399999982, 54.1905359 ], [ -126.540458299999983, 54.1905814 ], [ -126.5404841, 54.1906797 ], [ -126.5404166, 54.1907595 ], [ -126.5403387, 54.1907936 ], [ -126.5402309, 54.1908093 ], [ -126.5401237, 54.1908164 ], [ -126.540014, 54.1908235 ], [ -126.5398922, 54.1908307 ], [ -126.539769099999987, 54.1908278 ], [ -126.53966290000001, 54.1907979 ], [ -126.539590299999986, 54.1907424 ], [ -126.53948530000001, 54.1906954 ], [ -126.539381, 54.1906398 ], [ -126.5392778, 54.1905743 ], [ -126.5391162, 54.1904817 ], [ -126.5389966, 54.1904347 ], [ -126.538861200000014, 54.1903778 ], [ -126.538758, 54.1903123 ], [ -126.5386701, 54.1902382 ], [ -126.5385681, 54.1901556 ], [ -126.5384497, 54.1900716 ], [ -126.5382856, 54.190006 ], [ -126.538103299999989, 54.1899576 ], [ -126.537922199999983, 54.18992630000001 ], [ -126.5377393, 54.1898864 ], [ -126.537557799999988, 54.1898836 ], [ -126.5373726, 54.1898978 ], [ -126.5372037, 54.1898935 ], [ -126.537066, 54.1898907 ], [ -126.5369447, 54.1898622 ], [ -126.5368245, 54.1898237 ], [ -126.5366879, 54.1897839 ], [ -126.5365221, 54.1897369 ], [ -126.5363715, 54.189688399999987 ], [ -126.536206799999988, 54.1896315 ], [ -126.5361183, 54.189593 ], [ -126.5360263, 54.1895645 ], [ -126.53584810000001, 54.1894976 ], [ -126.535607899999974, 54.1894207 ], [ -126.535470099999984, 54.1893908 ], [ -126.535380499999988, 54.1893623 ], [ -126.535170699999981, 54.1892954 ], [ -126.5349427, 54.1892455 ], [ -126.5348219, 54.1892156 ], [ -126.534714599999987, 54.1891957 ], [ -126.534532399999989, 54.1891743 ], [ -126.5343947, 54.1891715 ], [ -126.5342716, 54.1891686 ], [ -126.534182, 54.1891672 ], [ -126.5340881, 54.1891643 ], [ -126.53396690000001, 54.1891629 ], [ -126.533813900000013, 54.1891686 ], [ -126.533657299999987, 54.1891914 ], [ -126.5335033, 54.1892071 ], [ -126.5333345, 54.1892298 ], [ -126.5331627, 54.189254099999985 ], [ -126.533072599999983, 54.1892612 ], [ -126.532947100000015, 54.1892854 ], [ -126.532824, 54.1893096 ], [ -126.532683299999988, 54.1893424 ], [ -126.532511599999978, 54.1893936 ], [ -126.5323265, 54.1894349 ], [ -126.5321546, 54.1894663 ], [ -126.5319677, 54.1895261 ], [ -126.531873399999981, 54.1895517 ], [ -126.5317497, 54.1895845 ], [ -126.5316554, 54.1896101 ], [ -126.5313746, 54.1896941 ], [ -126.5311091, 54.1897696 ], [ -126.5309057, 54.189828 ], [ -126.530768, 54.1898522 ], [ -126.530689400000014, 54.1898679 ], [ -126.5305957, 54.189912 ], [ -126.530486599999989, 54.1899448 ], [ -126.530406299999981, 54.189979 ], [ -126.530298500000015, 54.1900217 ], [ -126.530170700000014, 54.190073 ], [ -126.5300635, 54.1901072 ], [ -126.529938, 54.1901314 ], [ -126.529799200000014, 54.1901385 ], [ -126.5296779, 54.1901442 ], [ -126.5296005, 54.1901428 ], [ -126.5294944, 54.1901399 ], [ -126.5293854, 54.1901385 ], [ -126.5292957, 54.19011 ], [ -126.52925230000001, 54.190054499999988 ], [ -126.5291943, 54.1899989 ], [ -126.5291521, 54.1899533 ], [ -126.5291082, 54.1898992 ], [ -126.5290953, 54.1898537 ], [ -126.5290854, 54.1897995 ], [ -126.5290725, 54.189754 ], [ -126.5290431, 54.1896998 ], [ -126.5290027, 54.1896357 ], [ -126.5289588, 54.1895816 ], [ -126.528917799999988, 54.1895261 ], [ -126.5288598, 54.1894705 ], [ -126.52875610000001, 54.1894065 ], [ -126.528665799999985, 54.1893595 ], [ -126.528606599999989, 54.1893139 ], [ -126.528503499999985, 54.1892484 ], [ -126.5284308, 54.1891928 ], [ -126.5283411, 54.1891373 ], [ -126.5282404, 54.1890447 ], [ -126.5281513, 54.1889806 ], [ -126.5280793, 54.1889165 ], [ -126.5280067, 54.188861 ], [ -126.52790109999998, 54.1888225 ], [ -126.5277786, 54.1888111 ], [ -126.5276708, 54.1888268 ], [ -126.5275758, 54.188861 ], [ -126.527480900000015, 54.1889222 ], [ -126.5274017, 54.1889735 ], [ -126.5273227, 54.1890176 ], [ -126.5272423, 54.1890518 ], [ -126.5271345, 54.1890945 ], [ -126.527009600000014, 54.1891102 ], [ -126.526903, 54.1891159 ], [ -126.52677869999998, 54.189123 ], [ -126.526655600000012, 54.1891202 ], [ -126.526534899999987, 54.1891173 ], [ -126.5263978, 54.1891059 ], [ -126.526321, 54.189096 ], [ -126.526244800000015, 54.1890846 ], [ -126.5261686, 54.1890661 ], [ -126.526093, 54.1890461 ], [ -126.5260022, 54.1890347 ], [ -126.5259108, 54.1890248 ], [ -126.5258345, 54.1890134 ], [ -126.5257443, 54.1889934 ], [ -126.5256687, 54.1889735 ], [ -126.5255919, 54.1889635 ], [ -126.5254559, 54.1889422 ], [ -126.5253195, 54.1889222 ], [ -126.5251976, 54.1889023 ], [ -126.5251085, 54.1888724 ], [ -126.525018199999977, 54.1888524 ], [ -126.5249122, 54.1888154 ], [ -126.5248219, 54.1887684 ], [ -126.524746899999982, 54.1887399 ], [ -126.5247182, 54.1887385 ], [ -126.5246421, 54.18872 ], [ -126.524521899999982, 54.1886815 ], [ -126.524403, 54.1886331 ], [ -126.524280399999981, 54.188594699999989 ], [ -126.5241756, 54.1885747 ], [ -126.524084699999989, 54.1885633 ], [ -126.5240225, 54.1885534 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17063206, "stream_order": 5, "gnis_name": "Richfield Creek", "downstream_route_measure": 14917.9122137421, "blue_line_key": 360788426, "length_metre": 412.496436071331, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2404309, 54.5832103 ], [ -126.240353, 54.5832359 ], [ -126.240238799999986, 54.5833228 ], [ -126.2401878, 54.5833841 ], [ -126.2400695, 54.5835521 ], [ -126.2399684, 54.583657500000015 ], [ -126.2398182, 54.5838256 ], [ -126.2396333, 54.5840364 ], [ -126.239535, 54.5841061 ], [ -126.239247799999987, 54.5842443 ], [ -126.238996199999974, 54.5843098 ], [ -126.23865, 54.5843924 ], [ -126.238538800000015, 54.5844081 ], [ -126.2381964, 54.5844451 ], [ -126.237851299999974, 54.5845177 ], [ -126.237604499999989, 54.5845206 ], [ -126.237300399999981, 54.5844423 ], [ -126.2370686, 54.5844095 ], [ -126.2367148, 54.584402399999988 ], [ -126.2365893, 54.5844166 ], [ -126.236367199999989, 54.584475 ], [ -126.2360981, 54.5845761 ], [ -126.2359746, 54.5845918 ], [ -126.235660599999989, 54.5846388 ], [ -126.235366, 54.5846587 ], [ -126.2352543, 54.584683 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17100201, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 22595.625525325398, "blue_line_key": 360881038, "length_metre": 159.48515401243401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.080913, 54.2755102 ], [ -126.0800564, 54.2741711 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076630, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 215472.88487356601, "blue_line_key": 360873822, "length_metre": 203.01323981737201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3672128, 54.5121665 ], [ -126.366805199999988, 54.5122163 ], [ -126.3661856, 54.5125482 ], [ -126.365766799999989, 54.5125809 ], [ -126.3653031, 54.5125111 ], [ -126.364787600000014, 54.5121494 ], [ -126.364640799999989, 54.5120995 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17086241, "stream_order": 4, "gnis_name": "Raspberry Creek", "downstream_route_measure": 4094.3684414409699, "blue_line_key": 360817924, "length_metre": 764.19091651117196, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.626557299999973, 54.4614846 ], [ -126.626600699999983, 54.4615572 ], [ -126.6266836, 54.461721 ], [ -126.626747599999987, 54.461946 ], [ -126.6267415, 54.4620272 ], [ -126.626760600000011, 54.4622337 ], [ -126.6267674, 54.4624046 ], [ -126.626834100000011, 54.4625869 ], [ -126.6269787, 54.4627421 ], [ -126.627048, 54.4628603 ], [ -126.6270585, 54.4629501 ], [ -126.6271156, 54.4630327 ], [ -126.6271696, 54.463195 ], [ -126.627327799999989, 54.4633959 ], [ -126.627385, 54.4634429 ], [ -126.6275281, 54.4636522 ], [ -126.6276894, 54.4637804 ], [ -126.627910500000013, 54.4639556 ], [ -126.6280566, 54.4641208 ], [ -126.6282609, 54.464323 ], [ -126.6284662, 54.4645153 ], [ -126.628524399999989, 54.4645879 ], [ -126.62868109999998, 54.4648072 ], [ -126.628854100000012, 54.4650081 ], [ -126.6289794, 54.465226 ], [ -126.62921870000001, 54.4653841 ], [ -126.629354299999989, 54.465431 ], [ -126.6296428, 54.4655179 ], [ -126.6299266, 54.4656675 ], [ -126.6300445, 54.4657871 ], [ -126.6301886, 54.4659509 ], [ -126.6303505, 54.466099 ], [ -126.630525600000013, 54.4662372 ], [ -126.6306186, 54.4662656 ], [ -126.630740199999977, 54.4662685 ], [ -126.6308672, 54.4662343 ], [ -126.630960399999978, 54.4661916 ], [ -126.631055100000012, 54.4661659 ], [ -126.631243399999988, 54.4661246 ], [ -126.6314884, 54.4661389 ], [ -126.6316275, 54.4661688 ], [ -126.6316569, 54.4661688 ], [ -126.631673100000015, 54.4661788 ], [ -126.631702, 54.4661873 ], [ -126.631718100000015, 54.4661973 ], [ -126.6317905, 54.4662428 ], [ -126.6318203, 54.4662984 ], [ -126.6318628, 54.4663525 ], [ -126.6318623, 54.4663611 ], [ -126.631892099999988, 54.466381 ], [ -126.631904799999987, 54.4664081 ], [ -126.631947700000012, 54.4664892 ], [ -126.631989199999978, 54.4665533 ], [ -126.6320144, 54.4666787 ], [ -126.6320706, 54.4667427 ], [ -126.632100400000013, 54.4667983 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093572, "stream_order": 4, "gnis_name": "McKilligan Creek", "downstream_route_measure": 8234.5429232951501, "blue_line_key": 360770255, "length_metre": 357.44538128036299, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5293931, 54.395545100000014 ], [ -126.527282199999973, 54.395258800000015 ], [ -126.5248841, 54.393901 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17088675, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 187675.98097125901, "blue_line_key": 360873822, "length_metre": 531.18303882849204, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.572589799999975, 54.4428089 ], [ -126.5717671, 54.442878699999987 ], [ -126.5708023, 54.4430396 ], [ -126.5697702, 54.4434427 ], [ -126.5689793, 54.4436036 ], [ -126.5680582, 54.4435552 ], [ -126.5672468, 54.4434028 ], [ -126.566704699999988, 54.4433629 ], [ -126.564737099999988, 54.4433658 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17098105, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 16731.8292642788, "blue_line_key": 360886524, "length_metre": 222.092910945082, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2604233, 54.3142712 ], [ -126.2606965, 54.3141159 ], [ -126.260744800000012, 54.3140632 ], [ -126.2608327, 54.3138937 ], [ -126.2608412, 54.3137684 ], [ -126.2608552, 54.3135534 ], [ -126.2608374, 54.3133725 ], [ -126.2607952, 54.3132999 ], [ -126.2606508, 54.3131788 ], [ -126.2605572, 54.3129709 ], [ -126.260562100000016, 54.3128897 ], [ -126.260632300000012, 54.3127558 ], [ -126.2607239, 54.3125422 ], [ -126.2607123, 54.3124795 ], [ -126.2606865, 54.3124154 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091185, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1652.1702781808699, "blue_line_key": 360841027, "length_metre": 133.791756121693, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0733413, 54.4224342 ], [ -126.073326599999973, 54.4224342 ], [ -126.0729981, 54.4224897 ], [ -126.072654699999987, 54.4225524 ], [ -126.0722024, 54.4226321 ], [ -126.071857899999983, 54.4227048 ], [ -126.071621199999981, 54.4227703 ], [ -126.071401200000011, 54.4228372 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17106110, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 52968.122533973998, "blue_line_key": 360886221, "length_metre": 1387.1534226024601, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.472017099999974, 54.1884437 ], [ -126.4719696, 54.188460799999987 ], [ -126.4718294, 54.188485 ], [ -126.47170460000001, 54.1885277 ], [ -126.4716114, 54.1885704 ], [ -126.4715017, 54.1886046 ], [ -126.47137859999998, 54.1886018 ], [ -126.471137200000015, 54.188542 ], [ -126.4710007, 54.188495 ], [ -126.4708831, 54.1884294 ], [ -126.4708245, 54.1883824 ], [ -126.4707684, 54.1883013 ], [ -126.470695799999973, 54.1882187 ], [ -126.4705928, 54.1881531 ], [ -126.470475099999987, 54.1880876 ], [ -126.4703703, 54.1880406 ], [ -126.47028250000001, 54.1879936 ], [ -126.4701612, 54.1879381 ], [ -126.470090500000012, 54.187864 ], [ -126.4700642, 54.1877743 ], [ -126.470099499999989, 54.1877031 ], [ -126.4701336, 54.187649 ], [ -126.4701671, 54.1875963 ], [ -126.4702329, 54.187535 ], [ -126.4702377, 54.187453899999987 ], [ -126.4701657, 54.1873898 ], [ -126.4700603, 54.1873513 ], [ -126.4699256, 54.1873129 ], [ -126.469789, 54.187273 ], [ -126.469669, 54.1872345 ], [ -126.4695617, 54.1872146 ], [ -126.4694399, 54.1872217 ], [ -126.4693442, 54.1872644 ], [ -126.469248600000014, 54.1873342 ], [ -126.4691359, 54.187404 ], [ -126.4690268, 54.1874638 ], [ -126.469006099999987, 54.187535 ], [ -126.469004399999989, 54.1875806 ], [ -126.4690007, 54.1876248 ], [ -126.4690136, 54.1876703 ], [ -126.4690112, 54.1877245 ], [ -126.4690386, 54.18777 ], [ -126.4691094, 54.1878441 ], [ -126.46918380000001, 54.187908199999988 ], [ -126.469177699999989, 54.1879794 ], [ -126.4691132, 54.1880506 ], [ -126.4690175, 54.1881204 ], [ -126.4689073, 54.1881361 ], [ -126.468786599999987, 54.1881332 ], [ -126.4686811, 54.1880948 ], [ -126.468576899999988, 54.1880392 ], [ -126.468472100000014, 54.1879922 ], [ -126.4683532, 54.187943799999985 ], [ -126.4682331, 54.1879053 ], [ -126.468113, 54.1878669 ], [ -126.4680064, 54.1878384 ], [ -126.467897900000011, 54.1878626 ], [ -126.4677384, 54.187968 ], [ -126.4676299, 54.1879922 ], [ -126.467535500000011, 54.1880178 ], [ -126.467430099999987, 54.1880065 ], [ -126.4673374, 54.1879865 ], [ -126.467264300000011, 54.1879666 ], [ -126.4671899, 54.1879296 ], [ -126.4671009, 54.1878726 ], [ -126.4669973, 54.1878085 ], [ -126.4669247, 54.1877259 ], [ -126.4668838, 54.1876703 ], [ -126.4667796, 54.1875877 ], [ -126.4666918, 54.1875137 ], [ -126.466652200000013, 54.187441 ], [ -126.4666545, 54.1873869 ], [ -126.466675900000013, 54.1873072 ], [ -126.4667404, 54.187236 ], [ -126.466853, 54.1871662 ], [ -126.466949299999982, 54.1870878 ], [ -126.4670145, 54.1870081 ], [ -126.467005300000011, 54.1869184 ], [ -126.4669644, 54.1868358 ], [ -126.466844899999984, 54.1867888 ], [ -126.4667096, 54.1867588 ], [ -126.4665695, 54.186756 ], [ -126.4664311, 54.1867617 ], [ -126.4663233, 54.1868044 ], [ -126.4662411, 54.1868842 ], [ -126.4661747, 54.186954 ], [ -126.4660651, 54.1870152 ], [ -126.4659555, 54.1870494 ], [ -126.465847, 54.1870465 ], [ -126.465606799999989, 54.1869696 ], [ -126.46550139999998, 54.1869312 ], [ -126.4653643, 54.1869198 ], [ -126.46527039999998, 54.1869711 ], [ -126.4651889, 54.1870423 ], [ -126.4650767, 54.1871106 ], [ -126.4649677, 54.1871633 ], [ -126.464872700000015, 54.1871975 ], [ -126.464766, 54.1872032 ], [ -126.4646886, 54.1872018 ], [ -126.4645509, 54.1871989 ], [ -126.46442780000001, 54.1871961 ], [ -126.4643407, 54.1871405 ], [ -126.4643132, 54.1870679 ], [ -126.4643333, 54.1870052 ], [ -126.464338700000013, 54.1869155 ], [ -126.4642814, 54.1868514 ], [ -126.464207099999982, 54.1867873 ], [ -126.4641973, 54.1867332 ], [ -126.464231899999987, 54.1866435 ], [ -126.4642977, 54.1865552 ], [ -126.464396399999984, 54.1864768 ], [ -126.4644616, 54.1863971 ], [ -126.4645274, 54.1863359 ], [ -126.4645456, 54.1862647 ], [ -126.4645516, 54.1862006 ], [ -126.4644766, 54.186145 ], [ -126.464384599999988, 54.1861436 ], [ -126.46430669999998, 54.1861778 ], [ -126.4641958, 54.186229 ], [ -126.464100699999989, 54.1862903 ], [ -126.463974099999987, 54.1863515 ], [ -126.4638327, 54.1863928 ], [ -126.463740699999988, 54.1864185 ], [ -126.463662700000015, 54.1864256 ], [ -126.4635695, 54.1864413 ], [ -126.4634939, 54.1864484 ], [ -126.463354399999986, 54.186464 ], [ -126.4632636, 54.1864526 ], [ -126.463144199999988, 54.1864056 ], [ -126.4630381, 54.1863487 ], [ -126.462935699999989, 54.1862746 ], [ -126.462831499999979, 54.1862191 ], [ -126.4626968, 54.1861806 ], [ -126.4625567, 54.1862048 ], [ -126.462462199999976, 54.1862646 ], [ -126.4624257, 54.1863458 ], [ -126.462469, 54.1864085 ], [ -126.4625574, 54.186474 ], [ -126.462646299999989, 54.186511 ], [ -126.4627506, 54.1865595 ], [ -126.462869399999988, 54.186615 ], [ -126.4629718, 54.1866891 ], [ -126.4630145, 54.1867532 ], [ -126.4630109, 54.1868244 ], [ -126.4628994, 54.1868771 ], [ -126.4628226, 54.1869013 ], [ -126.4627428, 54.1869269 ], [ -126.4626648, 54.1869611 ], [ -126.462507, 54.1870209 ], [ -126.4623815, 54.1870722 ], [ -126.462240799999975, 54.187132 ], [ -126.4621451, 54.1871747 ], [ -126.4621427, 54.1872288 ], [ -126.4622318, 54.1872858 ], [ -126.462287799999984, 54.1873399 ], [ -126.4622549, 54.1873841 ], [ -126.462162299999989, 54.1873912 ], [ -126.462025200000014, 54.1873798 ], [ -126.461950299999984, 54.1873784 ], [ -126.4618729, 54.187377 ], [ -126.461735199999978, 54.1873741 ], [ -126.461582199999981, 54.1873798 ], [ -126.461504199999979, 54.1873869 ], [ -126.461428599999977, 54.187367 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17101062, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 11319.749424751901, "blue_line_key": 360877225, "length_metre": 265.07289864282802, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.202048600000012, 54.2633186 ], [ -126.2022826, 54.2632788 ], [ -126.202639300000016, 54.2632432 ], [ -126.202827500000012, 54.2631748 ], [ -126.203018899999989, 54.2630708 ], [ -126.2031239, 54.2628757 ], [ -126.2032448, 54.2626635 ], [ -126.203249899999989, 54.2626094 ], [ -126.203293799999983, 54.2623943 ], [ -126.203447, 54.2622006 ], [ -126.203590799999986, 54.2620867 ], [ -126.2037015, 54.262044 ], [ -126.2038115, 54.2620027 ], [ -126.203936700000014, 54.261987 ], [ -126.2042165, 54.2619486 ], [ -126.204325200000014, 54.2619243 ], [ -126.20439, 54.2618802 ], [ -126.204439099999973, 54.261819 ], [ -126.2044455, 54.2617207 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17079306, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 6047.3097204257501, "blue_line_key": 360875052, "length_metre": 139.93208985114401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3848201, 54.498279 ], [ -126.3849324, 54.4982178 ], [ -126.3852609, 54.4981622 ], [ -126.3855717, 54.4981152 ], [ -126.3858362, 54.4981024 ], [ -126.386192899999983, 54.4980924 ], [ -126.3865171, 54.498091 ], [ -126.386824100000013, 54.4980967 ], [ -126.3869173, 54.4980896 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17088997, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 4640.1902795501001, "blue_line_key": 360841027, "length_metre": 123.17358767966699, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0615833, 54.4412821 ], [ -126.0615177, 54.4415585 ], [ -126.0614394, 54.4417821 ], [ -126.0614254, 54.4419971 ], [ -126.061545700000011, 54.4422335 ], [ -126.061725400000014, 54.442319 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101824, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 27494.150721994902, "blue_line_key": 360881038, "length_metre": 206.21912659415401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0710092, 54.2496662 ], [ -126.071042299999988, 54.2496491 ], [ -126.0710764, 54.2495693 ], [ -126.071083499999986, 54.2494967 ], [ -126.0710122, 54.2494055 ], [ -126.07095240000001, 54.2493956 ], [ -126.0707801, 54.2494269 ], [ -126.0706738, 54.2494241 ], [ -126.070612399999987, 54.249405499999988 ], [ -126.070510899999988, 54.2493301 ], [ -126.0704971, 54.2492945 ], [ -126.0705151, 54.2492589 ], [ -126.0706603, 54.2491819 ], [ -126.0707254, 54.2491107 ], [ -126.070713399999988, 54.2490837 ], [ -126.0706677, 54.2490552 ], [ -126.070442300000011, 54.2490053 ], [ -126.070139099999977, 54.2489612 ], [ -126.0700132, 54.2489854 ], [ -126.0699495, 54.2490196 ], [ -126.0698853, 54.2490552 ], [ -126.0697446, 54.2490865 ], [ -126.0695802, 54.2490295 ], [ -126.069435, 54.248927 ], [ -126.0694066, 54.2488715 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091659, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 272897.03242104501, "blue_line_key": 360873822, "length_metre": 790.89307832222698, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1134868, 54.4172429 ], [ -126.113242199999988, 54.4188509 ], [ -126.1191179, 54.4231316 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17097743, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 29669.579020694, "blue_line_key": 360880905, "length_metre": 778.89149870145798, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4277376, 54.3170213 ], [ -126.427716599999982, 54.3170939 ], [ -126.427694099999982, 54.3172463 ], [ -126.4277772, 54.317383100000015 ], [ -126.428123, 54.3174884 ], [ -126.428196, 54.317544 ], [ -126.428203400000015, 54.3176878 ], [ -126.428167699999989, 54.3177676 ], [ -126.4280879, 54.3178203 ], [ -126.427991, 54.317873 ], [ -126.4275958, 54.3180709 ], [ -126.4274707, 54.3181137 ], [ -126.4273098, 54.3182091 ], [ -126.4269931, 54.3183373 ], [ -126.426821499999988, 54.3183871 ], [ -126.4265429, 54.3184085 ], [ -126.426433499999973, 54.3184412 ], [ -126.4263402, 54.318484 ], [ -126.4262733, 54.3185552 ], [ -126.4262987, 54.3186278 ], [ -126.4263984, 54.3187731 ], [ -126.4266781, 54.3189682 ], [ -126.426735299999976, 54.3190408 ], [ -126.4267607, 54.319113499999986 ], [ -126.4267228, 54.3192474 ], [ -126.426710199999988, 54.3194268 ], [ -126.426667799999976, 54.3196419 ], [ -126.426809800000015, 54.3197985 ], [ -126.4269571, 54.3199267 ], [ -126.427239, 54.3200677 ], [ -126.4273309, 54.3200976 ], [ -126.427692099999973, 54.3202215 ], [ -126.4278297, 54.3202329 ], [ -126.4281197, 54.3202756 ], [ -126.4282086, 54.3203141 ], [ -126.4282102, 54.3205291 ], [ -126.428175099999976, 54.3206003 ], [ -126.4279089, 54.3206758 ], [ -126.427630400000012, 54.3207243 ], [ -126.4273987, 54.3207371 ], [ -126.4271269, 54.3206502 ], [ -126.426912800000011, 54.3206274 ], [ -126.42676, 54.3206246 ], [ -126.426556, 54.320683 ], [ -126.42647620000001, 54.3207356 ], [ -126.426360100000011, 54.3208766 ], [ -126.426318599999988, 54.3210276 ], [ -126.426275, 54.3212256 ], [ -126.4262716, 54.3212968 ], [ -126.426274399999983, 54.321494799999989 ], [ -126.426316300000011, 54.3215759 ], [ -126.4264159, 54.321687 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17096288, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 9101.7268293938396, "blue_line_key": 360881038, "length_metre": 721.19933660669096, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1723596, 54.3460524 ], [ -126.172376199999988, 54.3460268 ], [ -126.1724013, 54.34591 ], [ -126.172364699999989, 54.3457476 ], [ -126.1722516, 54.345628 ], [ -126.172087, 54.3455425 ], [ -126.1717298, 54.3453816 ], [ -126.1714332, 54.345195 ], [ -126.171076, 54.3450341 ], [ -126.171038700000011, 54.3448803 ], [ -126.1710357, 54.3446994 ], [ -126.171048099999979, 54.3445299 ], [ -126.171119100000013, 54.3443875 ], [ -126.171426900000014, 54.3441781 ], [ -126.1713267, 54.34405 ], [ -126.171148699999989, 54.3439745 ], [ -126.1710766, 54.3439104 ], [ -126.170986599999978, 54.343862 ], [ -126.170742499999989, 54.3438207 ], [ -126.17043480000001, 54.3438135 ], [ -126.170327199999974, 54.3438207 ], [ -126.1701939, 54.3437637 ], [ -126.170156600000013, 54.3436099 ], [ -126.1701083, 54.3434461 ], [ -126.1700895, 54.3432752 ], [ -126.170100599999984, 54.3430957 ], [ -126.1701417, 54.3429348 ], [ -126.1701981, 54.342792399999986 ], [ -126.1703415, 54.3424904 ], [ -126.170429, 54.3423566 ], [ -126.170512899999977, 54.3422327 ], [ -126.1706304, 54.3421102 ], [ -126.170966400000012, 54.341910799999987 ], [ -126.17098, 54.3417313 ], [ -126.170927400000011, 54.3415861 ], [ -126.1708591, 54.341450799999983 ], [ -126.170792400000011, 54.3413041 ], [ -126.170833500000015, 54.3411702 ], [ -126.1710673, 54.3411047 ], [ -126.171243499999989, 54.3410363 ], [ -126.1713886, 54.3409324 ], [ -126.1714572, 54.340817 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17066497, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 4599.6294522995604, "blue_line_key": 360851751, "length_metre": 213.30370306887201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1765461, 54.5669373 ], [ -126.1735634, 54.5661122 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17061365, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 24105.0670540881, "blue_line_key": 360875378, "length_metre": 228.68521241883801, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.695609600000012, 54.5904367 ], [ -126.695904500000012, 54.5904154 ], [ -126.696012200000013, 54.5904168 ], [ -126.696264199999987, 54.5903769 ], [ -126.696355700000012, 54.5903969 ], [ -126.696437, 54.5905692 ], [ -126.6965411, 54.5906603 ], [ -126.6967089, 54.5907088 ], [ -126.697030200000015, 54.5907686 ], [ -126.6973542, 54.5907843 ], [ -126.697445699999989, 54.5908042 ], [ -126.6977671, 54.5908996 ], [ -126.6978715, 54.5909466 ], [ -126.6980524, 54.5910577 ], [ -126.698173, 54.5911147 ], [ -126.6984309, 54.5911731 ], [ -126.6985525, 54.5912201 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076212, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 94.919519367877598, "blue_line_key": 360875378, "length_metre": 1257.14284512927, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4633677, 54.5138784 ], [ -126.4635242, 54.5140977 ], [ -126.4637765, 54.5142743 ], [ -126.463849799999977, 54.5143384 ], [ -126.464054, 54.5145406 ], [ -126.464160799999988, 54.5145791 ], [ -126.464502899999985, 54.5147657 ], [ -126.4646516, 54.5148668 ], [ -126.464965299999974, 54.5150363 ], [ -126.4651443, 54.515155899999982 ], [ -126.4652878, 54.5153211 ], [ -126.4653764, 54.515376599999989 ], [ -126.465482599999987, 54.5154236 ], [ -126.4655984, 54.5155347 ], [ -126.4657288, 54.5156814 ], [ -126.4657397, 54.5157626 ], [ -126.4658998, 54.5159364 ], [ -126.4660878, 54.5161286 ], [ -126.466147, 54.5161842 ], [ -126.4661748, 54.5162027 ], [ -126.4662042, 54.5162312 ], [ -126.466220799999988, 54.5162397 ], [ -126.466234, 54.5162582 ], [ -126.4664125, 54.5163793 ], [ -126.4664697, 54.5164334 ], [ -126.4666895, 54.5166542 ], [ -126.4667607, 54.5167453 ], [ -126.4669048, 54.516902 ], [ -126.4669864, 54.5170829 ], [ -126.4670564, 54.5172196 ], [ -126.467105600000011, 54.517409 ], [ -126.467147899999986, 54.5174916 ], [ -126.4673675, 54.517656800000012 ], [ -126.467635, 54.5178605 ], [ -126.4679018, 54.51801 ], [ -126.467930900000013, 54.5180741 ], [ -126.4680871, 54.5182664 ], [ -126.468154, 54.5184472 ], [ -126.468248300000013, 54.5186552 ], [ -126.468300500000012, 54.5188361 ], [ -126.4683712, 54.5189286 ], [ -126.468497899999988, 54.519128 ], [ -126.468629400000012, 54.5192576 ], [ -126.468719, 54.5193032 ], [ -126.4689757, 54.5193901 ], [ -126.469318299999983, 54.5196037 ], [ -126.4694251, 54.519642200000014 ], [ -126.4695728, 54.5197532 ], [ -126.469715299999976, 54.5199355 ], [ -126.469766100000015, 54.5200993 ], [ -126.469779199999977, 54.5201534 ], [ -126.4697807, 54.52036 ], [ -126.4697429, 54.5204753 ], [ -126.4696611, 54.5205551 ], [ -126.4695824, 54.5205978 ], [ -126.4693596, 54.5207018 ], [ -126.4691972, 54.5208157 ], [ -126.4690787, 54.5209652 ], [ -126.469067599999988, 54.5211447 ], [ -126.4691036, 54.5213441 ], [ -126.469106700000012, 54.521532099999988 ], [ -126.4691119, 54.5216859 ], [ -126.4691353, 54.5218297 ], [ -126.4691395, 54.5220006 ], [ -126.4691305, 54.522153 ], [ -126.469071199999988, 54.5223581 ], [ -126.4690822, 54.5224393 ], [ -126.469069499999989, 54.5226373 ], [ -126.4690732, 54.5228167 ], [ -126.46906, 54.5230232 ], [ -126.4690568, 54.5230959 ], [ -126.469004899999987, 54.5231671 ], [ -126.4688539, 54.5233608 ], [ -126.468705, 54.5235203 ], [ -126.4686766, 54.5237353 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17084829, "stream_order": 5, "gnis_name": "Ailport Creek", "downstream_route_measure": 526.49560229042197, "blue_line_key": 360878058, "length_metre": 2813.4782084614399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2524582, 54.478098 ], [ -126.252305299999989, 54.4780937 ], [ -126.2522455, 54.4780481 ], [ -126.2521355, 54.4778473 ], [ -126.2519931, 54.477655 ], [ -126.251920399999989, 54.477618 ], [ -126.25181280000001, 54.4775966 ], [ -126.25172019999998, 54.4775952 ], [ -126.2516247, 54.4776294 ], [ -126.2514253, 54.4778316 ], [ -126.2513868, 54.477947 ], [ -126.2513386, 54.4779997 ], [ -126.251227, 54.4780239 ], [ -126.251133200000012, 54.4780396 ], [ -126.2509349, 54.4780182 ], [ -126.2508967, 54.4778915 ], [ -126.2509018, 54.4778288 ], [ -126.2508997, 54.4776209 ], [ -126.2509038, 54.4775682 ], [ -126.2510991, 54.4774186 ], [ -126.2511536, 54.4772862 ], [ -126.2512449, 54.4770982 ], [ -126.251238, 54.4769728 ], [ -126.2512018, 54.476792 ], [ -126.2511468, 54.4767193 ], [ -126.2509811, 54.47663390000001 ], [ -126.250768400000013, 54.476584 ], [ -126.250463599999989, 54.4765242 ], [ -126.250314, 54.4764487 ], [ -126.250287199999988, 54.4763932 ], [ -126.2503384, 54.4763319 ], [ -126.2505283, 54.4762736 ], [ -126.250591899999989, 54.4762394 ], [ -126.2506117, 54.4761767 ], [ -126.25060019999998, 54.4761126 ], [ -126.2503357, 54.4759189 ], [ -126.250261799999976, 54.4758719 ], [ -126.249936299999973, 54.4756569 ], [ -126.249737200000013, 54.475617 ], [ -126.2494189, 54.4755472 ], [ -126.2490356, 54.4755016 ], [ -126.2488542, 54.4754532 ], [ -126.248734200000015, 54.4754048 ], [ -126.2485271, 54.4752567 ], [ -126.2484212, 54.4752097 ], [ -126.2483167, 54.4751798 ], [ -126.248071, 54.475147 ], [ -126.2478151, 54.4750601 ], [ -126.247591, 54.4749391 ], [ -126.24743, 54.4748266 ], [ -126.2472361, 54.474724 ], [ -126.2470051, 54.4746913 ], [ -126.2467449, 54.4746856 ], [ -126.2464077, 54.4746414 ], [ -126.2460678, 54.4746528 ], [ -126.2458313, 54.4747183 ], [ -126.24572329999998, 54.4747254 ], [ -126.2456163, 54.4746955 ], [ -126.245437099999975, 54.474593 ], [ -126.2453462, 54.474573 ], [ -126.2452228, 54.4745617 ], [ -126.244901, 54.474536 ], [ -126.2447953, 54.4745161 ], [ -126.2445557, 54.4743836 ], [ -126.2443459, 54.4742982 ], [ -126.2440303, 54.4741657 ], [ -126.2439427, 54.4741088 ], [ -126.2438534, 54.4740361 ], [ -126.243812399999982, 54.473972 ], [ -126.2437879, 54.4738894 ], [ -126.243781499999983, 54.4737285 ], [ -126.2437808, 54.4735305 ], [ -126.243710299999989, 54.4734394 ], [ -126.2434851, 54.4733354 ], [ -126.243347300000011, 54.4732955 ], [ -126.2432411, 54.4732841 ], [ -126.242919899999976, 54.47325 ], [ -126.2428112, 54.4732386 ], [ -126.2425202, 54.47322290000001 ], [ -126.2422394, 54.4732614 ], [ -126.2419148, 54.4732713 ], [ -126.2418073, 54.473242799999987 ], [ -126.2416122, 54.4731574 ], [ -126.2415696, 54.4731118 ], [ -126.241504599999985, 54.4729295 ], [ -126.2415205, 54.4727059 ], [ -126.241476499999976, 54.4726504 ], [ -126.241387800000012, 54.472603400000011 ], [ -126.2410952, 54.4726062 ], [ -126.240894900000015, 54.4725834 ], [ -126.2405652, 54.4724496 ], [ -126.2404424, 54.4724296 ], [ -126.2403361, 54.4724182 ], [ -126.240180200000012, 54.4724225 ], [ -126.239947699999988, 54.4724353 ], [ -126.2398228, 54.4724695 ], [ -126.239442, 54.4726304 ], [ -126.2390805, 54.4727301 ], [ -126.2390152, 54.4727828 ], [ -126.2389646, 54.4728355 ], [ -126.2388544, 54.4728697 ], [ -126.238669, 54.472874 ], [ -126.238562, 54.4728441 ], [ -126.2384734, 54.4727971 ], [ -126.2384483, 54.4727159 ], [ -126.2384151, 54.4724994 ], [ -126.2382957, 54.4724424 ], [ -126.2380491, 54.472446700000013 ], [ -126.237928, 54.4724083 ], [ -126.2376772, 54.4722316 ], [ -126.237470799999983, 54.4721092 ], [ -126.23717280000001, 54.471941099999988 ], [ -126.236946399999979, 54.4718542 ], [ -126.2367009, 54.4718485 ], [ -126.236574599999983, 54.4718727 ], [ -126.2363712, 54.471914 ], [ -126.2361939, 54.4720266 ], [ -126.23602910000001, 54.4721932 ], [ -126.235938800000014, 54.4723712 ], [ -126.235838300000012, 54.4724951 ], [ -126.2356906, 54.4726347 ], [ -126.2355723, 54.4727672 ], [ -126.2354065, 54.4729437 ], [ -126.2352945, 54.4730036 ], [ -126.2351052, 54.4730534 ], [ -126.2347886, 54.4731716 ], [ -126.2344891, 54.4732557 ], [ -126.2343816, 54.4732614 ], [ -126.234089, 54.4732642 ], [ -126.23387, 54.4732941 ], [ -126.233654, 54.4732813 ], [ -126.233342499999978, 54.4733368 ], [ -126.233124699999976, 54.4733496 ], [ -126.2329344, 54.4734437 ], [ -126.232808099999986, 54.4734679 ], [ -126.232578499999988, 54.4734451 ], [ -126.232274300000014, 54.4733838 ], [ -126.231923, 54.4733311 ], [ -126.2316876, 54.4733796 ], [ -126.231563, 54.4733853 ], [ -126.231379499999989, 54.4733639 ], [ -126.23115319999998, 54.4733041 ], [ -126.2309343, 54.473326899999989 ], [ -126.23083819999998, 54.4733696 ], [ -126.230722899999989, 54.4735006 ], [ -126.2305945, 54.473579 ], [ -126.2305013, 54.4735861 ], [ -126.2303767, 54.4735918 ], [ -126.230301699999984, 54.4735547 ], [ -126.230260199999989, 54.4734992 ], [ -126.2302362, 54.4733739 ], [ -126.2302622, 54.4732115 ], [ -126.230313399999986, 54.4731503 ], [ -126.230549400000015, 54.4730933 ], [ -126.230583399999986, 54.4730392 ], [ -126.230573799999988, 54.4729765 ], [ -126.2303025, 54.4728711 ], [ -126.230157399999982, 54.4727145 ], [ -126.230025, 54.4726318 ], [ -126.2299152, 54.472637499999983 ], [ -126.229668, 54.4726504 ], [ -126.229451399999988, 54.4726803 ], [ -126.229091, 54.4727358 ], [ -126.2289955, 54.47277 ], [ -126.2287881, 54.4728911 ], [ -126.2285846, 54.4729395 ], [ -126.2282401, 54.4730121 ], [ -126.2279081, 54.4731047 ], [ -126.2278007, 54.4731104 ], [ -126.2275852, 54.4730961 ], [ -126.2274494, 54.4730577 ], [ -126.2272144, 54.472864 ], [ -126.2271552, 54.472817 ], [ -126.227036, 54.4727871 ], [ -126.2266795, 54.4727971 ], [ -126.226541399999988, 54.4727857 ], [ -126.2263127, 54.4727259 ], [ -126.226041599999988, 54.4726475 ], [ -126.2258062, 54.4726959 ], [ -126.225614799999974, 54.4727999 ], [ -126.2254385, 54.4728683 ], [ -126.2250496, 54.472921 ], [ -126.224904200000012, 54.4730264 ], [ -126.2246843, 54.4730933 ], [ -126.2243573, 54.473130299999987 ], [ -126.224233899999987, 54.4731189 ], [ -126.223900199999989, 54.4730306 ], [ -126.2235609, 54.4730406 ], [ -126.223466499999986, 54.4730648 ], [ -126.223401700000011, 54.473109 ], [ -126.2230328, 54.4732984 ], [ -126.2229225, 54.4733397 ], [ -126.222673500000013, 54.473371 ], [ -126.2225637, 54.4733767 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17084673, "stream_order": 5, "gnis_name": "Ailport Creek", "downstream_route_measure": 3339.9738107518601, "blue_line_key": 360878058, "length_metre": 186.52984249621201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2225637, 54.4733767 ], [ -126.222318199999989, 54.473371 ], [ -126.2222101, 54.4733511 ], [ -126.2221214, 54.4733041 ], [ -126.221948, 54.4731374 ], [ -126.221906, 54.4730833 ], [ -126.2218684, 54.472948 ], [ -126.2218098, 54.4728925 ], [ -126.221704699999989, 54.4728711 ], [ -126.221579600000013, 54.4728782 ], [ -126.2212686, 54.4728982 ], [ -126.22097930000001, 54.472864 ], [ -126.2208001, 54.4727615 ], [ -126.220613500000013, 54.4725492 ], [ -126.2205238, 54.4725122 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102710, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 29659.038979861401, "blue_line_key": 360881038, "length_metre": 111.908606454137, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0678508, 54.2364082 ], [ -126.0680585, 54.2362872 ], [ -126.0682993, 54.236149 ], [ -126.068316, 54.2361234 ], [ -126.0683791, 54.2360977 ], [ -126.068503, 54.236092 ], [ -126.0686236, 54.2361219 ], [ -126.068768, 54.236233 ], [ -126.0687825, 54.236260099999988 ], [ -126.0688917, 54.2364338 ], [ -126.068939199999988, 54.2364438 ], [ -126.068984500000013, 54.2364267 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17070424, "stream_order": 4, "gnis_name": "Perow Creek", "downstream_route_measure": 5132.0073317039396, "blue_line_key": 360836816, "length_metre": 122.013828416422, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.487799, 54.5450358 ], [ -126.4879743, 54.5452096 ], [ -126.488136399999988, 54.5453577 ], [ -126.488331100000011, 54.5454332 ], [ -126.4884381, 54.5454716 ], [ -126.4888173, 54.5455955 ], [ -126.4889877, 54.545599800000012 ], [ -126.489093199999985, 54.5456283 ], [ -126.4892453, 54.5456496 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17088940, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 239518.08272898701, "blue_line_key": 360873822, "length_metre": 667.24852439295, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2076548, 54.4427519 ], [ -126.207634599999977, 54.442616600000015 ], [ -126.2075927, 54.4425355 ], [ -126.207445, 54.4424415 ], [ -126.2074402, 54.4422976 ], [ -126.207506099999989, 54.4422364 ], [ -126.2077284, 54.4421424 ], [ -126.2079312, 54.4421025 ], [ -126.208131699999981, 54.4420897 ], [ -126.2082397, 54.4421096 ], [ -126.2083867, 54.4422122 ], [ -126.2085184, 54.4423232 ], [ -126.2086578, 54.4425155 ], [ -126.2088662, 54.4426451 ], [ -126.209127099999989, 54.4428673 ], [ -126.2091697, 54.4429399 ], [ -126.209232, 54.4431493 ], [ -126.209305199999989, 54.4432048 ], [ -126.2095176, 54.4432547 ], [ -126.209747599999986, 54.4432689 ], [ -126.210026, 54.4432575 ], [ -126.210090799999989, 54.4432134 ], [ -126.210192799999987, 54.4430994 ], [ -126.210195, 54.4430453 ], [ -126.2101924, 54.4428744 ], [ -126.2101663, 54.4428103 ], [ -126.21004760000001, 54.4427178 ], [ -126.2099591, 54.4426708 ], [ -126.2098246, 54.4426223 ], [ -126.2095627, 54.4426081 ], [ -126.2093975, 54.4425497 ], [ -126.2093525, 54.4425041 ], [ -126.2093418, 54.4424315 ], [ -126.209361699999988, 54.4423688 ], [ -126.209411299999985, 54.4423261 ], [ -126.2095215, 54.4422919 ], [ -126.2096607, 54.4422862 ], [ -126.210030499999988, 54.4422862 ], [ -126.2101567, 54.442262 ], [ -126.210253400000013, 54.4422107 ], [ -126.2102721, 54.4421381 ], [ -126.21025250000001, 54.4419943 ], [ -126.21022640000001, 54.4419302 ], [ -126.2101459, 54.4417308 ], [ -126.2101034, 54.4416852 ], [ -126.209997800000011, 54.4416382 ], [ -126.209906299999986, 54.4416268 ], [ -126.2098132, 54.4416339 ], [ -126.2095048, 54.4416539 ], [ -126.2092689, 54.4417108 ], [ -126.2091309, 54.4416994 ], [ -126.2090217, 54.4416966 ], [ -126.208685, 54.4416795 ], [ -126.2086112, 54.441632500000011 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17073807, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 1748.3568575050699, "blue_line_key": 360875378, "length_metre": 969.55234229275095, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4719273, 54.5264185 ], [ -126.4717743, 54.5266322 ], [ -126.4717024, 54.5268102 ], [ -126.4715506, 54.5269783 ], [ -126.471421, 54.5270822 ], [ -126.471221899999989, 54.5272944 ], [ -126.471102800000011, 54.527481 ], [ -126.4711011, 54.5275351 ], [ -126.4711196, 54.5277146 ], [ -126.471122599999987, 54.5279311 ], [ -126.471172399999986, 54.5281119 ], [ -126.4712866, 54.5282843 ], [ -126.4715093, 54.5284338 ], [ -126.471551299999987, 54.5284965 ], [ -126.471739, 54.5286902 ], [ -126.471858, 54.5287642 ], [ -126.471978, 54.5288212 ], [ -126.4722484, 54.5289608 ], [ -126.4725965, 54.5290676 ], [ -126.47270229999998, 54.5291231 ], [ -126.4730561, 54.5291573 ], [ -126.473399, 54.5293353 ], [ -126.473500199999989, 54.5294464 ], [ -126.4735425, 54.5295361 ], [ -126.473608099999979, 54.5296999 ], [ -126.473680399999978, 54.5298096 ], [ -126.4738251, 54.5299648 ], [ -126.4739461, 54.5300118 ], [ -126.4740987, 54.5300246 ], [ -126.474344500000015, 54.5300659 ], [ -126.47472830000001, 54.5300916 ], [ -126.4749919, 54.5300887 ], [ -126.4752555, 54.530093 ], [ -126.4753489, 54.5300503 ], [ -126.475475099999983, 54.5300261 ], [ -126.475614, 54.5300289 ], [ -126.4758776, 54.5300261 ], [ -126.476263499999988, 54.5300246 ], [ -126.4764607, 54.5300645 ], [ -126.4765308, 54.5302012 ], [ -126.476525599999988, 54.5302725 ], [ -126.4765466, 54.5304448 ], [ -126.476553900000013, 54.5305787 ], [ -126.4766678, 54.5307168 ], [ -126.476860699999975, 54.5308464 ], [ -126.4770588, 54.5309048 ], [ -126.4772128, 54.5309347 ], [ -126.4775347, 54.5309689 ], [ -126.477656299999978, 54.5310073 ], [ -126.477888, 54.5310116 ], [ -126.4781291, 54.5311156 ], [ -126.4783682, 54.5312466 ], [ -126.47865539999998, 54.531352 ], [ -126.478959, 54.5314389 ], [ -126.479288699999984, 54.5315984 ], [ -126.479437100000013, 54.5317009 ], [ -126.479590699999989, 54.531703799999988 ], [ -126.4797149, 54.5317066 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17079359, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 5736.3188089494797, "blue_line_key": 360875052, "length_metre": 310.990911476272, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3801511, 54.4978802 ], [ -126.3833955, 54.498111 ], [ -126.384187299999979, 54.4983559 ], [ -126.3848201, 54.498279 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17097704, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 13397.1172592435, "blue_line_key": 360886221, "length_metre": 287.44000527726803, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.629944, 54.3186848 ], [ -126.6300374, 54.3186691 ], [ -126.6301324, 54.3186349 ], [ -126.630482699999988, 54.3184441 ], [ -126.6305451, 54.3183914 ], [ -126.6307724, 54.3181892 ], [ -126.630859, 54.3180467 ], [ -126.6309131, 54.3178858 ], [ -126.6310918, 54.3177177 ], [ -126.6313503, 54.3175169 ], [ -126.6315289, 54.3173489 ], [ -126.6316286, 54.317225 ], [ -126.6317307, 54.3170384 ], [ -126.6318285, 54.3169686 ], [ -126.632086099999981, 54.3167493 ], [ -126.632137199999988, 54.3166596 ], [ -126.6322216, 54.3165442 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17068107, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 12093.868201371601, "blue_line_key": 360875378, "length_metre": 113.502902456418, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5847587, 54.5559296 ], [ -126.584913899999975, 54.5559139 ], [ -126.5852877, 54.5558769 ], [ -126.5856153, 54.5558028 ], [ -126.585994499999984, 54.5556932 ], [ -126.5863732, 54.5555564 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080295, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 224545.88808168401, "blue_line_key": 360873822, "length_metre": 262.92996349816298, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.29126909999998, 54.4951742 ], [ -126.2906417, 54.4950902 ], [ -126.2903028, 54.494987699999989 ], [ -126.289960600000015, 54.4947769 ], [ -126.2898059, 54.4944935 ], [ -126.2898443, 54.4943297 ], [ -126.289984499999989, 54.4942314 ], [ -126.2901527, 54.4941858 ], [ -126.2908579, 54.4941403 ], [ -126.2909984, 54.494069 ], [ -126.291203599999989, 54.4938426 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099241, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 6403.13228148704, "blue_line_key": 360877225, "length_metre": 86.622789937438398, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1805598, 54.2914724 ], [ -126.18085619999998, 54.2914155 ], [ -126.181168, 54.2913428 ], [ -126.181493199999977, 54.2913143 ], [ -126.1818488, 54.2912958 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17078856, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 17.962357591266102, "blue_line_key": 360747751, "length_metre": 107.043983657003, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4777535, 54.4998585 ], [ -126.4778387, 54.4999866 ], [ -126.4778485, 54.500000500000013 ], [ -126.47785180000001, 54.5000052 ], [ -126.4779968, 54.5001518 ], [ -126.4780716, 54.5001974 ], [ -126.478235, 54.5002914 ], [ -126.4783251, 54.5003285 ], [ -126.478400900000011, 54.5003569 ], [ -126.478522399999989, 54.5003954 ], [ -126.4785532, 54.500405400000012 ], [ -126.478566899999976, 54.5004153 ], [ -126.478615, 54.5004253 ], [ -126.4786439, 54.5004338 ], [ -126.4787334, 54.500472300000013 ], [ -126.4788873, 54.5005022 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17094506, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 21374.498727694401, "blue_line_key": 360862508, "length_metre": 910.83852525725001, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.328146499999988, 54.3837056 ], [ -126.328263, 54.3835917 ], [ -126.32853630000001, 54.383408 ], [ -126.3286034, 54.3833297 ], [ -126.328622599999989, 54.383248500000015 ], [ -126.32853630000001, 54.3831474 ], [ -126.3284968, 54.3830662 ], [ -126.3285007, 54.3829935 ], [ -126.3285904, 54.3827899 ], [ -126.3286671, 54.3825748 ], [ -126.3289094, 54.3824096 ], [ -126.3290309, 54.3822059 ], [ -126.3292543, 54.3820664 ], [ -126.329471499999983, 54.3820265 ], [ -126.3297183, 54.3820407 ], [ -126.3298675, 54.3821162 ], [ -126.3300938, 54.3822017 ], [ -126.330462499999982, 54.3822102 ], [ -126.330784600000015, 54.3822259 ], [ -126.330891199999982, 54.3822287 ], [ -126.331246299999989, 54.3822273 ], [ -126.331538900000012, 54.3822159 ], [ -126.331680800000015, 54.3821746 ], [ -126.3320161, 54.3820023 ], [ -126.3324062, 54.3819026 ], [ -126.3327547, 54.3817758 ], [ -126.3329305, 54.3816804 ], [ -126.33294810000001, 54.3816448 ], [ -126.332965699999988, 54.3816092 ], [ -126.3330008, 54.381538 ], [ -126.3329884, 54.3814839 ], [ -126.3329981, 54.38134 ], [ -126.3329726, 54.3812674 ], [ -126.3329329, 54.3811592 ], [ -126.3329221, 54.3810865 ], [ -126.332899399999988, 54.3809512 ], [ -126.332879199999979, 54.3808159 ], [ -126.332876399999989, 54.380618 ], [ -126.332840100000013, 54.3804385 ], [ -126.3327745, 54.3802932 ], [ -126.3326621, 54.380101 ], [ -126.332566899999975, 54.3799016 ], [ -126.3325142, 54.3797748 ], [ -126.3325093, 54.379631 ], [ -126.3325065, 54.379433 ], [ -126.3325116, 54.3793433 ], [ -126.3325213, 54.3791994 ], [ -126.3324249, 54.3790171 ], [ -126.33235470000001, 54.378926 ], [ -126.3321499, 54.3787323 ], [ -126.33197819999998, 54.3785486 ], [ -126.3318897, 54.3784745 ], [ -126.331651, 54.378362 ], [ -126.3316233, 54.3783164 ], [ -126.331575199999989, 54.378108499999989 ], [ -126.33157079999998, 54.3779561 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076288, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 215016.568265031, "blue_line_key": 360873822, "length_metre": 159.30067559550099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3719943, 54.5148112 ], [ -126.3716767, 54.5147585 ], [ -126.3710646, 54.5144409 ], [ -126.3706929, 54.5137117 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104268, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 3526.4595800971802, "blue_line_key": 360882583, "length_metre": 58.018138717075097, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0101133, 54.2157387 ], [ -126.0100993, 54.2157372 ], [ -126.0097948, 54.2156845 ], [ -126.0094757, 54.2156318 ], [ -126.009247599999981, 54.2156361 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17063732, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1723.73703034855, "blue_line_key": 360851751, "length_metre": 171.769754351411, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.204759599999988, 54.5815554 ], [ -126.2049328, 54.5810726 ], [ -126.204952800000015, 54.5809488 ], [ -126.2048251, 54.580849 ], [ -126.2034511, 54.5807735 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17102081, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 13711.948803461801, "blue_line_key": 360877225, "length_metre": 151.07742813504501, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.20549650000001, 54.2457581 ], [ -126.205421500000014, 54.2457297 ], [ -126.2052081, 54.2456798 ], [ -126.2049665, 54.2456471 ], [ -126.2045992, 54.2456114 ], [ -126.2044206, 54.2455531 ], [ -126.2042162, 54.2453779 ], [ -126.2041349, 54.2452326 ], [ -126.204128799999978, 54.2450888 ], [ -126.204231299999989, 54.2449207 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17064767, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 21492.815246401002, "blue_line_key": 360875378, "length_metre": 304.49072104088799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.670768599999974, 54.5737108 ], [ -126.673786199999981, 54.5758088 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17070714, "stream_order": 5, "gnis_name": "Richfield Creek", "downstream_route_measure": 6702.6669195787099, "blue_line_key": 360788426, "length_metre": 939.27601651000896, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.306723600000012, 54.5443023 ], [ -126.3067337, 54.5443921 ], [ -126.3068485, 54.5445473 ], [ -126.3069206, 54.5446214 ], [ -126.3069929, 54.5446669 ], [ -126.3070509, 54.5447324 ], [ -126.30707550000001, 54.5448578 ], [ -126.307056399999979, 54.5449119 ], [ -126.3069506, 54.54508 ], [ -126.30685050000001, 54.5452039 ], [ -126.30666690000001, 54.5453976 ], [ -126.306561299999984, 54.5455927 ], [ -126.3065068, 54.5457265 ], [ -126.3064783, 54.5459331 ], [ -126.306484599999976, 54.5460684 ], [ -126.3065229, 54.5462037 ], [ -126.3065604, 54.5463204 ], [ -126.3065823, 54.5464743 ], [ -126.306587099999987, 54.5466281 ], [ -126.306568, 54.5466893 ], [ -126.3065039, 54.5467249 ], [ -126.306376899999975, 54.5467577 ], [ -126.3062836, 54.5467648 ], [ -126.3059898, 54.5467762 ], [ -126.3058634, 54.5468004 ], [ -126.30563690000001, 54.5469485 ], [ -126.3054424, 54.5470966 ], [ -126.305344099999985, 54.5471664 ], [ -126.304951, 54.5472647 ], [ -126.30468, 54.5473857 ], [ -126.3043532, 54.547414200000013 ], [ -126.3042484, 54.5473843 ], [ -126.3039466, 54.5472789 ], [ -126.303840399999984, 54.5472319 ], [ -126.303622899999979, 54.5472362 ], [ -126.303418099999988, 54.5472946 ], [ -126.303339799999989, 54.5473288 ], [ -126.3032563, 54.5473986 ], [ -126.3032171, 54.5475239 ], [ -126.3032447, 54.547578 ], [ -126.3035858, 54.5478016 ], [ -126.3037679, 54.5478771 ], [ -126.303885600000015, 54.5479611 ], [ -126.303984199999974, 54.5481064 ], [ -126.3039587, 54.5482417 ], [ -126.3038309, 54.5483186 ], [ -126.3036729, 54.5483699 ], [ -126.3033112, 54.5484696 ], [ -126.303011, 54.5485622 ], [ -126.302740499999985, 54.5486818 ], [ -126.3024842, 54.54881 ], [ -126.3023521, 54.5489339 ], [ -126.3022015, 54.5491105 ], [ -126.3021462, 54.5492258 ], [ -126.3021579, 54.549297 ], [ -126.302298899999982, 54.5494893 ], [ -126.3025027, 54.5496915 ], [ -126.3025765, 54.5497471 ], [ -126.3028573, 54.5499607 ], [ -126.303104199999979, 54.5501729 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17096799, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 14100.1773372807, "blue_line_key": 360886524, "length_metre": 301.73302570084002, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2690448, 54.3340662 ], [ -126.268941399999989, 54.3340007 ], [ -126.268915, 54.3339381 ], [ -126.2689039, 54.333874 ], [ -126.2688871, 54.333676 ], [ -126.2688697, 54.3334866 ], [ -126.2688664, 54.3332986 ], [ -126.2688375, 54.3332431 ], [ -126.26865260000001, 54.3330508 ], [ -126.268489199999976, 54.3329482 ], [ -126.268271200000015, 54.332746 ], [ -126.2680631, 54.3326591 ], [ -126.2679108, 54.3326207 ], [ -126.267701499999987, 54.3325438 ], [ -126.2675092, 54.3324127 ], [ -126.267437699999988, 54.3323401 ], [ -126.2673954, 54.3322675 ], [ -126.267385499999989, 54.3321863 ], [ -126.2673974, 54.3320239 ], [ -126.2674265, 54.3318003 ], [ -126.267432, 54.3317377 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17067438, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 858.58828051706496, "blue_line_key": 360881574, "length_metre": 147.925651882414, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6011515, 54.5596439 ], [ -126.601487100000014, 54.5597322 ], [ -126.601592700000012, 54.5597607 ], [ -126.6017563, 54.5598632 ], [ -126.6019932, 54.560074 ], [ -126.6022182, 54.5601694 ], [ -126.602341, 54.5601979 ], [ -126.602598, 54.5602934 ], [ -126.6027179, 54.5603589 ], [ -126.602793100000014, 54.5604045 ], [ -126.602851099999981, 54.5604785 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101415, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 25739.730420654902, "blue_line_key": 360881038, "length_metre": 822.922653704607, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0719228, 54.259318 ], [ -126.071907699999983, 54.2592995 ], [ -126.0718361, 54.2592354 ], [ -126.071673, 54.2591414 ], [ -126.0715072, 54.2591016 ], [ -126.0714156, 54.2590987 ], [ -126.0710941, 54.2590645 ], [ -126.0710655, 54.259036 ], [ -126.0710688, 54.2590004 ], [ -126.0711033, 54.2589663 ], [ -126.0712931, 54.2588808 ], [ -126.0715996, 54.2588694 ], [ -126.0717029, 54.2589534 ], [ -126.071763300000015, 54.2589549 ], [ -126.071939699999987, 54.2588594 ], [ -126.071843799999982, 54.2586686 ], [ -126.0718318, 54.2586415 ], [ -126.071836, 54.2585703 ], [ -126.0717802, 54.2584963 ], [ -126.0716077, 54.2583482 ], [ -126.0715004, 54.2583282 ], [ -126.0714393, 54.2583353 ], [ -126.071343899999988, 54.2583695 ], [ -126.0712476, 54.2584393 ], [ -126.071214399999974, 54.258483500000011 ], [ -126.0709185, 54.258539 ], [ -126.070870899999974, 54.258529 ], [ -126.0708252, 54.2585276 ], [ -126.070709, 54.2584521 ], [ -126.0708543, 54.2583482 ], [ -126.070843199999985, 54.2582855 ], [ -126.0707404, 54.25822 ], [ -126.070713200000014, 54.2581744 ], [ -126.0707458, 54.2581388 ], [ -126.0710317, 54.2580106 ], [ -126.07110990000001, 54.2580035 ], [ -126.0713768, 54.2578938 ], [ -126.071394, 54.2578668 ], [ -126.0712174, 54.2577899 ], [ -126.071161799999985, 54.2577087 ], [ -126.071163899999988, 54.2576631 ], [ -126.0711806, 54.2576375 ], [ -126.071435400000013, 54.2575079 ], [ -126.071468599999989, 54.2574637 ], [ -126.0714123, 54.2573911 ], [ -126.071369100000013, 54.257362600000015 ], [ -126.071324, 54.2573526 ], [ -126.0712159, 54.2573683 ], [ -126.0708862, 54.2574495 ], [ -126.0708404, 54.2574481 ], [ -126.0707934, 54.2574566 ], [ -126.0705877, 54.2573526 ], [ -126.0706056, 54.257317 ], [ -126.0704877, 54.257233 ], [ -126.0704757, 54.25720590000001 ], [ -126.0705223, 54.2571718 ], [ -126.0706968, 54.2570948 ], [ -126.070765099999988, 54.2570151 ], [ -126.0708142, 54.2569809 ], [ -126.0709383, 54.2569482 ], [ -126.071153700000011, 54.2569524 ], [ -126.0712122, 54.2569724 ], [ -126.0713507, 54.2569937 ], [ -126.071413, 54.2569766 ], [ -126.0714782, 54.2569254 ], [ -126.071495399999989, 54.2568983 ], [ -126.0714207, 54.2568428 ], [ -126.071224199999989, 54.25682 ], [ -126.0711175, 54.2567986 ], [ -126.0710121, 54.2567602 ], [ -126.0709377, 54.2567502 ], [ -126.0706154, 54.2567516 ], [ -126.0702592, 54.2567787 ], [ -126.0702141, 54.2567687 ], [ -126.0701702, 54.2567488 ], [ -126.0701791, 54.2566049 ], [ -126.0703006, 54.2564198 ], [ -126.070360400000013, 54.2562232 ], [ -126.0702298, 54.2561207 ], [ -126.070202599999988, 54.2560751 ], [ -126.070205399999978, 54.256021 ], [ -126.0702221, 54.2559954 ], [ -126.0702273, 54.2559412 ], [ -126.0703098, 54.2558359 ], [ -126.0704557, 54.2557305 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17076492, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 10124.563448303499, "blue_line_key": 360869846, "length_metre": 145.952577392878, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6040819, 54.5119567 ], [ -126.6063341, 54.5118503 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17096772, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 13318.0073174968, "blue_line_key": 360881038, "length_metre": 234.96028534667099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1411231, 54.3337899 ], [ -126.141251, 54.3337202 ], [ -126.141249399999978, 54.3335493 ], [ -126.1411646, 54.3334125 ], [ -126.1410811, 54.3332858 ], [ -126.1410153, 54.3331305 ], [ -126.140965400000013, 54.3329853 ], [ -126.140834699999985, 54.3328742 ], [ -126.1406544, 54.3327987 ], [ -126.140427, 54.3327389 ], [ -126.1401549, 54.3326876 ], [ -126.1399109, 54.3326463 ], [ -126.1396835, 54.3325865 ], [ -126.139536299999975, 54.3324939 ], [ -126.139438, 54.332374300000012 ], [ -126.1393379, 54.3322732 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17092827, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 176405.289395987, "blue_line_key": 360873822, "length_metre": 673.61209261179101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6482751, 54.4024482 ], [ -126.647539799999976, 54.4026348 ], [ -126.646832, 54.4028897 ], [ -126.646719, 54.4030806 ], [ -126.6466972, 54.4033683 ], [ -126.646574500000014, 54.4036574 ], [ -126.6463551, 54.4037955 ], [ -126.6455527, 54.4040903 ], [ -126.6452574, 54.404137299999988 ], [ -126.6448822, 54.4041188 ], [ -126.644023300000015, 54.4039009 ], [ -126.6434553, 54.403881 ], [ -126.642907900000012, 54.4040405 ], [ -126.642788599999975, 54.4041302 ], [ -126.6426087, 54.4045205 ], [ -126.6423452, 54.4046657 ], [ -126.6418421, 54.40467 ], [ -126.6406807, 54.4044991 ], [ -126.6403039, 54.4044991 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091882, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 13004.922869533801, "blue_line_key": 360846413, "length_metre": 97.173052031222198, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2808624, 54.4152379 ], [ -126.2814143, 54.4144283 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17066425, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 8408.9998924143092, "blue_line_key": 360856488, "length_metre": 720.221255677871, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.44840809999998, 54.5657054 ], [ -126.448287099999988, 54.5658834 ], [ -126.4482678, 54.565946 ], [ -126.4481949, 54.5661412 ], [ -126.448173499999982, 54.5662309 ], [ -126.448183, 54.5663306 ], [ -126.448209299999988, 54.5664032 ], [ -126.448404, 54.5665143 ], [ -126.4484314, 54.566569800000011 ], [ -126.4484115, 54.5666411 ], [ -126.448249499999989, 54.5667536 ], [ -126.4481703, 54.5667977 ], [ -126.4479815, 54.566839 ], [ -126.447663099999986, 54.5669843 ], [ -126.4474504, 54.5671509 ], [ -126.447242100000011, 54.5672905 ], [ -126.4471918, 54.5673432 ], [ -126.446977, 54.567536900000015 ], [ -126.446937299999988, 54.5676793 ], [ -126.4469792, 54.5677705 ], [ -126.447052199999987, 54.5678431 ], [ -126.4471729, 54.5678915 ], [ -126.447279, 54.567911499999987 ], [ -126.4475849, 54.5679713 ], [ -126.4476924, 54.5680012 ], [ -126.4480567, 54.568098 ], [ -126.448133299999981, 54.568118 ], [ -126.448450900000012, 54.568214800000014 ], [ -126.4485249, 54.5682704 ], [ -126.448581100000013, 54.5683701 ], [ -126.4485886, 54.5684968 ], [ -126.448776599999974, 54.5686976 ], [ -126.4488029, 54.5687703 ], [ -126.4488322, 54.5688343 ], [ -126.4489254, 54.5690608 ], [ -126.4489497, 54.5691605 ], [ -126.4489697, 54.5693499 ], [ -126.449007099999989, 54.5695037 ], [ -126.4490634, 54.5695678 ], [ -126.4493526, 54.5696547 ], [ -126.449452400000013, 54.5697914 ], [ -126.449478199999987, 54.5698726 ], [ -126.4494695, 54.5699894 ], [ -126.4494354, 54.570052 ], [ -126.449287, 54.5702101 ], [ -126.4491712, 54.5703241 ], [ -126.4491473, 54.5704494 ], [ -126.4492056, 54.5705149 ], [ -126.449325699999989, 54.570579 ], [ -126.449447, 54.5706189 ], [ -126.449570799999989, 54.5706303 ], [ -126.4498317, 54.570636 ], [ -126.449924, 54.5706459 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101627, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 15145.554960491199, "blue_line_key": 360880905, "length_metre": 400.52512579462302, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4085542, 54.2515746 ], [ -126.4085506, 54.2516188 ], [ -126.4086087, 54.2517014 ], [ -126.408726, 54.2517754 ], [ -126.408843899999979, 54.2518409 ], [ -126.4089631, 54.2519164 ], [ -126.4090804, 54.2519905 ], [ -126.4091538, 54.2520375 ], [ -126.409197800000015, 54.2520916 ], [ -126.4092247, 54.2521457 ], [ -126.409237, 54.2521998 ], [ -126.409218200000012, 54.2522454 ], [ -126.409106, 54.2523408 ], [ -126.409025, 54.2523764 ], [ -126.4089334, 54.2524007 ], [ -126.4088223, 54.252424899999987 ], [ -126.4087309, 54.252442 ], [ -126.408638599999989, 54.2524477 ], [ -126.4085459, 54.2524548 ], [ -126.408408, 54.2524519 ], [ -126.4083011, 54.2524234 ], [ -126.408211900000012, 54.2523935 ], [ -126.408120400000016, 54.2523565 ], [ -126.4080453, 54.252328 ], [ -126.407970100000014, 54.2522995 ], [ -126.4078975, 54.2522711 ], [ -126.4078223, 54.2522426 ], [ -126.4076702, 54.2521842 ], [ -126.4075054, 54.2521543 ], [ -126.407367400000012, 54.2521244 ], [ -126.4072636, 54.2520945 ], [ -126.4071561, 54.2520745 ], [ -126.407033499999983, 54.2520631 ], [ -126.406941300000014, 54.2520617 ], [ -126.406834499999988, 54.2520674 ], [ -126.406757, 54.252066 ], [ -126.4066173, 54.2521087 ], [ -126.4064751, 54.2521585 ], [ -126.4063331, 54.2522283 ], [ -126.4062649, 54.2523166 ], [ -126.406214299999988, 54.2523964 ], [ -126.4061345, 54.2524491 ], [ -126.4060564, 54.2524833 ], [ -126.4059308, 54.2525345 ], [ -126.4058051, 54.2525587 ], [ -126.405663499999989, 54.2526001 ], [ -126.4055555, 54.2526157 ], [ -126.405479199999988, 54.2526314 ], [ -126.4053535, 54.2526827 ], [ -126.4052261, 54.2527524 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17094807, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 280.21517792431803, "blue_line_key": 360881038, "length_metre": 2376.6113195408998, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1262161, 54.3811592 ], [ -126.126294500000014, 54.381152 ], [ -126.1265689, 54.3811777 ], [ -126.1268457, 54.3812104 ], [ -126.1270777, 54.3811705 ], [ -126.1274127, 54.3810082 ], [ -126.1275444, 54.3808943 ], [ -126.1276154, 54.3807518 ], [ -126.1277178, 54.380637900000011 ], [ -126.1278641, 54.380524 ], [ -126.127931499999988, 54.3804456 ], [ -126.1279487, 54.3803915 ], [ -126.12792970000001, 54.3802206 ], [ -126.1277987, 54.3801095 ], [ -126.127779199999978, 54.3799742 ], [ -126.127954300000013, 54.3798888 ], [ -126.1282035, 54.3798489 ], [ -126.128513399999974, 54.3798304 ], [ -126.1286867, 54.3797435 ], [ -126.128819599999986, 54.3796395 ], [ -126.128994799999987, 54.3795541 ], [ -126.129025899999988, 54.3795356 ], [ -126.1291393, 54.3794586 ], [ -126.129222599999977, 54.3793703 ], [ -126.1292257, 54.3793077 ], [ -126.129143, 54.379171 ], [ -126.129198800000012, 54.3790371 ], [ -126.1293304, 54.3789231 ], [ -126.1294481, 54.3788007 ], [ -126.1295926, 54.3787052 ], [ -126.1297983, 54.3786369 ], [ -126.1300598, 54.3786169 ], [ -126.1302716, 54.3786938 ], [ -126.130514100000013, 54.3787266 ], [ -126.1307057, 54.3786497 ], [ -126.13071429999998, 54.3784973 ], [ -126.1306317, 54.3783606 ], [ -126.1307627, 54.3782552 ], [ -126.130983199999974, 54.3782068 ], [ -126.1311884, 54.3781398 ], [ -126.131377, 54.3780643 ], [ -126.1315827, 54.377996 ], [ -126.131841099999988, 54.3780387 ], [ -126.132003399999988, 54.3781242 ], [ -126.1322477, 54.3781655 ], [ -126.1324957, 54.3781356 ], [ -126.1327608, 54.3781056 ], [ -126.133069400000011, 54.3781042 ], [ -126.1333112, 54.3781455 ], [ -126.133555499999986, 54.3781868 ], [ -126.1337993, 54.3782296 ], [ -126.13410660000001, 54.3782452 ], [ -126.1343828, 54.3782523 ], [ -126.134594, 54.3783107 ], [ -126.134807099999989, 54.3783706 ], [ -126.1349999, 54.378446 ], [ -126.1351316, 54.3785486 ], [ -126.1352326, 54.3786682 ], [ -126.1353459, 54.3787878 ], [ -126.1354947, 54.3788904 ], [ -126.1357059, 54.378948799999989 ], [ -126.1357978, 54.3789516 ], [ -126.1359814, 54.3789644 ], [ -126.136113099999989, 54.3788505 ], [ -126.136108799999974, 54.3786796 ], [ -126.136089899999973, 54.3785087 ], [ -126.136147399999984, 54.3783563 ], [ -126.136263199999988, 54.3782253 ], [ -126.136527, 54.3782125 ], [ -126.1367861, 54.3782466 ], [ -126.137061, 54.3782709 ], [ -126.1373843, 54.3782694 ], [ -126.13767630000001, 54.3782936 ], [ -126.1379017, 54.3783535 ], [ -126.1380818, 54.3784304 ], [ -126.138172399999974, 54.3784774 ], [ -126.138305799999983, 54.3785343 ], [ -126.1385055, 54.3785571 ], [ -126.1387835, 54.3785457 ], [ -126.139062599999988, 54.3785244 ], [ -126.139123900000016, 54.3785172 ], [ -126.1393412, 54.3785044 ], [ -126.139619200000013, 54.378493 ], [ -126.1398978, 54.3784731 ], [ -126.1399609, 54.3784475 ], [ -126.140087, 54.3783962 ], [ -126.140188, 54.3782723 ], [ -126.140215, 54.3781028 ], [ -126.140196, 54.3779319 ], [ -126.1400968, 54.3777937 ], [ -126.139968200000013, 54.3776827 ], [ -126.1397876, 54.3776072 ], [ -126.139592899999982, 54.3775303 ], [ -126.1392856, 54.3775146 ], [ -126.1390755, 54.3774462 ], [ -126.13897510000001, 54.3773451 ], [ -126.13886119999998, 54.377207 ], [ -126.13879390000001, 54.3770617 ], [ -126.1387596, 54.3768993 ], [ -126.138830599999977, 54.376756900000011 ], [ -126.139004, 54.37669 ], [ -126.139150300000011, 54.376576 ], [ -126.1391766, 54.3764151 ], [ -126.1391118, 54.3762698 ], [ -126.139074400000013, 54.376116 ], [ -126.1390713, 54.3759352 ], [ -126.139127699999989, 54.3757927 ], [ -126.1391847, 54.3756418 ], [ -126.1392098, 54.375525 ], [ -126.1392288, 54.3754723 ], [ -126.139113099999989, 54.3753527 ], [ -126.138966799999977, 54.3752501 ], [ -126.1389294, 54.3750963 ], [ -126.1389558, 54.3749354 ], [ -126.1390739, 54.3748114 ], [ -126.1392344, 54.374726 ], [ -126.1394371, 54.3746591 ], [ -126.1397028, 54.3746206 ], [ -126.1399948, 54.3746178 ], [ -126.140207300000014, 54.3746861 ], [ -126.140485799999979, 54.3748898 ], [ -126.1407313, 54.3748869 ], [ -126.1408771, 54.3747744 ], [ -126.1409346, 54.374622 ], [ -126.1412989, 54.3744597 ], [ -126.1412818, 54.3742973 ], [ -126.1411496, 54.3741962 ], [ -126.140922499999988, 54.3741278 ], [ -126.1407908, 54.3740253 ], [ -126.140817200000015, 54.3738644 ], [ -126.1409042, 54.3737319 ], [ -126.1410658, 54.3736365 ], [ -126.141284899999988, 54.3735781 ], [ -126.1415471, 54.3735496 ], [ -126.141811499999989, 54.373528199999988 ], [ -126.1421048, 54.37353539999998 ], [ -126.1423466, 54.373576700000015 ], [ -126.1425915, 54.3736094 ], [ -126.1428412, 54.373561 ], [ -126.1430011, 54.3734841 ], [ -126.1432062, 54.373417100000012 ], [ -126.1433953, 54.3733402 ], [ -126.143540500000015, 54.3732363 ], [ -126.143628100000015, 54.3730953 ], [ -126.143481099999988, 54.3730013 ], [ -126.143216, 54.3730312 ], [ -126.1430189, 54.37300840000001 ], [ -126.1428113, 54.372885900000014 ], [ -126.1427924, 54.372715 ], [ -126.1428623, 54.3725826 ], [ -126.1430079, 54.3724772 ], [ -126.1431824, 54.3724003 ], [ -126.1432461, 54.3723931 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17065451, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 2497.3371401700401, "blue_line_key": 360881574, "length_metre": 116.13597347270399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.615195299999982, 54.5699908 ], [ -126.6150805, 54.5700962 ], [ -126.6150447, 54.5701859 ], [ -126.6149494, 54.5702201 ], [ -126.6148571, 54.5702172 ], [ -126.614808, 54.5702885 ], [ -126.6147707, 54.5703682 ], [ -126.614627899999988, 54.5704551 ], [ -126.614663900000011, 54.5706004 ], [ -126.614702900000012, 54.5707442 ], [ -126.614762899999988, 54.5707912 ], [ -126.6148519, 54.5708468 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099941, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 23078.0793477685, "blue_line_key": 360880905, "length_metre": 363.31804697687801, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3911149, 54.2799677 ], [ -126.391157799999974, 54.2800317 ], [ -126.3912224, 54.2802126 ], [ -126.3911425, 54.2802653 ], [ -126.390943400000012, 54.2802696 ], [ -126.3906038, 54.280271 ], [ -126.3904951, 54.2802952 ], [ -126.3904158, 54.2803394 ], [ -126.3903242, 54.2803365 ], [ -126.390017500000013, 54.2803209 ], [ -126.389913100000015, 54.2802924 ], [ -126.389698599999988, 54.2802781 ], [ -126.389619400000015, 54.2803223 ], [ -126.3896464, 54.2803764 ], [ -126.3897045, 54.2804319 ], [ -126.3898824, 54.2805074 ], [ -126.3899999, 54.2806085 ], [ -126.3902378, 54.2807481 ], [ -126.3905197, 54.2808806 ], [ -126.390841599999973, 54.2808877 ], [ -126.390935, 54.280872 ], [ -126.3911259, 54.2807681 ], [ -126.3912187, 54.2807609 ], [ -126.391308599999988, 54.2807894 ], [ -126.3915049, 54.2808749 ], [ -126.391711599999979, 54.2810059 ], [ -126.391783800000013, 54.28107 ], [ -126.391954200000015, 54.2812893 ], [ -126.392027, 54.2813449 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092367, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 17650.803993701498, "blue_line_key": 360862508, "length_metre": 217.449120230528, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3489431, 54.4113595 ], [ -126.3490089, 54.4112983 ], [ -126.349013500000012, 54.4112442 ], [ -126.349011, 54.4110376 ], [ -126.3490685, 54.4108411 ], [ -126.3490282, 54.4107685 ], [ -126.348885, 54.4105862 ], [ -126.3488895, 54.410532 ], [ -126.3489023, 54.410317 ], [ -126.3488921, 54.4102629 ], [ -126.3488732, 54.410082 ], [ -126.3487736, 54.4099353 ], [ -126.3487173, 54.4098456 ], [ -126.3485927, 54.4096177 ], [ -126.348526299999989, 54.409481 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093430, "stream_order": 4, "gnis_name": "McKilligan Creek", "downstream_route_measure": 6995.0398100494804, "blue_line_key": 360770255, "length_metre": 1239.50311324567, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5458786, 54.397868 ], [ -126.545635100000013, 54.3978366 ], [ -126.545437299999989, 54.3977868 ], [ -126.5453775, 54.3977412 ], [ -126.545260700000014, 54.3976486 ], [ -126.5451015, 54.3974749 ], [ -126.5449831, 54.3974008 ], [ -126.5447953, 54.397190099999989 ], [ -126.5445458, 54.396987800000012 ], [ -126.5444233, 54.3969394 ], [ -126.5440784, 54.3968069 ], [ -126.5437242, 54.3967913 ], [ -126.54361729999998, 54.3967614 ], [ -126.543366400000011, 54.3966118 ], [ -126.543212, 54.3965919 ], [ -126.542919900000015, 54.3965947 ], [ -126.542812200000014, 54.3966019 ], [ -126.542672599999989, 54.3966161 ], [ -126.54242, 54.3967016 ], [ -126.5423118, 54.3967172 ], [ -126.5421749, 54.3966959 ], [ -126.5418977, 54.3966631 ], [ -126.541669, 54.3966318 ], [ -126.5415765, 54.3966303 ], [ -126.54146990000001, 54.3966275 ], [ -126.5413141, 54.3966603 ], [ -126.5411874, 54.3967215 ], [ -126.5410384, 54.3968881 ], [ -126.540922399999985, 54.3970305 ], [ -126.5407903, 54.397163 ], [ -126.5406948, 54.3972328 ], [ -126.540525100000011, 54.3972285 ], [ -126.540357, 54.397198599999989 ], [ -126.5402212, 54.3971601 ], [ -126.5399236, 54.3969835 ], [ -126.539711399999987, 54.3968981 ], [ -126.539639, 54.3968326 ], [ -126.5394303, 54.39673 ], [ -126.5391912, 54.3965819 ], [ -126.539087, 54.3965164 ], [ -126.5387562, 54.3963925 ], [ -126.538529, 54.3963427 ], [ -126.5384371, 54.3963327 ], [ -126.5383457, 54.3963213 ], [ -126.5381588, 54.396317 ], [ -126.5378211, 54.3963384 ], [ -126.537712, 54.3963355 ], [ -126.537480499999987, 54.3963398 ], [ -126.537126699999988, 54.3963512 ], [ -126.536911499999974, 54.396337 ], [ -126.5366218, 54.3962771 ], [ -126.53647, 54.3962287 ], [ -126.536137099999976, 54.3961319 ], [ -126.535831699999974, 54.396082 ], [ -126.5357277, 54.3960436 ], [ -126.5353937, 54.3959638 ], [ -126.535116, 54.3959325 ], [ -126.5349487, 54.3959282 ], [ -126.534670799999986, 54.3959325 ], [ -126.534561200000013, 54.3959382 ], [ -126.5344053, 54.3959709 ], [ -126.534047199999989, 54.3960364 ], [ -126.5338146, 54.3960578 ], [ -126.533538799999988, 54.396035 ], [ -126.533404099999984, 54.3959866 ], [ -126.5331615, 54.3959182 ], [ -126.533008900000013, 54.3959068 ], [ -126.5328699, 54.3959125 ], [ -126.5326521, 54.3959268 ], [ -126.532295, 54.3959823 ], [ -126.5319673, 54.3960379 ], [ -126.5316896, 54.3960692 ], [ -126.5315199, 54.3960649 ], [ -126.531351199999989, 54.3960436 ], [ -126.5311064, 54.3960023 ], [ -126.5309112, 54.3959453 ], [ -126.5306367, 54.3958769 ], [ -126.5302885, 54.3957886 ], [ -126.5300913, 54.3957302 ], [ -126.529759, 54.3956248 ], [ -126.5293931, 54.395545100000014 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17091933, "stream_order": 5, "gnis_name": "Bulkley River", "downstream_route_measure": 270421.81825140002, "blue_line_key": 360873822, "length_metre": 55.128769465422003, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0828745, 54.4141154 ], [ -126.0829775, 54.4141894 ], [ -126.0830841, 54.4142193 ], [ -126.0832495, 54.4142763 ], [ -126.083429099999989, 54.4143347 ], [ -126.0835836, 54.4143475 ], [ -126.0835829, 54.414356 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17094080, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 17.423133198362301, "blue_line_key": 360886221, "length_metre": 2937.0869977719099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.658997199999988, 54.4031863 ], [ -126.6579246, 54.4026533 ], [ -126.6568406, 54.4023372 ], [ -126.656485899999979, 54.40233 ], [ -126.656158100000013, 54.4024141 ], [ -126.655731599999982, 54.4029367 ], [ -126.655561, 54.402998 ], [ -126.6552502, 54.4030193 ], [ -126.654836499999988, 54.4029496 ], [ -126.6544544, 54.4028313 ], [ -126.6541952, 54.402669 ], [ -126.654034900000013, 54.402518 ], [ -126.653981800000011, 54.4023542 ], [ -126.654018499999978, 54.4015809 ], [ -126.654063400000013, 54.4014869 ], [ -126.6542062, 54.4014071 ], [ -126.654888, 54.4012476 ], [ -126.6554506, 54.4007207 ], [ -126.65545370000001, 54.4002478 ], [ -126.655241, 54.4000014 ], [ -126.65479040000001, 54.3996511 ], [ -126.653022, 54.3985886 ], [ -126.6516923, 54.3973837 ], [ -126.650464199999988, 54.3966531 ], [ -126.6490336, 54.3950993 ], [ -126.648042899999979, 54.3942847 ], [ -126.647387099999975, 54.393421599999989 ], [ -126.647185600000014, 54.3932208 ], [ -126.6469139, 54.3930598 ], [ -126.6465231, 54.3929317 ], [ -126.644677799999982, 54.3926255 ], [ -126.6432885, 54.3922181 ], [ -126.6422809, 54.3919789 ], [ -126.6416806, 54.3917083 ], [ -126.6410628, 54.3912212 ], [ -126.6385501, 54.3902898 ], [ -126.637798799999985, 54.389540599999989 ], [ -126.6375019, 54.3888912 ], [ -126.63723419999998, 54.3885437 ], [ -126.637007, 54.3879469 ], [ -126.6370315, 54.3877504 ], [ -126.63713030000001, 54.3876564 ], [ -126.637814, 54.3874214 ], [ -126.6382835, 54.3871693 ], [ -126.638359099999988, 54.3869386 ], [ -126.6383394, 54.3866865 ], [ -126.63781680000001, 54.3863476 ], [ -126.637449499999988, 54.3862578 ], [ -126.6372006, 54.3862422 ], [ -126.636429299999975, 54.3863077 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17069035, "stream_order": 4, "gnis_name": "Johnny David Creek", "downstream_route_measure": 5720.9219015368999, "blue_line_key": 360866287, "length_metre": 110.10554806670299, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.409707200000014, 54.5516584 ], [ -126.4097526, 54.551704 ], [ -126.4098827, 54.5518236 ], [ -126.409940299999988, 54.5518976 ], [ -126.4100336, 54.5521155 ], [ -126.410224299999982, 54.5523078 ], [ -126.410351100000014, 54.5525001 ], [ -126.4103936, 54.5525542 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17089197, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 276768.526479817, "blue_line_key": 360873822, "length_metre": 71.290077331191995, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.142814199999989, 54.4395275 ], [ -126.142813600000011, 54.4395361 ], [ -126.142813600000011, 54.4397611 ], [ -126.1427657, 54.4400032 ], [ -126.1427231, 54.4401627 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17095578, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 7808.5546153653904, "blue_line_key": 360886221, "length_metre": 116.65677963261101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6155512, 54.3552927 ], [ -126.6150151, 54.3552884 ], [ -126.614852099999979, 54.3552514 ], [ -126.614584400000012, 54.3550876 ], [ -126.6143796, 54.3548212 ], [ -126.61421630000001, 54.3547572 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17090197, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 275791.01144445298, "blue_line_key": 360873822, "length_metre": 382.93634064987702, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.141596400000012, 54.4313084 ], [ -126.1415444, 54.431405299999987 ], [ -126.1414559, 54.4315833 ], [ -126.1414192, 54.4316445 ], [ -126.141389, 54.431851 ], [ -126.141344100000012, 54.4320575 ], [ -126.141284399999989, 54.4322712 ], [ -126.141281400000011, 54.4323068 ], [ -126.141221199999976, 54.4324948 ], [ -126.141158, 54.4327454 ], [ -126.1410811, 54.4329591 ], [ -126.140992, 54.4331456 ], [ -126.140991399999976, 54.4331542 ], [ -126.1408674, 54.4333764 ], [ -126.1407534, 54.4336797 ], [ -126.1405999, 54.433882 ], [ -126.1404967, 54.43406 ], [ -126.1404913, 54.4341227 ], [ -126.1404534, 54.4344459 ], [ -126.140484500000014, 54.4346525 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17064949, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 2590.7947467699801, "blue_line_key": 360851751, "length_metre": 295.96348197877001, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1984613, 54.5758885 ], [ -126.1968101, 54.5754996 ], [ -126.194985699999989, 54.5742677 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076165, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 207741.71005122701, "blue_line_key": 360873822, "length_metre": 444.84321079710998, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.442136499999989, 54.5141646 ], [ -126.4417496, 54.5142116 ], [ -126.441357599999975, 54.5143854 ], [ -126.4413372, 54.5148155 ], [ -126.4411503, 54.515069 ], [ -126.4404987, 54.5151644 ], [ -126.43999, 54.5153211 ], [ -126.439805299999989, 54.5154422 ], [ -126.4394296, 54.515878 ], [ -126.439279599999978, 54.515949199999987 ], [ -126.4387743, 54.5160959 ], [ -126.4383399, 54.5161244 ], [ -126.4380751, 54.5160959 ], [ -126.4377029, 54.5159535 ], [ -126.4372383, 54.5158509 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092119, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 15524.093930466201, "blue_line_key": 360862508, "length_metre": 81.277361215952794, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.36682, 54.4121471 ], [ -126.36669, 54.4122169 ], [ -126.3665925, 54.412312300000011 ], [ -126.3665439, 54.4123664 ], [ -126.366422, 54.4125516 ], [ -126.3663745, 54.4125957 ], [ -126.366117499999987, 54.4127339 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17062292, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 12613.0652671931, "blue_line_key": 360856488, "length_metre": 787.26582411781101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4772587, 54.5870243 ], [ -126.4773486, 54.5870699 ], [ -126.477425200000013, 54.5870899 ], [ -126.477717700000014, 54.5871326 ], [ -126.4778568, 54.5871354 ], [ -126.4781173, 54.5871497 ], [ -126.4782568, 54.5871796 ], [ -126.4784189, 54.5872722 ], [ -126.478580900000011, 54.5874288 ], [ -126.478818499999988, 54.5875869 ], [ -126.4789521, 54.587698 ], [ -126.4790409, 54.5877535 ], [ -126.479221700000011, 54.5878205 ], [ -126.479345599999988, 54.5878319 ], [ -126.4795796, 54.5878091 ], [ -126.4797015, 54.5878119 ], [ -126.4800664, 54.5877023 ], [ -126.480299, 54.587698 ], [ -126.480404100000015, 54.5877279 ], [ -126.480446799999982, 54.587782 ], [ -126.4805042, 54.58786460000001 ], [ -126.4806302, 54.5880825 ], [ -126.4806891, 54.5881466 ], [ -126.480848099999989, 54.5883118 ], [ -126.481034099999988, 54.5885411 ], [ -126.4811097, 54.5885782 ], [ -126.481307699999988, 54.5886451 ], [ -126.4816266, 54.5887605 ], [ -126.4818546, 54.5888188 ], [ -126.4821888, 54.5888972 ], [ -126.4824197, 54.588947 ], [ -126.4827727, 54.5889641 ], [ -126.4830224, 54.5889598 ], [ -126.4831138, 54.5889798 ], [ -126.4832946, 54.5890467 ], [ -126.483547500000014, 54.5892319 ], [ -126.483873099999983, 54.5894626 ], [ -126.48393249999998, 54.5895181 ], [ -126.4841068, 54.5896748 ], [ -126.4841657, 54.5897389 ], [ -126.484310099999988, 54.5899041 ], [ -126.484440600000013, 54.5900593 ], [ -126.484468599999985, 54.5900778 ], [ -126.4844838, 54.5901049 ], [ -126.4844976, 54.5901149 ], [ -126.4845143, 54.5901234 ], [ -126.4846793, 54.5902075 ], [ -126.4849003, 54.5903926 ], [ -126.4849847, 54.5905108 ], [ -126.4851595, 54.5906945 ], [ -126.485316, 54.5908953 ], [ -126.4855248, 54.591052 ], [ -126.4855782, 54.5911887 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092473, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 17868.2531139321, "blue_line_key": 360862508, "length_metre": 244.617254301679, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.348526299999989, 54.409481 ], [ -126.348481299999989, 54.4094354 ], [ -126.348338700000014, 54.4092787 ], [ -126.348180199999973, 54.409105 ], [ -126.348107499999983, 54.4090409 ], [ -126.34785810000001, 54.4088543 ], [ -126.3476666, 54.4086977 ], [ -126.3474578, 54.4086037 ], [ -126.3471528, 54.4085253 ], [ -126.346897899999973, 54.4084299 ], [ -126.3465658, 54.4083316 ], [ -126.3464601, 54.4082846 ], [ -126.346313599999988, 54.4081736 ], [ -126.346041700000015, 54.4080781 ], [ -126.3459106, 54.4079856 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17082949, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 229002.40999819699, "blue_line_key": 360873822, "length_metre": 320.31050768928799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.256448, 54.4830257 ], [ -126.2570639, 54.4829275 ], [ -126.2573147, 54.4828149 ], [ -126.257400100000012, 54.4827679 ], [ -126.257541499999988, 54.482439 ], [ -126.25769480000001, 54.4823592 ], [ -126.258035799999988, 54.482345 ], [ -126.2587088, 54.4824033 ], [ -126.2586727, 54.4821185 ], [ -126.258437, 54.4819262 ], [ -126.2576572, 54.4819476 ], [ -126.257279200000013, 54.4819006 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17077852, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 219735.03254784501, "blue_line_key": 360873822, "length_metre": 87.682803646311996, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3305639, 54.5065024 ], [ -126.3300604, 54.5063999 ], [ -126.3295671, 54.5060182 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17086878, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 194234.672201529, "blue_line_key": 360873822, "length_metre": 71.544539908586401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.525304600000013, 54.4572589 ], [ -126.5252325, 54.4576335 ], [ -126.5249751, 54.4578514 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17105527, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 2164.7707636380301, "blue_line_key": 360880905, "length_metre": 212.88191742568901, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4106777, 54.1946447 ], [ -126.4095749, 54.1946176 ], [ -126.409330199999985, 54.1946618 ], [ -126.4091808, 54.1947387 ], [ -126.409105, 54.1948071 ], [ -126.408996699999989, 54.1951959 ], [ -126.409088, 54.1955775 ], [ -126.409189499999982, 54.1957015 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17086830, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 194306.21674143799, "blue_line_key": 360873822, "length_metre": 229.24030901195201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5249751, 54.4578514 ], [ -126.5246976, 54.4578813 ], [ -126.5243214, 54.4578571 ], [ -126.5236605, 54.4576591 ], [ -126.5230508, 54.4575808 ], [ -126.5220546, 54.4575922 ], [ -126.52155, 54.457662 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17094397, "stream_order": 5, "gnis_name": "Bulkley River", "downstream_route_measure": 258571.01476627201, "blue_line_key": 360873822, "length_metre": 406.12686406587602, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1233209, 54.383012 ], [ -126.1183201, 54.3808186 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092192, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 9018.9612862204704, "blue_line_key": 360862508, "length_metre": 261.26507264131197, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.450938199999982, 54.4112741 ], [ -126.450669, 54.4113851 ], [ -126.450559500000011, 54.4114179 ], [ -126.4504496, 54.4114521 ], [ -126.4501081, 54.4114905 ], [ -126.4497361, 54.4114905 ], [ -126.4494165, 54.411439300000012 ], [ -126.449156399999978, 54.4114065 ], [ -126.4489395, 54.4114108 ], [ -126.4486775, 54.4114322 ], [ -126.4485072, 54.4114293 ], [ -126.4481543, 54.4114307 ], [ -126.4479224, 54.4114079 ], [ -126.4475876, 54.4113652 ], [ -126.447385399999973, 54.4113695 ], [ -126.4472023, 54.4113752 ], [ -126.4470319, 54.4113795 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17064340, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 21797.305967441898, "blue_line_key": 360875378, "length_metre": 149.16106997901301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.673786199999981, 54.5758088 ], [ -126.6755275, 54.5766884 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093194, "stream_order": 4, "gnis_name": "McKilligan Creek", "downstream_route_measure": 4835.2761763742501, "blue_line_key": 360770255, "length_metre": 1632.5988444982299, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.563728499999982, 54.410186 ], [ -126.5636716, 54.4101318 ], [ -126.5634769, 54.4100379 ], [ -126.563386, 54.4100179 ], [ -126.5631536, 54.4100037 ], [ -126.562959799999987, 54.4099282 ], [ -126.5626442, 54.4097601 ], [ -126.562394200000014, 54.4095935 ], [ -126.5622289, 54.4094995 ], [ -126.5620374, 54.4093613 ], [ -126.5618002, 54.4091862 ], [ -126.561589200000014, 54.4091178 ], [ -126.561287299999989, 54.4090224 ], [ -126.561196099999989, 54.4089754 ], [ -126.5608493, 54.4088615 ], [ -126.5607277, 54.4088315 ], [ -126.560363, 54.4087618 ], [ -126.560165699999985, 54.4087034 ], [ -126.5600004, 54.4086094 ], [ -126.5596744, 54.4083872 ], [ -126.5595602, 54.408259 ], [ -126.559430699999979, 54.4080767 ], [ -126.5592734, 54.4078759 ], [ -126.5591253, 54.4077748 ], [ -126.5589675, 54.4075825 ], [ -126.5589568, 54.4075013 ], [ -126.558950899999985, 54.4073575 ], [ -126.5589425, 54.4072136 ], [ -126.5589242, 54.4070143 ], [ -126.5588282, 54.4068063 ], [ -126.558774700000015, 54.4066796 ], [ -126.5586597, 54.4065329 ], [ -126.558588799999981, 54.4064417 ], [ -126.5583963, 54.406320699999988 ], [ -126.558126, 54.4061982 ], [ -126.5579768, 54.4061141 ], [ -126.557887, 54.4060771 ], [ -126.5578282, 54.4060216 ], [ -126.557731599999983, 54.4058222 ], [ -126.5574472, 54.4056912 ], [ -126.55733, 54.4055715 ], [ -126.5573025, 54.4055174 ], [ -126.5573372, 54.4054462 ], [ -126.5573968, 54.4052482 ], [ -126.55739220000001, 54.4050517 ], [ -126.5573652, 54.4049961 ], [ -126.5572555, 54.4047782 ], [ -126.5572103, 54.4047327 ], [ -126.557005499999988, 54.4045489 ], [ -126.5567553, 54.4043552 ], [ -126.5567136, 54.4042997 ], [ -126.5566786, 54.4041203 ], [ -126.556696699999989, 54.4040476 ], [ -126.556730300000012, 54.4039864 ], [ -126.5568349, 54.4037998 ], [ -126.5568383, 54.4037272 ], [ -126.556683799999988, 54.4034908 ], [ -126.556673099999983, 54.4034096 ], [ -126.5566153, 54.4033369 ], [ -126.556511, 54.4032714 ], [ -126.5562429, 54.4031219 ], [ -126.5561672, 54.4030934 ], [ -126.555858, 54.4028798 ], [ -126.555785, 54.4028157 ], [ -126.555716, 54.402670400000012 ], [ -126.555718899999988, 54.4025992 ], [ -126.5557561, 54.402528 ], [ -126.5557315, 54.4024098 ], [ -126.5556614, 54.4022745 ], [ -126.5554366, 54.402162 ], [ -126.555211, 54.4020936 ], [ -126.5551688, 54.4020395 ], [ -126.555195499999982, 54.4018515 ], [ -126.5551843, 54.4017789 ], [ -126.5551147, 54.4016421 ], [ -126.5551041, 54.401560900000014 ], [ -126.5550816, 54.4014086 ], [ -126.555001399999981, 54.4011907 ], [ -126.5549792, 54.4010653 ], [ -126.5549439, 54.4008659 ], [ -126.55493749999998, 54.4007306 ], [ -126.5550872, 54.400527 ], [ -126.5551137, 54.4003746 ], [ -126.5550765, 54.4002222 ], [ -126.5550385, 54.4000584 ], [ -126.5550257, 54.4000043 ], [ -126.5550172, 54.3998961 ], [ -126.5549696, 54.3996895 ], [ -126.5549469, 54.3995172 ], [ -126.5549416, 54.3993648 ], [ -126.5549349, 54.3992025 ], [ -126.554924500000013, 54.3991483 ], [ -126.554875599999988, 54.3989319 ], [ -126.55482019999998, 54.3987966 ], [ -126.5547636, 54.398714 ], [ -126.554681499999987, 54.3985502 ], [ -126.554474700000014, 54.3983935 ], [ -126.554119, 54.3981799 ], [ -126.5539059, 54.3981386 ], [ -126.5538135, 54.3981372 ], [ -126.553688099999988, 54.3981528 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17063744, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 11082.751274557801, "blue_line_key": 360856488, "length_metre": 543.88028987624898, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.464076, 54.5799788 ], [ -126.4641973, 54.5800258 ], [ -126.464468900000014, 54.5801212 ], [ -126.464647, 54.5802237 ], [ -126.464857099999989, 54.5803548 ], [ -126.465031200000013, 54.580547 ], [ -126.4652677, 54.5807222 ], [ -126.465342799999988, 54.5807607 ], [ -126.4656321, 54.5808475 ], [ -126.465843299999989, 54.5808974 ], [ -126.4661022, 54.5809658 ], [ -126.4664361, 54.581079700000011 ], [ -126.46675639999998, 54.5811765 ], [ -126.466952899999981, 54.5812264 ], [ -126.467028499999984, 54.5812634 ], [ -126.467163, 54.5813645 ], [ -126.467172100000013, 54.5814372 ], [ -126.467169499999983, 54.5815084 ], [ -126.467046199999984, 54.581722 ], [ -126.4670056, 54.5818744 ], [ -126.4670101, 54.5820809 ], [ -126.4670944, 54.5821991 ], [ -126.4672273, 54.5823188 ], [ -126.4673172, 54.5823572 ], [ -126.467627799999988, 54.5823544 ], [ -126.4678924, 54.5823145 ], [ -126.468002, 54.5822817 ], [ -126.4681132, 54.5822305 ], [ -126.468496499999986, 54.5820396 ], [ -126.4686228, 54.5820154 ], [ -126.4688086, 54.58201110000001 ], [ -126.4691188, 54.5820168 ], [ -126.4693046, 54.5820126 ], [ -126.4695949, 54.5820539 ], [ -126.4697035, 54.5820738 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091623, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 16630.837946523301, "blue_line_key": 360862508, "length_metre": 72.458991852968097, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.352992499999985, 54.4171797 ], [ -126.351873699999985, 54.4171635 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17079859, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 226064.57067878, "blue_line_key": 360873822, "length_metre": 97.278965622056106, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2792002, 54.4959462 ], [ -126.278918800000014, 54.4959789 ], [ -126.2784318, 54.4961213 ], [ -126.278209, 54.4961342 ], [ -126.2779853, 54.4960459 ], [ -126.27795, 54.4959447 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17096526, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 12252.85924154, "blue_line_key": 360881038, "length_metre": 72.7877993019478, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.148007299999989, 54.3366056 ], [ -126.14809, 54.3364988 ], [ -126.1481899, 54.3363849 ], [ -126.1483087, 54.3362524 ], [ -126.148239800000013, 54.3361257 ], [ -126.1480429, 54.3360758 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17066392, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 4198.0203399912698, "blue_line_key": 360851751, "length_metre": 11.518624928734001, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.182344199999989, 54.5665684 ], [ -126.1821817, 54.5666112 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17076646, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 9729.7807552648501, "blue_line_key": 360869846, "length_metre": 69.637604117685598, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.59959760000001, 54.5110698 ], [ -126.5998389, 54.5111596 ], [ -126.5998473, 54.5114188 ], [ -126.6001096, 54.5115469 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17064842, "stream_order": 4, "gnis_name": "Redtop Creek", "downstream_route_measure": 1942.1482380315799, "blue_line_key": 360883143, "length_metre": 617.09159500456201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.304118699999989, 54.5746409 ], [ -126.3042685, 54.5747249 ], [ -126.3043896, 54.5747719 ], [ -126.3047257, 54.5748431 ], [ -126.305031499999984, 54.5749029 ], [ -126.3052618, 54.574925699999987 ], [ -126.30556820000001, 54.5749698 ], [ -126.3056906, 54.5749713 ], [ -126.3059701, 54.5749869 ], [ -126.3061075, 54.5750083 ], [ -126.306212, 54.5750467 ], [ -126.306316700000011, 54.5751123 ], [ -126.306463400000013, 54.5752404 ], [ -126.306502599999973, 54.5753316 ], [ -126.3065437, 54.5754313 ], [ -126.3065932, 54.5756122 ], [ -126.30668940000001, 54.5757859 ], [ -126.306749599999989, 54.5758315 ], [ -126.307027800000014, 54.5760537 ], [ -126.307237, 54.5761576 ], [ -126.3075689, 54.5762901 ], [ -126.307708800000015, 54.5763114 ], [ -126.3079413, 54.5763072 ], [ -126.3082336, 54.5763143 ], [ -126.308323300000012, 54.5763527 ], [ -126.308428600000013, 54.5764168 ], [ -126.308465500000011, 54.5765706 ], [ -126.3085287, 54.5767615 ], [ -126.3085242, 54.5768512 ], [ -126.308526, 54.5770492 ], [ -126.3085271, 54.5772557 ], [ -126.308538499999983, 54.5773283 ], [ -126.3085737, 54.5775078 ], [ -126.3085998, 54.5775804 ], [ -126.3088, 54.5778012 ], [ -126.3088285, 54.577873800000013 ], [ -126.308842899999988, 54.5780988 ], [ -126.308787400000014, 54.5782498 ], [ -126.3087798, 54.5783765 ], [ -126.308876200000014, 54.5785218 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17099530, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 19089.366488685599, "blue_line_key": 360886221, "length_metre": 376.15836303187302, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.644252, 54.287365 ], [ -126.644316899999978, 54.2873123 ], [ -126.6444285, 54.2872169 ], [ -126.644497799999982, 54.2871101 ], [ -126.644506100000015, 54.2869477 ], [ -126.6444804, 54.2868751 ], [ -126.644469699999988, 54.2867668 ], [ -126.644552, 54.2866785 ], [ -126.644713, 54.2865746 ], [ -126.6447466, 54.2865204 ], [ -126.644795, 54.286459199999989 ], [ -126.6448141, 54.2864051 ], [ -126.644852199999974, 54.2862897 ], [ -126.644811599999983, 54.28619 ], [ -126.644708900000012, 54.2861074 ], [ -126.644575, 54.2860234 ], [ -126.64444109999998, 54.2859394 ], [ -126.6442915, 54.2858653 ], [ -126.644185400000012, 54.2858269 ], [ -126.6439444, 54.285777 ], [ -126.6438367, 54.2857571 ], [ -126.6437597, 54.2857471 ], [ -126.6435633, 54.2857158 ], [ -126.6433499, 54.2856844 ], [ -126.6432423, 54.2856645 ], [ -126.643150600000013, 54.2856545 ], [ -126.6429537, 54.2856317 ], [ -126.642752699999988, 54.2856275 ], [ -126.6425848, 54.2856332 ], [ -126.642415, 54.2856303 ], [ -126.6423233, 54.2856203 ], [ -126.642189099999982, 54.2855719 ], [ -126.6420381, 54.2854879 ], [ -126.6419493, 54.2854423 ], [ -126.6418438, 54.2853953 ], [ -126.641709600000013, 54.2853469 ], [ -126.6416949, 54.2853469 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17098501, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 15260.8132355854, "blue_line_key": 360886221, "length_metre": 1151.55223760473, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.641117900000012, 54.3083051 ], [ -126.6411716, 54.3081798 ], [ -126.641331799999989, 54.3080573 ], [ -126.6414246, 54.3080502 ], [ -126.641534499999977, 54.3080431 ], [ -126.6418255, 54.3080488 ], [ -126.641962, 54.3080702 ], [ -126.642284100000012, 54.3080844 ], [ -126.6425458, 54.3080901 ], [ -126.642685, 54.308083 ], [ -126.6428076, 54.3080673 ], [ -126.6431488, 54.3080203 ], [ -126.643337699999989, 54.3079619 ], [ -126.6436485, 54.3078693 ], [ -126.643745099999975, 54.3078166 ], [ -126.6441384, 54.3076628 ], [ -126.6444177, 54.3076044 ], [ -126.644792599999988, 54.3074962 ], [ -126.644888599999987, 54.307452 ], [ -126.6452385, 54.3072341 ], [ -126.6454177, 54.3070575 ], [ -126.64560849999998, 54.306945 ], [ -126.6458941, 54.3067713 ], [ -126.6459932, 54.3066559 ], [ -126.646157699999989, 54.3064793 ], [ -126.6462601, 54.3063198 ], [ -126.646455, 54.3061261 ], [ -126.6466353, 54.3059395 ], [ -126.6466562, 54.3058242 ], [ -126.646619899999976, 54.3056704 ], [ -126.646488299999987, 54.3055237 ], [ -126.6461294, 54.3053642 ], [ -126.6460391, 54.3053086 ], [ -126.6459536, 54.3051904 ], [ -126.6458969, 54.3051434 ], [ -126.6457018, 54.3050594 ], [ -126.6454587, 54.305001 ], [ -126.6452145, 54.3049597 ], [ -126.644878, 54.304917 ], [ -126.644697799999989, 54.30486 ], [ -126.644607799999989, 54.3048315 ], [ -126.644462600000011, 54.304674800000015 ], [ -126.644404599999987, 54.3046108 ], [ -126.644406499999988, 54.3045566 ], [ -126.6443045, 54.3044925 ], [ -126.6441382, 54.3044171 ], [ -126.6439423, 54.3043772 ], [ -126.643621, 54.3043259 ], [ -126.643348099999983, 54.3042761 ], [ -126.643257199999979, 54.3042291 ], [ -126.6432035, 54.3041108 ], [ -126.6432103, 54.3039941 ], [ -126.643220199999988, 54.3038061 ], [ -126.643289200000012, 54.3036722 ], [ -126.643448799999987, 54.3035583 ], [ -126.6435007, 54.3034871 ], [ -126.643648699999986, 54.3033019 ], [ -126.6438558, 54.3031709 ], [ -126.6440309, 54.3030755 ], [ -126.644236100000015, 54.3029985 ], [ -126.6444391, 54.3029487 ], [ -126.644764199999983, 54.3028917 ], [ -126.6448717, 54.3028846 ], [ -126.64521, 54.3028732 ], [ -126.645428, 54.3028504 ], [ -126.6455048, 54.3028262 ], [ -126.6457061, 54.302802 ], [ -126.645866, 54.3027151 ], [ -126.6459605, 54.3026824 ], [ -126.6460693, 54.3026297 ], [ -126.6463192, 54.3025713 ], [ -126.646382499999987, 54.3025371 ], [ -126.646710899999988, 54.302436 ], [ -126.6468205, 54.3024018 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17065589, "stream_order": 4, "gnis_name": "Redtop Creek", "downstream_route_measure": 1378.80658578405, "blue_line_key": 360883143, "length_metre": 286.06213153472498, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.303219899999988, 54.5702144 ], [ -126.302973900000012, 54.5704252 ], [ -126.3028107, 54.5705747 ], [ -126.3026446, 54.5707328 ], [ -126.3025805, 54.5707755 ], [ -126.3023199, 54.5709507 ], [ -126.30218570000001, 54.5711088 ], [ -126.3020064, 54.5712484 ], [ -126.3019823, 54.5714008 ], [ -126.302122, 54.5716116 ], [ -126.3022334, 54.5717839 ], [ -126.3023341, 54.5719306 ], [ -126.3024455, 54.5721029 ], [ -126.3025259, 54.5722938 ], [ -126.302578499999981, 54.5724305 ], [ -126.302619899999982, 54.5724946 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17069037, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 18474.368140468701, "blue_line_key": 360875378, "length_metre": 696.60795888301504, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.653659, 54.5505973 ], [ -126.6543108, 54.5521027 ], [ -126.6553261, 54.5529145 ], [ -126.6570831, 54.5556148 ], [ -126.6569587, 54.5564138 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093296, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1218.8501855183199, "blue_line_key": 360802599, "length_metre": 55.1071407255221, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.507485699999989, 54.3970633 ], [ -126.5074359, 54.3971074 ], [ -126.5072457, 54.3972029 ], [ -126.5069963, 54.3972513 ], [ -126.506886400000013, 54.3972855 ], [ -126.50679070000001, 54.3973282 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091991, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 14663.119860869299, "blue_line_key": 360862508, "length_metre": 169.74514994689901, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.379148, 54.4131526 ], [ -126.3790834, 54.4131967 ], [ -126.3788927, 54.4132722 ], [ -126.37855, 54.4133278 ], [ -126.3783331, 54.413332 ], [ -126.3780261, 54.4133349 ], [ -126.3777622, 54.4133477 ], [ -126.377438, 54.4133577 ], [ -126.3772203, 54.413399 ], [ -126.3769415, 54.4134189 ], [ -126.376635, 54.4133862 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099474, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 6963.0601344541701, "blue_line_key": 360877225, "length_metre": 522.61979993382795, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1880942, 54.2902903 ], [ -126.188173, 54.2902747 ], [ -126.1884803, 54.2902818 ], [ -126.1885249, 54.2902732 ], [ -126.1887112, 54.2902775 ], [ -126.1887578, 54.2902704 ], [ -126.188801699999985, 54.2902704 ], [ -126.1889734, 54.2902476 ], [ -126.1892547, 54.290165 ], [ -126.189553599999982, 54.290081 ], [ -126.1896019, 54.2900553 ], [ -126.1897502, 54.2898887 ], [ -126.1897571, 54.289789 ], [ -126.1899963, 54.2896608 ], [ -126.1902354, 54.2895398 ], [ -126.190461899999988, 54.2893931 ], [ -126.190479, 54.289366 ], [ -126.190607500000013, 54.2892606 ], [ -126.1906552, 54.2892435 ], [ -126.1907195, 54.2892008 ], [ -126.19073659999998, 54.2891737 ], [ -126.190801600000015, 54.2891225 ], [ -126.190867, 54.2890698 ], [ -126.1908848, 54.2890342 ], [ -126.1909827, 54.288945899999987 ], [ -126.191102199999989, 54.2887778 ], [ -126.19126940000001, 54.2885927 ], [ -126.1913839, 54.2884787 ], [ -126.191534, 54.2883206 ], [ -126.19168160000001, 54.2881626 ], [ -126.191713299999989, 54.2881355 ], [ -126.191732399999978, 54.2881099 ], [ -126.1918278, 54.2880486 ], [ -126.191874299999981, 54.2880415 ], [ -126.1919366, 54.2880244 ], [ -126.1921561, 54.2879575 ], [ -126.192203799999973, 54.2879404 ], [ -126.1922503, 54.2879333 ], [ -126.1924684, 54.2878834 ], [ -126.1925143, 54.2878848 ], [ -126.1928375, 54.2879019 ], [ -126.19316, 54.2879005 ], [ -126.19334520000001, 54.2878677 ], [ -126.1936143, 54.2877581 ], [ -126.1937764, 54.2876541 ], [ -126.1938248, 54.2876014 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17091407, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 180746.23010551601, "blue_line_key": 360873822, "length_metre": 866.39800135987502, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.614150099999989, 54.4189064 ], [ -126.613720300000011, 54.4190232 ], [ -126.6134662, 54.4190218 ], [ -126.6125118, 54.4185717 ], [ -126.6117944, 54.4185162 ], [ -126.611320299999988, 54.418556 ], [ -126.611016799999987, 54.4186614 ], [ -126.6108506, 54.4188081 ], [ -126.610571599999986, 54.4196085 ], [ -126.610279399999982, 54.4199204 ], [ -126.6100139, 54.4200572 ], [ -126.6092571, 54.4202409 ], [ -126.6072187, 54.4203164 ], [ -126.6066298, 54.4204047 ], [ -126.6063278, 54.4205058 ], [ -126.606156, 54.4206824 ], [ -126.606186, 54.4208633 ], [ -126.6067631, 54.4214899 ], [ -126.607041599999974, 54.4223345 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17074449, "stream_order": 4, "gnis_name": "Johnny David Creek", "downstream_route_measure": 1180.4514913605699, "blue_line_key": 360866287, "length_metre": 166.90207364558, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3705058, 54.5230061 ], [ -126.370606599999988, 54.5231243 ], [ -126.37084369999998, 54.5232739 ], [ -126.3709169, 54.523338 ], [ -126.3712, 54.5234889 ], [ -126.371389799999974, 54.523654099999987 ], [ -126.3714266, 54.523808 ], [ -126.3714768, 54.5240074 ], [ -126.3715039, 54.52407 ], [ -126.3715913, 54.5241355 ], [ -126.3717133, 54.5241654 ], [ -126.3718012, 54.5242295 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092154, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 8160.6745634503504, "blue_line_key": 360862508, "length_metre": 742.67524916427203, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4583355, 54.415269 ], [ -126.4581679, 54.4152376 ], [ -126.457878699999981, 54.4151693 ], [ -126.4575299, 54.4150895 ], [ -126.4572058, 54.4150924 ], [ -126.4570668, 54.4150981 ], [ -126.456756200000015, 54.415118 ], [ -126.456648500000014, 54.4151251 ], [ -126.456325499999977, 54.415118 ], [ -126.4561108, 54.4150952 ], [ -126.455975, 54.4150568 ], [ -126.4559163, 54.4150012 ], [ -126.455921599999982, 54.4149029 ], [ -126.456001300000011, 54.4148503 ], [ -126.4563611, 54.4147947 ], [ -126.456454499999978, 54.414752 ], [ -126.456458899999987, 54.4146979 ], [ -126.456358599999987, 54.4145796 ], [ -126.4562223, 54.4145497 ], [ -126.4560076, 54.414527 ], [ -126.4559018, 54.41448 ], [ -126.4557577, 54.4143333 ], [ -126.455579500000013, 54.4142207 ], [ -126.45532, 54.4141794 ], [ -126.4550637, 54.414094 ], [ -126.4548992, 54.4139914 ], [ -126.4547847, 54.4138718 ], [ -126.454605, 54.4137778 ], [ -126.4544839, 54.4137394 ], [ -126.4541604, 54.4137337 ], [ -126.453947899999989, 54.4136838 ], [ -126.4538606, 54.4135913 ], [ -126.4538434, 54.4133762 ], [ -126.4538539, 54.4131868 ], [ -126.4537706, 54.4130415 ], [ -126.4536819, 54.4129945 ], [ -126.4534537, 54.4129546 ], [ -126.4533791, 54.4129162 ], [ -126.453321500000015, 54.4128435 ], [ -126.453332300000014, 54.4126812 ], [ -126.453242499999988, 54.4126441 ], [ -126.4530874, 54.4126399 ], [ -126.452810399999976, 54.412634200000014 ], [ -126.4527046, 54.4125872 ], [ -126.4526323, 54.4125146 ], [ -126.4526082, 54.4124234 ], [ -126.452629, 54.4123436 ], [ -126.452728400000012, 54.4122283 ], [ -126.452748599999978, 54.4121571 ], [ -126.452703500000013, 54.4121115 ], [ -126.4524345, 54.411979 ], [ -126.4523775, 54.4118979 ], [ -126.4523835, 54.4118252 ], [ -126.452623100000011, 54.4116871 ], [ -126.4526126, 54.4116059 ], [ -126.4525976, 54.4115788 ], [ -126.452568499999984, 54.4115504 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17105481, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 2377.6526810637201, "blue_line_key": 360880905, "length_metre": 50.231476614783404, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.409189499999982, 54.1957015 ], [ -126.4093119, 54.1961458 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17070964, "stream_order": 5, "gnis_name": "Richfield Creek", "downstream_route_measure": 6191.0648654455899, "blue_line_key": 360788426, "length_metre": 511.60205413311502, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3124406, 54.5431972 ], [ -126.3123151, 54.5432399 ], [ -126.311999, 54.5433495 ], [ -126.311764, 54.5433894 ], [ -126.311500899999984, 54.5433837 ], [ -126.311409699999984, 54.5433638 ], [ -126.311367300000015, 54.5433168 ], [ -126.311340300000012, 54.5432541 ], [ -126.311277600000011, 54.5430277 ], [ -126.3110873, 54.542871 ], [ -126.310920900000013, 54.5427856 ], [ -126.310613100000012, 54.5427884 ], [ -126.310256599999988, 54.5427898 ], [ -126.3098821, 54.5428354 ], [ -126.309534599999978, 54.5429436 ], [ -126.3092701, 54.5429835 ], [ -126.3089513, 54.5431288 ], [ -126.3087794, 54.543143 ], [ -126.30851650000001, 54.5431644 ], [ -126.3082962, 54.5432043 ], [ -126.3079856, 54.5432427 ], [ -126.3077822, 54.5432555 ], [ -126.307456, 54.5432755 ], [ -126.3073624, 54.5433182 ], [ -126.3072131, 54.5434492 ], [ -126.3070484, 54.5436173 ], [ -126.3068312, 54.5438366 ], [ -126.3067668, 54.5439078 ], [ -126.3066626, 54.5440574 ], [ -126.3066684, 54.5442012 ], [ -126.306723600000012, 54.5443023 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17094999, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 6716.6162788021002, "blue_line_key": 360886524, "length_metre": 277.68982351893101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.213056899999984, 54.3679938 ], [ -126.2132436, 54.3679439 ], [ -126.2135368, 54.367951 ], [ -126.2138104, 54.3679923 ], [ -126.21400580000001, 54.3680607 ], [ -126.214323, 54.3681576 ], [ -126.2146784, 54.3683726 ], [ -126.2147843, 54.368384 ], [ -126.2148797, 54.3683498 ], [ -126.214971600000013, 54.3683527 ], [ -126.2152813, 54.3683413 ], [ -126.2155261, 54.368347 ], [ -126.215834699999988, 54.3683455 ], [ -126.2160036, 54.3683584 ], [ -126.2160943, 54.3683783 ], [ -126.2164697, 54.3685036 ], [ -126.2166486, 54.3686247 ], [ -126.216784499999974, 54.3686546 ], [ -126.216891100000012, 54.3686574 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17083953, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 230031.78497484399, "blue_line_key": 360873822, "length_metre": 98.560461677278298, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.258356600000013, 54.4769372 ], [ -126.2584813, 54.4772762 ], [ -126.2586016, 54.4773859 ], [ -126.2588534, 54.4774913 ], [ -126.259244599999988, 54.4774941 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17088900, "stream_order": 4, "gnis_name": "Raspberry Creek", "downstream_route_measure": 0.0, "blue_line_key": 360817924, "length_metre": 16.551462601641301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.582773199999977, 54.440835 ], [ -126.583027, 54.4408164 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17075524, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 497.08912599793399, "blue_line_key": 360856488, "length_metre": 3476.03588161167, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4360718, 54.5179858 ], [ -126.4359308, 54.51801 ], [ -126.4355551, 54.5180741 ], [ -126.4354004, 54.5180883 ], [ -126.4351362, 54.5181282 ], [ -126.434791, 54.5181752 ], [ -126.4344816, 54.5182037 ], [ -126.434245300000015, 54.5182621 ], [ -126.4338852, 54.5183447 ], [ -126.4335413, 54.5184088 ], [ -126.4331697, 54.5184188 ], [ -126.432814, 54.5184116 ], [ -126.4325519, 54.518424499999988 ], [ -126.432290499999979, 54.5184002 ], [ -126.432166299999977, 54.5183974 ], [ -126.4317959, 54.5183903 ], [ -126.4314882, 54.5183931 ], [ -126.4311157, 54.5183846 ], [ -126.4308096, 54.5183689 ], [ -126.430468, 54.5183703 ], [ -126.4303139, 54.518376 ], [ -126.4300352, 54.5183803 ], [ -126.429710199999988, 54.5183903 ], [ -126.4296022, 54.5183974 ], [ -126.4294907, 54.5184216 ], [ -126.4292742, 54.5184444 ], [ -126.4291369, 54.518423 ], [ -126.4288934, 54.5183547 ], [ -126.4286015, 54.5183404 ], [ -126.428368799999987, 54.5183532 ], [ -126.428027199999974, 54.5183547 ], [ -126.4277814, 54.518349 ], [ -126.4274571, 54.5183433 ], [ -126.4270855, 54.5183532 ], [ -126.4269629, 54.5183319 ], [ -126.426594099999988, 54.5183062 ], [ -126.4262078, 54.5183162 ], [ -126.4260386, 54.5182948 ], [ -126.425745299999988, 54.5182706 ], [ -126.4254062, 54.5182721 ], [ -126.425082300000014, 54.5182649 ], [ -126.4249429, 54.5182706 ], [ -126.42485019999998, 54.518269200000013 ], [ -126.424493399999989, 54.5182792 ], [ -126.4243251, 54.5182763 ], [ -126.4240474, 54.5182706 ], [ -126.4238138, 54.5182649 ], [ -126.4235664, 54.5182778 ], [ -126.4232855, 54.5183162 ], [ -126.423190099999985, 54.5183504 ], [ -126.422816200000014, 54.518423 ], [ -126.4227209, 54.5184572 ], [ -126.4224785, 54.5186238 ], [ -126.422266600000015, 54.5187805 ], [ -126.422236099999978, 54.5187976 ], [ -126.4221878, 54.5188232 ], [ -126.421852199999989, 54.518997 ], [ -126.4217225, 54.5191009 ], [ -126.4215929, 54.519197800000015 ], [ -126.4214622, 54.5193117 ], [ -126.421331, 54.5194342 ], [ -126.421169, 54.5195396 ], [ -126.4208182, 54.5196934 ], [ -126.4204449, 54.5197575 ], [ -126.4202241, 54.5198344 ], [ -126.4199827, 54.5199911 ], [ -126.419793500000011, 54.5200409 ], [ -126.4196022, 54.5201178 ], [ -126.4192854, 54.5202446 ], [ -126.4190799, 54.520313 ], [ -126.4187213, 54.520377 ], [ -126.4184991, 54.520444 ], [ -126.4182757, 54.5205565 ], [ -126.4182106, 54.5206092 ], [ -126.418094400000015, 54.5207587 ], [ -126.4180581, 54.5208485 ], [ -126.417955599999985, 54.521008 ], [ -126.4178723, 54.5210778 ], [ -126.4176178, 54.5212159 ], [ -126.4173682, 54.5212558 ], [ -126.4170483, 54.5214196 ], [ -126.4168504, 54.521613300000013 ], [ -126.4166217, 54.521797 ], [ -126.4163949, 54.5219821 ], [ -126.4161379, 54.5221203 ], [ -126.415916099999976, 54.5222143 ], [ -126.4156963, 54.5222812 ], [ -126.4156004, 54.5223239 ], [ -126.415533199999985, 54.5224037 ], [ -126.4155192, 54.52261870000001 ], [ -126.4155777, 54.5226828 ], [ -126.4156647, 54.5227569 ], [ -126.4157693, 54.5228224 ], [ -126.415874699999975, 54.5228509 ], [ -126.4160748, 54.5228822 ], [ -126.416149100000013, 54.5229292 ], [ -126.4163201, 54.5231486 ], [ -126.4164933, 54.5233408 ], [ -126.416517299999981, 54.5234405 ], [ -126.4165395, 54.5235943 ], [ -126.416468599999988, 54.5237268 ], [ -126.416388200000014, 54.523788 ], [ -126.416337200000015, 54.5238778 ], [ -126.41631719999998, 54.523949 ], [ -126.416312399999981, 54.5240116 ], [ -126.416338499999981, 54.5240843 ], [ -126.416353, 54.5241199 ], [ -126.41636459999998, 54.5241569 ], [ -126.4164384, 54.5242124 ], [ -126.4166646, 54.5243164 ], [ -126.4170093, 54.5244674 ], [ -126.417173499999976, 54.524587 ], [ -126.417184, 54.5246411 ], [ -126.417211200000011, 54.5246967 ], [ -126.4171765, 54.5247679 ], [ -126.417123499999988, 54.5248562 ], [ -126.416958599999987, 54.5250328 ], [ -126.4168063, 54.5252365 ], [ -126.416736299999982, 54.5253874 ], [ -126.416744399999985, 54.5255042 ], [ -126.416772099999974, 54.525558300000014 ], [ -126.4168981, 54.5257591 ], [ -126.417027499999989, 54.5258873 ], [ -126.4173855, 54.5261195 ], [ -126.4174106, 54.5262021 ], [ -126.417436200000012, 54.5262832 ], [ -126.4174009, 54.526363 ], [ -126.4172855, 54.5264684 ], [ -126.417075, 54.526635 ], [ -126.417050199999977, 54.5267689 ], [ -126.417136, 54.5268885 ], [ -126.417211299999977, 54.5269256 ], [ -126.4174377, 54.5269939 ], [ -126.4176929, 54.5271064 ], [ -126.417988099999974, 54.5273286 ], [ -126.4180995, 54.5275294 ], [ -126.418138, 54.5276647 ], [ -126.418165699999975, 54.5277188 ], [ -126.418260300000014, 54.5279182 ], [ -126.418327600000012, 54.5280906 ], [ -126.418512499999977, 54.5283199 ], [ -126.41876689999998, 54.5284694 ], [ -126.4190252, 54.5285378 ], [ -126.4191489, 54.5285492 ], [ -126.419488, 54.5285477 ], [ -126.41968940000001, 54.5285335 ], [ -126.4200354, 54.5284423 ], [ -126.4201282, 54.528443800000012 ], [ -126.420382799999985, 54.5285577 ], [ -126.4206541, 54.5286802 ], [ -126.420868399999989, 54.5287201 ], [ -126.4212206, 54.5287728 ], [ -126.4215429, 54.5287984 ], [ -126.4216336, 54.5288269 ], [ -126.4218875, 54.528985 ], [ -126.4220592, 54.52919570000001 ], [ -126.4222211, 54.5293154 ], [ -126.422337700000014, 54.529445 ], [ -126.422420500000015, 54.5295803 ], [ -126.4224269, 54.5297512 ], [ -126.4224273, 54.5299677 ], [ -126.4224711, 54.5300318 ], [ -126.4226483, 54.5301429 ], [ -126.4229348, 54.5302568 ], [ -126.4232984, 54.5303821 ], [ -126.4235091, 54.5304676 ], [ -126.423839199999989, 54.5306185 ], [ -126.424054499999983, 54.5306413 ], [ -126.424264099999988, 54.5307439 ], [ -126.424417100000014, 54.5307837 ], [ -126.4246922, 54.530825 ], [ -126.425046, 54.5308592 ], [ -126.4253054, 54.5309105 ], [ -126.425656, 54.5309888 ], [ -126.4259756, 54.5310857 ], [ -126.4262292, 54.5312167 ], [ -126.42628879999998, 54.5312637 ], [ -126.426315, 54.5313363 ], [ -126.426316899999989, 54.5315343 ], [ -126.4263062, 54.5317052 ], [ -126.426344299999982, 54.531849 ], [ -126.426403399999984, 54.5319046 ], [ -126.4264611, 54.5319502 ], [ -126.4265203, 54.5320057 ], [ -126.426710399999976, 54.5321709 ], [ -126.427037200000015, 54.5323945 ], [ -126.4272626, 54.53248 ], [ -126.427430300000012, 54.5325199 ], [ -126.4276887, 54.5325882 ], [ -126.427927599999975, 54.5327192 ], [ -126.42817740000001, 54.5329315 ], [ -126.428367, 54.5331052 ], [ -126.428430699999979, 54.5333231 ], [ -126.428443699999988, 54.533377200000011 ], [ -126.428432, 54.5335652 ], [ -126.428386800000013, 54.5337717 ], [ -126.428301299999987, 54.5339042 ], [ -126.4282155, 54.5340651 ], [ -126.428176099999988, 54.534199 ], [ -126.428166699999977, 54.5343243 ], [ -126.428192799999977, 54.534397 ], [ -126.4282514, 54.534461 ], [ -126.42844740000001, 54.5345465 ], [ -126.4286905, 54.5346234 ], [ -126.4288882, 54.534654700000011 ], [ -126.4291938, 54.5347146 ], [ -126.429283399999974, 54.534753 ], [ -126.4293729, 54.5348271 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17068529, "stream_order": 4, "gnis_name": "Johnny David Creek", "downstream_route_measure": 5999.4923086296003, "blue_line_key": 360866287, "length_metre": 370.40711040647898, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.410955, 54.5539414 ], [ -126.41104630000001, 54.5539613 ], [ -126.411133699999979, 54.5540624 ], [ -126.411155799999989, 54.5541892 ], [ -126.4111153, 54.5543402 ], [ -126.4110749, 54.554484 ], [ -126.411072100000013, 54.5545552 ], [ -126.4110811, 54.5546279 ], [ -126.411179499999989, 54.5548102 ], [ -126.4111434, 54.5548714 ], [ -126.411043600000013, 54.554995299999987 ], [ -126.4110551, 54.5550679 ], [ -126.4111605, 54.5550964 ], [ -126.411391900000012, 54.555102100000013 ], [ -126.4114988, 54.5551406 ], [ -126.411659199999988, 54.5552787 ], [ -126.4117441, 54.5554154 ], [ -126.411979, 54.5556006 ], [ -126.4122501, 54.5557316 ], [ -126.412386500000011, 54.5557701 ], [ -126.4126733, 54.555884 ], [ -126.4128369, 54.555978 ], [ -126.412910900000014, 54.5560335 ], [ -126.4130702, 54.5562173 ], [ -126.413149799999985, 54.5564252 ], [ -126.4131552, 54.5565505 ], [ -126.4131849, 54.5566061 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17105530, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 8571.8116272827501, "blue_line_key": 360882583, "length_metre": 640.16971990878699, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.962806799999981, 54.200286 ], [ -125.9626788, 54.2002176 ], [ -125.9626453, 54.2001635 ], [ -125.962611, 54.2001379 ], [ -125.962595, 54.2001023 ], [ -125.9625705, 54.200004 ], [ -125.962515499999981, 54.1998701 ], [ -125.9623281, 54.1996138 ], [ -125.9621987, 54.1995098 ], [ -125.9619642, 54.1994528 ], [ -125.961759, 54.1993759 ], [ -125.961468900000014, 54.1991865 ], [ -125.9613534, 54.1990711 ], [ -125.9612839, 54.1989301 ], [ -125.961257, 54.1987863 ], [ -125.9612839, 54.1987137 ], [ -125.9612911, 54.1986154 ], [ -125.961357600000014, 54.1982722 ], [ -125.961272099999988, 54.1981482 ], [ -125.9610413, 54.1979104 ], [ -125.9608949, 54.1978064 ], [ -125.9607796, 54.197684 ], [ -125.9607675, 54.1975131 ], [ -125.9607899, 54.1974134 ], [ -125.9607434, 54.1971712 ], [ -125.9606123, 54.1970587 ], [ -125.9604217, 54.1969818 ], [ -125.960336899999987, 54.1968494 ], [ -125.960210600000011, 54.1965731 ], [ -125.9600946, 54.1964591 ], [ -125.9597196, 54.1961444 ], [ -125.959489300000016, 54.1959251 ], [ -125.9593887, 54.1958026 ], [ -125.959200700000011, 54.1955548 ], [ -125.9589832, 54.1952813 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17053305, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 21909.227842625402, "blue_line_key": 360856488, "length_metre": 39.044147848196303, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.532509199999978, 54.6386135 ], [ -126.532741, 54.6386192 ], [ -126.532867, 54.6386035 ], [ -126.53307310000001, 54.6385266 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17105870, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 9650.7140813416099, "blue_line_key": 360882583, "length_metre": 286.151176458789, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.9583404, 54.1918903 ], [ -125.9581076, 54.1918419 ], [ -125.958014, 54.1917991 ], [ -125.9580831, 54.191698 ], [ -125.9579393, 54.1916396 ], [ -125.9576902, 54.1915826 ], [ -125.9576752, 54.1915641 ], [ -125.9576761, 54.1913847 ], [ -125.9575824, 54.191342 ], [ -125.9575352, 54.1913249 ], [ -125.9574193, 54.1912109 ], [ -125.9573385, 54.1911597 ], [ -125.957332099999988, 54.1910785 ], [ -125.9572991, 54.1910429 ], [ -125.9571149, 54.1910471 ], [ -125.9569242, 54.1909446 ], [ -125.9569619, 54.1908364 ], [ -125.956779, 54.1908307 ], [ -125.956799099999984, 54.1906783 ], [ -125.9568442, 54.1906683 ], [ -125.956928, 54.1905672 ], [ -125.9568862, 54.1903977 ], [ -125.9570498, 54.1903308 ], [ -125.9570399, 54.1901869 ], [ -125.9570897, 54.1900331 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17077858, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 219566.402210801, "blue_line_key": 360873822, "length_metre": 58.680364593532701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3326831, 54.5059811 ], [ -126.332502800000015, 54.506311600000011 ], [ -126.3322542, 54.5064184 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104062, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 5227.6113733938801, "blue_line_key": 360882583, "length_metre": 252.637227104159, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.9878361, 54.2196282 ], [ -125.9875661, 54.2195085 ], [ -125.987488399999975, 54.2195014 ], [ -125.9871868, 54.2195726 ], [ -125.9870803, 54.219584 ], [ -125.986746599999989, 54.2196367 ], [ -125.9864229, 54.2196097 ], [ -125.986408199999985, 54.2196097 ], [ -125.9862321, 54.2195328 ], [ -125.986169600000011, 54.2195171 ], [ -125.986123100000015, 54.2194914 ], [ -125.9860612, 54.2194744 ], [ -125.985953, 54.2194772 ], [ -125.9859069, 54.2194701 ], [ -125.9856612, 54.2194758 ], [ -125.9855564, 54.2194957 ], [ -125.9854335, 54.2194986 ], [ -125.9853373, 54.2194558 ], [ -125.985304899999988, 54.2194117 ], [ -125.9852964, 54.2192963 ], [ -125.9852346, 54.2190813 ], [ -125.985096700000014, 54.2188876 ], [ -125.9850653, 54.2188605 ], [ -125.9850288, 54.2188078 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17090898, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 11650.582962393901, "blue_line_key": 360846413, "length_metre": 182.68737460272101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.287905599999974, 54.4259924 ], [ -126.286362700000012, 54.4246218 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17079375, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 5717.49855373233, "blue_line_key": 360875052, "length_metre": 18.820255217149398, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3798746, 54.4978574 ], [ -126.380075299999987, 54.4978517 ], [ -126.3801511, 54.4978802 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17106404, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 56499.1051713181, "blue_line_key": 360886221, "length_metre": 1851.77242448777, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.447358799999989, 54.1843448 ], [ -126.447362499999983, 54.1843007 ], [ -126.447364899999982, 54.1842465 ], [ -126.447353400000011, 54.1841839 ], [ -126.447355800000011, 54.1841298 ], [ -126.447361299999983, 54.1840671 ], [ -126.4473796, 54.1839959 ], [ -126.4473844, 54.1839147 ], [ -126.4474052, 54.1838435 ], [ -126.4474253, 54.1837808 ], [ -126.447442899999984, 54.1837182 ], [ -126.447446, 54.1836555 ], [ -126.447465399999984, 54.1836014 ], [ -126.4474685, 54.1835387 ], [ -126.4474886, 54.183476 ], [ -126.4475222, 54.1834234 ], [ -126.447542199999987, 54.1833607 ], [ -126.447545299999973, 54.183298 ], [ -126.447552, 54.1831983 ], [ -126.447539799999987, 54.1831442 ], [ -126.4474849, 54.1830531 ], [ -126.4474131, 54.1829619 ], [ -126.447416100000012, 54.1828992 ], [ -126.4474356, 54.1828451 ], [ -126.4475027, 54.1827668 ], [ -126.447569, 54.1826771 ], [ -126.4475599, 54.1825873 ], [ -126.447470400000014, 54.1825318 ], [ -126.4473662, 54.1824763 ], [ -126.447293699999989, 54.1824207 ], [ -126.4472212, 54.1823381 ], [ -126.447134100000014, 54.1822555 ], [ -126.4470616, 54.1822 ], [ -126.446955499999987, 54.18217 ], [ -126.4468178, 54.1821672 ], [ -126.4467094, 54.1821914 ], [ -126.4465705, 54.1821985 ], [ -126.4464956, 54.1821971 ], [ -126.4464041, 54.1821943 ], [ -126.4463268, 54.182192799999989 ], [ -126.4461732, 54.18218 ], [ -126.4460982, 54.1821786 ], [ -126.4459612, 54.1821672 ], [ -126.445885, 54.1821558 ], [ -126.445808899999989, 54.1821373 ], [ -126.4456736, 54.1821074 ], [ -126.4455834, 54.1820604 ], [ -126.4454652, 54.1820034 ], [ -126.445345199999977, 54.181965 ], [ -126.4452532, 54.1819365 ], [ -126.4451326, 54.1819336 ], [ -126.444994900000012, 54.1819308 ], [ -126.4448676, 54.1819735 ], [ -126.4447889, 54.1820162 ], [ -126.4447408, 54.1820689 ], [ -126.444661, 54.1821216 ], [ -126.444641499999989, 54.1821757 ], [ -126.4446683, 54.1822299 ], [ -126.4447419, 54.1822754 ], [ -126.4448772, 54.1823324 ], [ -126.444997199999975, 54.1823709 ], [ -126.4451185, 54.1823922 ], [ -126.4452392, 54.1824221 ], [ -126.445346399999977, 54.1824421 ], [ -126.4454359, 54.1824706 ], [ -126.4455243, 54.182509 ], [ -126.4456156, 54.182546 ], [ -126.445702799999978, 54.1826016 ], [ -126.4457149, 54.1826557 ], [ -126.445697900000013, 54.1827098 ], [ -126.4456473, 54.1827625 ], [ -126.44558210000001, 54.1828152 ], [ -126.4454579, 54.1828494 ], [ -126.445364, 54.1828736 ], [ -126.445315799999975, 54.1829263 ], [ -126.445236, 54.182979 ], [ -126.4452171, 54.1830317 ], [ -126.445183699999987, 54.1830773 ], [ -126.445164100000014, 54.1831385 ], [ -126.4451616, 54.1831926 ], [ -126.4451738, 54.1832467 ], [ -126.4452629, 54.1833037 ], [ -126.445365200000012, 54.1833507 ], [ -126.445502299999987, 54.1833621 ], [ -126.4456406, 54.1833564 ], [ -126.445718, 54.1833578 ], [ -126.4458099, 54.1833593 ], [ -126.445887299999981, 54.1833607 ], [ -126.4459611, 54.1833991 ], [ -126.445957400000012, 54.1834433 ], [ -126.4459099, 54.1834874 ], [ -126.4458593, 54.1835401 ], [ -126.4457649, 54.1835928 ], [ -126.4456405, 54.1836341 ], [ -126.4454986, 54.1836769 ], [ -126.445342599999989, 54.1837182 ], [ -126.4452164, 54.183778 ], [ -126.445075100000011, 54.1838392 ], [ -126.445025699999974, 54.1838819 ], [ -126.4449928, 54.1839261 ], [ -126.444910600000014, 54.1840059 ], [ -126.4448923, 54.184077099999989 ], [ -126.4448253, 54.1841483 ], [ -126.444699799999981, 54.1841995 ], [ -126.444576700000013, 54.1842238 ], [ -126.444484, 54.1842309 ], [ -126.4443475, 54.1842181 ], [ -126.4442708, 54.1842081 ], [ -126.4441799, 54.1841967 ], [ -126.444103899999988, 54.1841782 ], [ -126.4439697, 54.1841112 ], [ -126.4438972, 54.184055699999988 ], [ -126.4437486, 54.1839816 ], [ -126.443673, 54.1839617 ], [ -126.443583499999988, 54.1839332 ], [ -126.4435079, 54.1838862 ], [ -126.44335980000001, 54.1838107 ], [ -126.443242200000014, 54.1837452 ], [ -126.443198400000014, 54.1836911 ], [ -126.4431576, 54.183635599999988 ], [ -126.443129, 54.1835729 ], [ -126.443116800000013, 54.1835188 ], [ -126.4431058, 54.1834547 ], [ -126.4430821, 54.183365 ], [ -126.4430699, 54.1832838 ], [ -126.443075400000012, 54.1832211 ], [ -126.4430796, 54.1831485 ], [ -126.443082699999977, 54.1830858 ], [ -126.4430705, 54.1830317 ], [ -126.443075400000012, 54.1829776 ], [ -126.443094399999978, 54.1829249 ], [ -126.4431107, 54.1828793 ], [ -126.443129700000014, 54.1828266 ], [ -126.4431626, 54.1827825 ], [ -126.4431955, 54.1827383 ], [ -126.4432296, 54.1826842 ], [ -126.4432972, 54.1826044 ], [ -126.4433936, 54.1825261 ], [ -126.443505099999982, 54.1824663 ], [ -126.443644599999985, 54.1824236 ], [ -126.4437403, 54.1823808 ], [ -126.4438329, 54.1823466 ], [ -126.443898099999984, 54.182294 ], [ -126.443918199999985, 54.1822313 ], [ -126.4438755, 54.1821672 ], [ -126.443803699999975, 54.1821031 ], [ -126.443713500000015, 54.1820561 ], [ -126.4435904, 54.1820533 ], [ -126.443468599999989, 54.1820604 ], [ -126.4433614, 54.1820675 ], [ -126.443221799999989, 54.1820903 ], [ -126.443142599999987, 54.1821074 ], [ -126.44305, 54.1821145 ], [ -126.4429592, 54.182130199999989 ], [ -126.4428191, 54.1821544 ], [ -126.442677699999976, 54.1821957 ], [ -126.4426003, 54.1822213 ], [ -126.442507, 54.182237 ], [ -126.442398, 54.1822626 ], [ -126.4423054, 54.1822697 ], [ -126.4421653, 54.182294 ], [ -126.4420897, 54.1823011 ], [ -126.4419971, 54.1823082 ], [ -126.4419191, 54.1823153 ], [ -126.4418113, 54.182331 ], [ -126.44171870000001, 54.1823381 ], [ -126.4415644, 54.1823609 ], [ -126.4414256, 54.1823951 ], [ -126.441314, 54.1824278 ], [ -126.4412196, 54.1824805 ], [ -126.4410941, 54.1825318 ], [ -126.4410002, 54.182556 ], [ -126.440877799999981, 54.1825717 ], [ -126.4398907, 54.1826771 ], [ -126.4397975, 54.1826657 ], [ -126.4397243, 54.1826187 ], [ -126.4396366, 54.1825717 ], [ -126.439607400000014, 54.1825176 ], [ -126.43958, 54.182472 ], [ -126.439508100000012, 54.1824079 ], [ -126.4394971, 54.1823438 ], [ -126.439485600000012, 54.1822811 ], [ -126.439410599999988, 54.1822256 ], [ -126.4393381, 54.18217 ], [ -126.4392803, 54.1821145 ], [ -126.4392681, 54.1820604 ], [ -126.4392267, 54.1819792 ], [ -126.439185900000012, 54.1819237 ], [ -126.4390799, 54.1818866 ], [ -126.4389739, 54.1818567 ], [ -126.4388698, 54.1818282 ], [ -126.4387321, 54.1818254 ], [ -126.4386278, 54.181777 ], [ -126.438535799999983, 54.1817485 ], [ -126.438508399999989, 54.1817029 ], [ -126.438435299999981, 54.1816559 ], [ -126.43834889999998, 54.1815648 ], [ -126.438289799999978, 54.1815192 ], [ -126.4381119, 54.1814252 ], [ -126.4380058, 54.1814223 ], [ -126.4379139, 54.1814209 ], [ -126.437822399999973, 54.1814181 ], [ -126.437730499999986, 54.1814166 ], [ -126.4376074, 54.1814138 ], [ -126.4375008, 54.1814124 ], [ -126.4374094, 54.1814095 ], [ -126.4373004, 54.1814081 ], [ -126.4371486, 54.1814038 ], [ -126.4370109, 54.181401 ], [ -126.436856799999987, 54.1813896 ], [ -126.4367355, 54.1813682 ], [ -126.436568, 54.1813739 ], [ -126.436393099999975, 54.1814608 ], [ -126.4363145, 54.1815035 ], [ -126.4362181, 54.1815548 ], [ -126.4361554, 54.1816075 ], [ -126.4361213, 54.1816616 ], [ -126.4360384, 54.1817499 ], [ -126.4359414, 54.1818368 ], [ -126.4359213, 54.1819265 ], [ -126.435901800000011, 54.1819806 ], [ -126.435899400000011, 54.1820347 ], [ -126.4358939, 54.1820974 ], [ -126.4358287, 54.1821772 ], [ -126.435737199999977, 54.182174300000014 ], [ -126.4356428, 54.1822 ], [ -126.435565399999987, 54.1821985 ], [ -126.435397299999977, 54.1822128 ], [ -126.4353058, 54.1822099 ], [ -126.435135800000012, 54.1822156 ], [ -126.4349811, 54.1822398 ], [ -126.4348885, 54.1822469 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17085815, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 232918.26118806101, "blue_line_key": 360873822, "length_metre": 43.834286321366299, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2523602, 54.4659851 ], [ -126.252316899999983, 54.465921 ], [ -126.25212759999998, 54.4657643 ], [ -126.2519314, 54.4656959 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099771, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 23798.448044774599, "blue_line_key": 360880905, "length_metre": 101.464475510505, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3953594, 54.2823603 ], [ -126.3952889, 54.2825027 ], [ -126.395280199999988, 54.2826295 ], [ -126.3952673, 54.282836 ], [ -126.3952344, 54.2828802 ], [ -126.3952109, 54.283014 ], [ -126.3952061, 54.2830682 ], [ -126.395215, 54.2831935 ], [ -126.3952272, 54.2832205 ], [ -126.3952262, 54.2832576 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17064682, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 2585.80269928911, "blue_line_key": 360851751, "length_metre": 4.9920474808744197, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.198504700000015, 54.5759255 ], [ -126.1984613, 54.5758885 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17084216, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 230451.58468693899, "blue_line_key": 360873822, "length_metre": 1.48616487999786, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2605086, 54.475241 ], [ -126.2605156, 54.4752283 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080097, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 223393.30162510101, "blue_line_key": 360873822, "length_metre": 212.68251544402199, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.299332, 54.4958678 ], [ -126.299180600000014, 54.4959077 ], [ -126.299033600000016, 54.4958863 ], [ -126.2987989, 54.4956072 ], [ -126.299056400000012, 54.4951429 ], [ -126.299020399999989, 54.495009 ], [ -126.298584800000015, 54.4948125 ], [ -126.2977845, 54.4947455 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17087628, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 191461.41957326501, "blue_line_key": 360873822, "length_metre": 1645.6956564347199, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.540678, 54.4526644 ], [ -126.5403551, 54.4526701 ], [ -126.5398975, 54.4525847 ], [ -126.539307799999989, 54.4520848 ], [ -126.538974900000014, 54.4520207 ], [ -126.538599699999978, 54.4520079 ], [ -126.5383187, 54.4520691 ], [ -126.5379265, 54.4522941 ], [ -126.537542399999978, 54.4527485 ], [ -126.537099199999986, 54.4529023 ], [ -126.5367465, 54.4528952 ], [ -126.5359893, 54.4526573 ], [ -126.5357146, 54.4526231 ], [ -126.535401900000011, 54.4526416 ], [ -126.535099699999989, 54.4527214 ], [ -126.534894, 54.4528895 ], [ -126.5347771, 54.4532242 ], [ -126.53492820000001, 54.4535489 ], [ -126.5352471, 54.4538351 ], [ -126.5353249, 54.4541314 ], [ -126.5351572, 54.4543379 ], [ -126.534734199999974, 54.4544547 ], [ -126.5337829, 54.4543236 ], [ -126.531829500000015, 54.4538494 ], [ -126.5305075, 54.4534264 ], [ -126.53020979999998, 54.4532128 ], [ -126.5301348, 54.4529436 ], [ -126.530327199999988, 54.4527997 ], [ -126.531118, 54.45271 ], [ -126.531493399999988, 54.4525961 ], [ -126.5318689, 54.4522856 ], [ -126.5319911, 54.4520691 ], [ -126.5319749, 54.4518911 ], [ -126.5318416, 54.4515436 ], [ -126.5316704, 54.4513186 ], [ -126.5313183, 54.4512958 ], [ -126.531027599999987, 54.4513285 ], [ -126.5302896, 54.4516248 ], [ -126.529577, 54.4517501 ], [ -126.5292684, 54.4519253 ], [ -126.529193799999987, 54.4520264 ], [ -126.5291578, 54.4525989 ], [ -126.5288464, 54.4529293 ], [ -126.528704, 54.4529792 ], [ -126.5284487, 54.4529806 ], [ -126.5281221, 54.4529407 ], [ -126.527977, 54.4528653 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17077959, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 725.91166271126303, "blue_line_key": 360747751, "length_metre": 485.096446861853, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4805567, 54.5049785 ], [ -126.4804576, 54.5050938 ], [ -126.4803281, 54.5051978 ], [ -126.4800859, 54.5053645 ], [ -126.4799878, 54.5054698 ], [ -126.4799186, 54.5055767 ], [ -126.4798121, 54.5057903 ], [ -126.47966430000001, 54.5059398 ], [ -126.4795526, 54.5059996 ], [ -126.4794578, 54.5060253 ], [ -126.47934930000001, 54.506041 ], [ -126.4790538, 54.5060794 ], [ -126.4789422, 54.5061321 ], [ -126.478906099999989, 54.5061933 ], [ -126.478718399999977, 54.5062532 ], [ -126.4785088, 54.5063828 ], [ -126.478128899999973, 54.5065366 ], [ -126.4778627, 54.5066035 ], [ -126.4775179, 54.5066776 ], [ -126.4771584, 54.5067588 ], [ -126.4768424, 54.5068698 ], [ -126.476490899999988, 54.5070336 ], [ -126.476360700000015, 54.5071746 ], [ -126.4762097, 54.5073683 ], [ -126.4761226, 54.5075193 ], [ -126.4760335, 54.5076973 ], [ -126.475946400000012, 54.5078483 ], [ -126.4759519, 54.5080291 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100891, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 19043.063439005298, "blue_line_key": 360880905, "length_metre": 251.22018036129899, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3678457, 54.2642045 ], [ -126.3677982, 54.2642487 ], [ -126.36779270000001, 54.2643113 ], [ -126.367784300000011, 54.2644366 ], [ -126.3677724, 54.2646261 ], [ -126.367758599999974, 54.2648411 ], [ -126.367725, 54.2648938 ], [ -126.3675574, 54.265116 ], [ -126.367553199999989, 54.2651958 ], [ -126.367519099999981, 54.2652499 ], [ -126.367438600000014, 54.2653111 ], [ -126.367342799999989, 54.2653538 ], [ -126.367276300000015, 54.265423600000013 ], [ -126.3673095, 54.265623 ], [ -126.367327399999979, 54.2658381 ], [ -126.367261, 54.2659007 ], [ -126.3669258, 54.2658836 ], [ -126.36687520000001, 54.2659363 ], [ -126.36685030000001, 54.2660802 ], [ -126.366802799999988, 54.2661243 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17083797, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1189.5527914601, "blue_line_key": 360875052, "length_metre": 95.235949535982201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3343272, 54.47744 ], [ -126.3347187, 54.4780738 ], [ -126.3347657, 54.4782518 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17072405, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1001.87111036153, "blue_line_key": 360881632, "length_metre": 66.842105593505394, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6444191, 54.5346791 ], [ -126.645234500000015, 54.53431 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17055461, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 25090.1779331332, "blue_line_key": 360856488, "length_metre": 418.90673245031797, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5543125, 54.6239541 ], [ -126.5545442, 54.6239669 ], [ -126.5546835, 54.6239698 ], [ -126.5550711, 54.6239512 ], [ -126.555367300000015, 54.6239484 ], [ -126.5556935, 54.623937 ], [ -126.556080200000011, 54.6239356 ], [ -126.5562667, 54.6239299 ], [ -126.5564064, 54.6239242 ], [ -126.556717299999974, 54.6238857 ], [ -126.5570134, 54.6238829 ], [ -126.557331499999989, 54.6237447 ], [ -126.557426400000011, 54.623683500000013 ], [ -126.5575747, 54.6235525 ], [ -126.557683, 54.6235453 ], [ -126.557977599999987, 54.6235325 ], [ -126.5581026, 54.6235268 ], [ -126.558395899999979, 54.6235325 ], [ -126.558703, 54.6235838 ], [ -126.5589486, 54.6236422 ], [ -126.559145, 54.6237362 ], [ -126.5592204, 54.6237746 ], [ -126.5595627, 54.6239883 ], [ -126.5596666, 54.6240438 ], [ -126.5599547, 54.6241578 ], [ -126.5601201, 54.6242418 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101512, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 26562.653074359499, "blue_line_key": 360881038, "length_metre": 193.49276198433199, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0704557, 54.2557305 ], [ -126.0705163, 54.255525399999989 ], [ -126.0706975, 54.2553502 ], [ -126.0708939, 54.2551935 ], [ -126.0709649, 54.2550597 ], [ -126.0709327, 54.2548617 ], [ -126.070952499999976, 54.2548076 ], [ -126.071147, 54.2546694 ], [ -126.0712526, 54.2544743 ], [ -126.0713894, 54.2542607 ], [ -126.0714062, 54.254235 ], [ -126.071366399999988, 54.2541439 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17093946, "stream_order": 5, "gnis_name": "Bulkley River", "downstream_route_measure": 262870.89235236601, "blue_line_key": 360873822, "length_metre": 283.61847703581901, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0640792, 54.3906771 ], [ -126.063872100000012, 54.3907626 ], [ -126.063654, 54.390811 ], [ -126.063479300000012, 54.3908879 ], [ -126.0633487, 54.39099190000001 ], [ -126.0630428, 54.3911742 ], [ -126.062675099999979, 54.3913451 ], [ -126.0623244, 54.391516 ], [ -126.0621351, 54.3915929 ], [ -126.0618992, 54.3916499 ], [ -126.0616504, 54.3916883 ], [ -126.061428, 54.3917553 ], [ -126.0613426, 54.3918963 ], [ -126.061080499999974, 54.3918906 ], [ -126.0607882, 54.3919005 ], [ -126.0605933, 54.3920131 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17098743, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 27226.925602972002, "blue_line_key": 360880905, "length_metre": 22.1551821348922, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4256861, 54.298898199999989 ], [ -126.4257103, 54.298988 ], [ -126.425629300000011, 54.2990848 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17065297, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 2613.4731136427399, "blue_line_key": 360881574, "length_metre": 41.372919792612201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6148519, 54.5708468 ], [ -126.6150623, 54.5709493 ], [ -126.615379799999985, 54.5710547 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17090507, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 275447.01762527, "blue_line_key": 360873822, "length_metre": 150.008601220771, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.14259, 54.4283347 ], [ -126.1424812, 54.429677100000013 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17097668, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 13002.976344643001, "blue_line_key": 360886221, "length_metre": 324.663588204544, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6276446, 54.3183074 ], [ -126.627832200000014, 54.318239 ], [ -126.628129199999989, 54.3181721 ], [ -126.6282399, 54.3181208 ], [ -126.628385, 54.3180069 ], [ -126.6284328, 54.3179542 ], [ -126.628630199999989, 54.3177605 ], [ -126.6286986, 54.3176351 ], [ -126.6288165, 54.3174315 ], [ -126.628931899999984, 54.3172976 ], [ -126.629232499999986, 54.3171509 ], [ -126.629342900000012, 54.3171352 ], [ -126.6294817, 54.3171295 ], [ -126.629677699999988, 54.3171694 ], [ -126.629734899999988, 54.3172777 ], [ -126.6297557, 54.317413 ], [ -126.6297454, 54.3176024 ], [ -126.629749100000012, 54.3178004 ], [ -126.6296806, 54.3179328 ], [ -126.629625, 54.3181123 ], [ -126.629525300000012, 54.3182362 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076166, "stream_order": 5, "gnis_name": "Perow Creek", "downstream_route_measure": 0.0, "blue_line_key": 360836816, "length_metre": 36.345022174543097, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4437907, 54.514149 ], [ -126.4437759, 54.5143384 ], [ -126.443799699999985, 54.5144737 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17106538, "stream_order": 4, "gnis_name": "Buck Creek", "downstream_route_measure": 62733.705258218302, "blue_line_key": 360886221, "length_metre": 141.460418498238, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.375999899999982, 54.179056 ], [ -126.37383, 54.1791178 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17067701, "stream_order": 5, "gnis_name": "Richfield Creek", "downstream_route_measure": 9025.5451011636396, "blue_line_key": 360788426, "length_metre": 1857.84381082402, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3056101, 54.5593178 ], [ -126.305534900000012, 54.5595314 ], [ -126.305447399999977, 54.5596824 ], [ -126.3052644, 54.5598675 ], [ -126.305120299999984, 54.5599629 ], [ -126.3047484, 54.5599729 ], [ -126.3043917, 54.5599743 ], [ -126.304082299999976, 54.5599672 ], [ -126.303757599999983, 54.5599686 ], [ -126.3036473, 54.5600028 ], [ -126.3036116, 54.5600555 ], [ -126.303562, 54.5601267 ], [ -126.3035375, 54.5602521 ], [ -126.3035326, 54.5603147 ], [ -126.3035509, 54.5605212 ], [ -126.3035286, 54.5606195 ], [ -126.303505, 54.5607633 ], [ -126.303448599999982, 54.5608887 ], [ -126.3033686, 54.5609485 ], [ -126.3033313, 54.5610197 ], [ -126.3033224, 54.5611636 ], [ -126.3033262, 54.5613345 ], [ -126.3033157, 54.5614968 ], [ -126.303459, 54.561662 ], [ -126.3036055, 54.5617902 ], [ -126.3037706, 54.5618657 ], [ -126.3039236, 54.5619056 ], [ -126.304215, 54.5619568 ], [ -126.3043355, 54.5620053 ], [ -126.304327399999977, 54.5621121 ], [ -126.304274799999988, 54.5621918 ], [ -126.3041954, 54.562236 ], [ -126.3038135, 54.5624069 ], [ -126.303623, 54.5624738 ], [ -126.3034214, 54.5624881 ], [ -126.303157599999977, 54.5624909 ], [ -126.302848199999985, 54.562483799999988 ], [ -126.3026303, 54.5625237 ], [ -126.3023342, 54.5625621 ], [ -126.3020318, 54.5626818 ], [ -126.301893799999988, 54.5628854 ], [ -126.3018742, 54.5629481 ], [ -126.3018012, 54.5631347 ], [ -126.301696, 54.5632942 ], [ -126.301610099999976, 54.5634266 ], [ -126.3015232, 54.563569 ], [ -126.3014024, 54.5637727 ], [ -126.3013605, 54.5639336 ], [ -126.3013712, 54.5640148 ], [ -126.301373399999974, 54.5642042 ], [ -126.301376599999983, 54.5643837 ], [ -126.301357900000014, 54.5644649 ], [ -126.3013307, 54.5646258 ], [ -126.301304699999989, 54.5647696 ], [ -126.301300900000015, 54.5648223 ], [ -126.3013203, 54.5650118 ], [ -126.3012768, 54.5651912 ], [ -126.3012105, 54.565261 ], [ -126.3009367, 54.5654177 ], [ -126.3006993, 54.5655202 ], [ -126.300648799999976, 54.5655729 ], [ -126.300452, 54.5657481 ], [ -126.3002148, 54.565815 ], [ -126.2998742, 54.5658335 ], [ -126.299512100000015, 54.5659062 ], [ -126.2994193, 54.5659047 ], [ -126.299065, 54.5659062 ], [ -126.298897199999985, 54.5658663 ], [ -126.2988224, 54.5658278 ], [ -126.2986422, 54.5657253 ], [ -126.2984472, 54.5656584 ], [ -126.29823110000001, 54.5656441 ], [ -126.2981377, 54.5656512 ], [ -126.2979179, 54.5656826 ], [ -126.297808099999983, 54.5657153 ], [ -126.2976326, 54.565802199999986 ], [ -126.297535900000014, 54.5658535 ], [ -126.297339199999982, 54.5660287 ], [ -126.297227799999987, 54.5660799 ], [ -126.2968617, 54.5662337 ], [ -126.2967509, 54.5662765 ], [ -126.2964323, 54.5663861 ], [ -126.296064300000012, 54.5665941 ], [ -126.2957264, 54.5667935 ], [ -126.295519500000012, 54.5668789 ], [ -126.295235399999981, 54.566953 ], [ -126.2951426, 54.5669515 ], [ -126.2950497, 54.5669572 ], [ -126.2949553, 54.5669743 ], [ -126.2947362, 54.5670313 ], [ -126.294610299999988, 54.567047 ], [ -126.2944383, 54.5670612 ], [ -126.294268100000011, 54.567084 ], [ -126.294174199999986, 54.5670997 ], [ -126.2938722, 54.5672107 ], [ -126.2937783, 54.5672264 ], [ -126.2934388, 54.5672278 ], [ -126.2931146, 54.5672207 ], [ -126.2930195, 54.5672535 ], [ -126.292866499999974, 54.5674301 ], [ -126.292819, 54.5674742 ], [ -126.292676700000015, 54.5675155 ], [ -126.2925686, 54.5675226 ], [ -126.2922266, 54.5675241 ], [ -126.2921201, 54.5675127 ], [ -126.291769799999983, 54.5674329 ], [ -126.291659699999983, 54.5674386 ], [ -126.2913516, 54.5674415 ], [ -126.291190899999989, 54.5675283 ], [ -126.291124499999981, 54.5675981 ], [ -126.2909237, 54.5677918 ], [ -126.290829499999987, 54.5678431 ], [ -126.2906075, 54.5679015 ], [ -126.2904999, 54.5679072 ], [ -126.290143199999989, 54.5679086 ], [ -126.289803100000015, 54.5679186 ], [ -126.2896469, 54.5679157 ], [ -126.289353499999976, 54.5679186 ], [ -126.289014, 54.56792 ], [ -126.2888127, 54.5679058 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17054241, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 20755.833456322602, "blue_line_key": 360856488, "length_metre": 220.643859646594, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.520355099999989, 54.6320365 ], [ -126.5204142, 54.6321006 ], [ -126.520601899999988, 54.6323199 ], [ -126.5207802, 54.6324595 ], [ -126.5210038, 54.6325891 ], [ -126.521339500000011, 54.6326859 ], [ -126.52147690000001, 54.6327158 ], [ -126.5217368, 54.6327756 ], [ -126.522086299999984, 54.6328896 ], [ -126.5223724, 54.6330306 ], [ -126.522459599999976, 54.6331132 ], [ -126.5224715, 54.6331858 ], [ -126.522366, 54.6333994 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17107229, "stream_order": 4, "gnis_name": "Buck Creek", "downstream_route_measure": 66270.182318118095, "blue_line_key": 360886221, "length_metre": 391.344769565322, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3298214, 54.1665023 ], [ -126.3297129, 54.1664995 ], [ -126.329392500000012, 54.1665109 ], [ -126.3292841, 54.166508 ], [ -126.329194699999988, 54.1664795 ], [ -126.3291217, 54.1664325 ], [ -126.3290934, 54.1663699 ], [ -126.329030199999977, 54.1661619 ], [ -126.328941399999977, 54.166105 ], [ -126.328851300000011, 54.166085 ], [ -126.3286218, 54.1660808 ], [ -126.3285158, 54.1660508 ], [ -126.3281887, 54.1658999 ], [ -126.327857599999987, 54.1658201 ], [ -126.3277524, 54.1657817 ], [ -126.327666799999989, 54.165709 ], [ -126.3276739, 54.1655823 ], [ -126.3276315, 54.1655182 ], [ -126.327509799999987, 54.1654982 ], [ -126.327311899999984, 54.165494 ], [ -126.3271914, 54.1654641 ], [ -126.327097699999982, 54.1652462 ], [ -126.3270737, 54.165165 ], [ -126.327024400000013, 54.1649656 ], [ -126.326850199999981, 54.1648089 ], [ -126.326774699999987, 54.164789 ], [ -126.3265782, 54.1647676 ], [ -126.326519800000014, 54.1647206 ], [ -126.326607599999988, 54.1645526 ], [ -126.326567, 54.16447 ], [ -126.326491600000011, 54.164423 ], [ -126.3264386, 54.1642877 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17063600, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 22540.2690338391, "blue_line_key": 360875378, "length_metre": 79.845371400219193, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6829356, 54.5797269 ], [ -126.6832475, 54.5804192 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17094763, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 2777.2025897940798, "blue_line_key": 360886524, "length_metre": 1108.8132071895, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.170588399999986, 54.376751199999987 ], [ -126.1707445, 54.3767185 ], [ -126.1708493, 54.3767398 ], [ -126.170957, 54.3767598 ], [ -126.171314, 54.3769293 ], [ -126.171559, 54.376962 ], [ -126.171622, 54.3769364 ], [ -126.171792900000014, 54.3769236 ], [ -126.1719558, 54.3770076 ], [ -126.1720464, 54.3770275 ], [ -126.172187799999989, 54.3769948 ], [ -126.1722893, 54.3768623 ], [ -126.172360900000015, 54.3767114 ], [ -126.1724318, 54.3765689 ], [ -126.1725156, 54.3764721 ], [ -126.1725346, 54.3764464 ], [ -126.1726802, 54.3763411 ], [ -126.172840600000015, 54.3762556 ], [ -126.173090300000013, 54.3762072 ], [ -126.1733952, 54.3762228 ], [ -126.1735918, 54.3762812 ], [ -126.173756, 54.3763752 ], [ -126.1738877, 54.3764778 ], [ -126.1740641, 54.3765718 ], [ -126.174340899999976, 54.3766045 ], [ -126.1745459, 54.3765376 ], [ -126.1748207, 54.3763382 ], [ -126.175027, 54.376261299999982 ], [ -126.1752449, 54.3762129 ], [ -126.175260900000012, 54.3761958 ], [ -126.17525830000001, 54.3760334 ], [ -126.1752055, 54.3758882 ], [ -126.175337700000014, 54.3757657 ], [ -126.175496099999989, 54.375678799999989 ], [ -126.175687099999976, 54.3756033 ], [ -126.175843199999989, 54.3755706 ], [ -126.175906900000015, 54.3755364 ], [ -126.1758865, 54.3753826 ], [ -126.1758375, 54.3752202 ], [ -126.1758331, 54.3750493 ], [ -126.175934, 54.3749254 ], [ -126.176079, 54.3748214 ], [ -126.1762106, 54.3747075 ], [ -126.176326099999983, 54.3745836 ], [ -126.176307099999988, 54.3744397 ], [ -126.1760112, 54.3742432 ], [ -126.1760534, 54.3740922 ], [ -126.1762584, 54.3740253 ], [ -126.176521, 54.3739954 ], [ -126.176756099999977, 54.373947 ], [ -126.1770052, 54.3739071 ], [ -126.177146600000015, 54.3738743 ], [ -126.1774, 54.3737547 ], [ -126.1774869, 54.3736222 ], [ -126.1775284, 54.3734528 ], [ -126.1776446, 54.3733474 ], [ -126.1778637, 54.373289 ], [ -126.177895, 54.3732904 ], [ -126.178045, 54.3733559 ], [ -126.178157700000014, 54.3734841 ], [ -126.178241700000015, 54.3736037 ], [ -126.178356900000011, 54.3737319 ], [ -126.1784733, 54.373843 ], [ -126.178650300000015, 54.3739284 ], [ -126.1787727, 54.3739484 ], [ -126.178881099999984, 54.3739327 ], [ -126.1790126, 54.3738188 ], [ -126.179203, 54.3737518 ], [ -126.1794527, 54.373703399999989 ], [ -126.1796278, 54.373618 ], [ -126.1798457, 54.3735695 ], [ -126.1799933, 54.373662100000011 ], [ -126.18010910000001, 54.3737817 ], [ -126.1801844, 54.373810199999987 ], [ -126.1802456, 54.3738031 ], [ -126.180355299999988, 54.3737974 ], [ -126.1805737, 54.3737476 ], [ -126.1809466, 54.3736764 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099726, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 23899.912520285099, "blue_line_key": 360880905, "length_metre": 195.991404100208, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3952262, 54.2832576 ], [ -126.3952361, 54.2833117 ], [ -126.3954418, 54.2834869 ], [ -126.395589199999989, 54.283579499999988 ], [ -126.3956461, 54.2836521 ], [ -126.3957202, 54.2836905 ], [ -126.3959012, 54.2837575 ], [ -126.396033300000013, 54.2838586 ], [ -126.3961198, 54.2839512 ], [ -126.3963048, 54.2841705 ], [ -126.396505699999977, 54.2843998 ], [ -126.3966108, 54.2844197 ], [ -126.396813, 54.2844069 ], [ -126.397100200000011, 54.2844838 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17073206, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 2717.9091997978298, "blue_line_key": 360875378, "length_metre": 346.70636601879801, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4797149, 54.5317066 ], [ -126.4800557, 54.5316867 ], [ -126.480184, 54.5316354 ], [ -126.4805657, 54.5314275 ], [ -126.480916799999989, 54.5312722 ], [ -126.480966599999988, 54.5311925 ], [ -126.4809912, 54.5310586 ], [ -126.480951199999978, 54.530976 ], [ -126.4808607, 54.5309119 ], [ -126.480664599999983, 54.5308265 ], [ -126.4807322, 54.5307382 ], [ -126.480789199999975, 54.5305957 ], [ -126.480953199999988, 54.5304277 ], [ -126.481069600000012, 54.5303052 ], [ -126.4811949, 54.5302625 ], [ -126.48139519999998, 54.5302582 ], [ -126.4816269, 54.5302625 ], [ -126.481905700000013, 54.5302511 ], [ -126.482154099999988, 54.5302639 ], [ -126.4824933, 54.5302625 ], [ -126.482647899999989, 54.5302482 ], [ -126.482728, 54.5302226 ], [ -126.4829067, 54.530083 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17103929, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 30911.401297189699, "blue_line_key": 360886221, "length_metre": 1301.4547116147201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6136677, 54.2247682 ], [ -126.6135609, 54.2247397 ], [ -126.6134711, 54.2247112 ], [ -126.6133953, 54.2246912 ], [ -126.6132127, 54.2246428 ], [ -126.61304770000001, 54.2245858 ], [ -126.6128828, 54.2245289 ], [ -126.6127013, 54.2244705 ], [ -126.612534599999989, 54.224432 ], [ -126.6123691, 54.2243836 ], [ -126.6122193, 54.2243181 ], [ -126.6120707, 54.2242426 ], [ -126.6119524, 54.22415 ], [ -126.6118372, 54.2240489 ], [ -126.6117517, 54.2239122 ], [ -126.611659, 54.2236857 ], [ -126.611601099999973, 54.2235946 ], [ -126.6115141, 54.2235034 ], [ -126.6114118, 54.2234208 ], [ -126.6113235, 54.2233468 ], [ -126.611267, 54.2232656 ], [ -126.611241, 54.2232015 ], [ -126.611244299999981, 54.2231303 ], [ -126.61123520000001, 54.2230392 ], [ -126.6112249, 54.2229309 ], [ -126.611198399999978, 54.2228682 ], [ -126.6111859, 54.2228141 ], [ -126.611148, 54.2226874 ], [ -126.6111253, 54.2225521 ], [ -126.6111151, 54.2224709 ], [ -126.611117799999988, 54.2224082 ], [ -126.6111097, 54.2222729 ], [ -126.611073499999989, 54.2221277 ], [ -126.61106, 54.2220835 ], [ -126.6110169, 54.2220194 ], [ -126.6110038, 54.2219739 ], [ -126.610903799999974, 54.2218642 ], [ -126.610846799999976, 54.2217915 ], [ -126.6107902, 54.2217175 ], [ -126.610689, 54.2215907 ], [ -126.6105738, 54.221489600000012 ], [ -126.6104409, 54.221397 ], [ -126.6103075, 54.221313 ], [ -126.610188199999982, 54.2212304 ], [ -126.610086400000014, 54.2211464 ], [ -126.6099825, 54.2210823 ], [ -126.609863800000014, 54.2210253 ], [ -126.609771599999988, 54.2209968 ], [ -126.609666100000013, 54.2209854 ], [ -126.6095271, 54.2209926 ], [ -126.609403299999983, 54.2209983 ], [ -126.609265, 54.221031 ], [ -126.609152599999973, 54.2211008 ], [ -126.608885, 54.2212304 ], [ -126.608727300000012, 54.2212902 ], [ -126.6085411, 54.2213415 ], [ -126.6084472, 54.2213657 ], [ -126.6083535, 54.2213828 ], [ -126.6081694, 54.2214141 ], [ -126.6079676, 54.2214198 ], [ -126.6078469, 54.221417 ], [ -126.6077548, 54.2214156 ], [ -126.607585799999981, 54.2214113 ], [ -126.6074339, 54.2213999 ], [ -126.607326500000013, 54.22138 ], [ -126.6072502, 54.2213686 ], [ -126.6071152, 54.2213301 ], [ -126.6070429, 54.221266 ], [ -126.607041099999989, 54.2212575 ], [ -126.6070303, 54.2211848 ], [ -126.607082299999988, 54.2211136 ], [ -126.6071625, 54.2210524 ], [ -126.6072562, 54.2210011 ], [ -126.607351, 54.2209399 ], [ -126.6074312, 54.2208786 ], [ -126.6074967, 54.2208174 ], [ -126.607563399999989, 54.2207462 ], [ -126.607628399999982, 54.2206935 ], [ -126.6077086, 54.2206322 ], [ -126.607756499999979, 54.2205795 ], [ -126.6077903, 54.2205254 ], [ -126.6079027, 54.2204556 ], [ -126.6079818, 54.220404400000014 ], [ -126.608108199999975, 54.2203431 ], [ -126.6082494, 54.2202748 ], [ -126.6083765, 54.220205 ], [ -126.608489499999976, 54.2201267 ], [ -126.6085849, 54.2200569 ], [ -126.6086485, 54.2199942 ], [ -126.6086531, 54.2199401 ], [ -126.60865410000001, 54.2198959 ], [ -126.608658699999978, 54.2198418 ], [ -126.6086614, 54.2197791 ], [ -126.608619600000011, 54.219698 ], [ -126.608563, 54.2196239 ], [ -126.6084591, 54.2195598 ], [ -126.608355, 54.2195028 ], [ -126.6082522, 54.2194288 ], [ -126.6081348, 54.2193547 ], [ -126.6079997, 54.2192892 ], [ -126.607848800000014, 54.2192408 ], [ -126.607744399999987, 54.2192123 ], [ -126.6076516, 54.2191924 ], [ -126.6074386, 54.219161 ], [ -126.607241500000015, 54.2191397 ], [ -126.6071354, 54.2191368 ], [ -126.6070585, 54.2191269 ], [ -126.606875500000015, 54.219114 ], [ -126.6067071, 54.2191012 ], [ -126.6065553, 54.2190898 ], [ -126.606432, 54.219087 ], [ -126.606336, 54.2191311 ], [ -126.6062735, 54.2191838 ], [ -126.606267100000011, 54.2192636 ], [ -126.606262199999989, 54.2193804 ], [ -126.606273, 54.219453 ], [ -126.6062686, 54.2195342 ], [ -126.606263399999989, 54.2195968 ], [ -126.6062601, 54.2196681 ], [ -126.606253900000013, 54.2197677 ], [ -126.606234699999987, 54.219829 ], [ -126.6062336, 54.219839 ], [ -126.6062155, 54.2198831 ], [ -126.6061625, 54.2200255 ], [ -126.6060802, 54.2201409 ], [ -126.606045799999976, 54.2202036 ], [ -126.606010099999978, 54.2202562 ], [ -126.605912499999988, 54.2203802 ], [ -126.6058781, 54.2204428 ], [ -126.6058279, 54.2205226 ], [ -126.605759100000014, 54.2206479 ], [ -126.6056924, 54.220726199999987 ], [ -126.6056309, 54.2207348 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17082657, "stream_order": 4, "gnis_name": "North Ailport Creek", "downstream_route_measure": 0.0, "blue_line_key": 360864097, "length_metre": 592.66960243761002, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1597976, 54.483596800000015 ], [ -126.1599737, 54.483735 ], [ -126.1601607, 54.4839458 ], [ -126.160287900000014, 54.484111 ], [ -126.1603969, 54.4843203 ], [ -126.160554300000015, 54.4845041 ], [ -126.1607264, 54.4846878 ], [ -126.160749599999988, 54.4847875 ], [ -126.160767099999987, 54.4849854 ], [ -126.1607799, 54.4852375 ], [ -126.160798, 54.4854269 ], [ -126.160814899999977, 54.4856335 ], [ -126.1608142, 54.4858684 ], [ -126.160509300000015, 54.4860493 ], [ -126.1605206, 54.4860864 ], [ -126.1606404, 54.4861419 ], [ -126.160652500000012, 54.4861974 ], [ -126.1606006, 54.4862672 ], [ -126.160254900000012, 54.4863769 ], [ -126.15994809999998, 54.4865492 ], [ -126.1599606, 54.4866033 ], [ -126.160033299999981, 54.4866674 ], [ -126.1603915, 54.4868383 ], [ -126.1604341, 54.486911 ], [ -126.160343499999982, 54.487089 ], [ -126.160219399999988, 54.4873197 ], [ -126.1602215, 54.4875262 ], [ -126.1599591, 54.4877185 ], [ -126.1597055, 54.4878381 ], [ -126.159460200000012, 54.4880304 ], [ -126.159466299999977, 54.4881643 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099614, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 24389.187480536399, "blue_line_key": 360880905, "length_metre": 242.079293039866, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4000771, 54.2852671 ], [ -126.4001199, 54.2853042 ], [ -126.4001952, 54.2853597 ], [ -126.4002974, 54.2854081 ], [ -126.4004202, 54.2854195 ], [ -126.4005131, 54.2854124 ], [ -126.400621199999989, 54.2854238 ], [ -126.4006934, 54.2854879 ], [ -126.4007052, 54.2855506 ], [ -126.400764, 54.2855976 ], [ -126.4008045, 54.2856616 ], [ -126.4008322, 54.2857343 ], [ -126.400828600000011, 54.2857784 ], [ -126.400810399999983, 54.2858226 ], [ -126.400805800000015, 54.2859038 ], [ -126.4009098, 54.2859607 ], [ -126.4010125, 54.2860077 ], [ -126.4011183, 54.2860462 ], [ -126.4011936, 54.2860747 ], [ -126.4012212, 54.2861202 ], [ -126.401248799999976, 54.2861658 ], [ -126.401341699999989, 54.2861858 ], [ -126.401433299999979, 54.2861957 ], [ -126.401539, 54.2862071 ], [ -126.4016342, 54.2861729 ], [ -126.401756399999982, 54.2861587 ], [ -126.4017687, 54.2862128 ], [ -126.40179569999998, 54.2862669 ], [ -126.401903300000015, 54.2862869 ], [ -126.4019938, 54.2863068 ], [ -126.402066599999984, 54.2863624 ], [ -126.4020466, 54.286425 ], [ -126.402012, 54.2864877 ], [ -126.4020873, 54.2865432 ], [ -126.402162499999989, 54.2865717 ], [ -126.4022084, 54.2865731 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17092381, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 247768.27430470599, "blue_line_key": 360873822, "length_metre": 1690.3213227331701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.203545, 54.4141211 ], [ -126.2033853, 54.414198 ], [ -126.203239199999985, 54.4143119 ], [ -126.2031289, 54.4143532 ], [ -126.202865499999987, 54.4143575 ], [ -126.20268440000001, 54.4142891 ], [ -126.2025365, 54.4141965 ], [ -126.202421, 54.4140954 ], [ -126.202365, 54.4140128 ], [ -126.2023704, 54.4139501 ], [ -126.202375, 54.413869 ], [ -126.2025377, 54.4137565 ], [ -126.202587099999988, 54.4136938 ], [ -126.2026231, 54.413614 ], [ -126.202570600000016, 54.4134873 ], [ -126.2024987, 54.4134218 ], [ -126.202377899999973, 54.4133833 ], [ -126.2020566, 54.4133306 ], [ -126.2017826, 54.4132893 ], [ -126.201662299999981, 54.4132494 ], [ -126.201545, 54.4131398 ], [ -126.2014377, 54.4129204 ], [ -126.2014736, 54.4128407 ], [ -126.2015244, 54.412788 ], [ -126.2017448, 54.4127125 ], [ -126.2019363, 54.4126085 ], [ -126.202083, 54.4124861 ], [ -126.202169, 54.4123622 ], [ -126.202264, 54.4123294 ], [ -126.2024042, 54.4123137 ], [ -126.2025269, 54.4123266 ], [ -126.2026017, 54.4123636 ], [ -126.2027768, 54.4125032 ], [ -126.203039, 54.4127068 ], [ -126.2031445, 54.4127538 ], [ -126.2032666, 54.4127752 ], [ -126.2034191, 54.4127866 ], [ -126.203666699999985, 54.4127923 ], [ -126.2039373, 54.4128977 ], [ -126.2040893, 54.4129105 ], [ -126.2043215, 54.4128977 ], [ -126.204430500000015, 54.4128735 ], [ -126.204526, 54.4128393 ], [ -126.204592599999984, 54.4127695 ], [ -126.2045224, 54.4126513 ], [ -126.2044488, 54.4126043 ], [ -126.2042065, 54.4125359 ], [ -126.20389, 54.4124291 ], [ -126.203712099999976, 54.4123451 ], [ -126.2036684, 54.4122895 ], [ -126.2036424, 54.4122254 ], [ -126.203663099999986, 54.4121542 ], [ -126.203758, 54.4121215 ], [ -126.203944799999988, 54.4120987 ], [ -126.20415939999998, 54.4121215 ], [ -126.2043379, 54.412197 ], [ -126.204459300000011, 54.4122269 ], [ -126.2045825, 54.4122383 ], [ -126.204814200000015, 54.4122269 ], [ -126.2048629, 54.4121727 ], [ -126.204919600000011, 54.4120488 ], [ -126.204887700000015, 54.4118238 ], [ -126.204863499999988, 54.4117412 ], [ -126.2048199, 54.4116785 ], [ -126.2046631, 54.4114948 ], [ -126.204534699999982, 54.4113481 ], [ -126.204350100000013, 54.4111188 ], [ -126.204223399999989, 54.4109536 ], [ -126.2042134, 54.4108724 ], [ -126.2041933, 54.4107101 ], [ -126.20420679999998, 54.410495 ], [ -126.2042516, 54.4103156 ], [ -126.2042746, 54.4101902 ], [ -126.2042521, 54.4100549 ], [ -126.2041957, 54.4100008 ], [ -126.204032899999987, 54.4098883 ], [ -126.203943900000013, 54.4098499 ], [ -126.2038532, 54.4098299 ], [ -126.203743, 54.409837 ], [ -126.2036186, 54.4098698 ], [ -126.2035219, 54.4099211 ], [ -126.2034012, 54.4101076 ], [ -126.203362899999973, 54.4102145 ], [ -126.2032875, 54.410411 ], [ -126.2031549, 54.4105691 ], [ -126.2030564, 54.4106389 ], [ -126.2028549, 54.4106617 ], [ -126.202531400000012, 54.4106631 ], [ -126.202423, 54.4106787 ], [ -126.2021689, 54.4107799 ], [ -126.2018943, 54.4109721 ], [ -126.201728599999981, 54.4111202 ], [ -126.2016273, 54.4112527 ], [ -126.2015526, 54.4114678 ], [ -126.2014335, 54.4116358 ], [ -126.2013504, 54.4116971 ], [ -126.201117700000012, 54.4117455 ], [ -126.200977899999984, 54.4117327 ], [ -126.2008736, 54.4117027 ], [ -126.2006213, 54.4115532 ], [ -126.2005382, 54.4114165 ], [ -126.200505799999988, 54.4112271 ], [ -126.2005641, 54.4110305 ], [ -126.200665500000014, 54.4108981 ], [ -126.200746899999984, 54.4108553 ], [ -126.2008577, 54.4108126 ], [ -126.2011528, 54.4107471 ], [ -126.2012489, 54.4107044 ], [ -126.201284899999976, 54.4106517 ], [ -126.201273199999974, 54.410589 ], [ -126.201167700000013, 54.410542 ], [ -126.201015, 54.4105377 ], [ -126.2007668, 54.4105406 ], [ -126.2006767, 54.4105121 ], [ -126.2004569, 54.410354 ], [ -126.2003525, 54.4102971 ], [ -126.2002206, 54.4101874 ], [ -126.2001392, 54.4100322 ], [ -126.200040199999989, 54.4098855 ], [ -126.1999972, 54.4098484 ], [ -126.199913, 54.4097217 ], [ -126.199821, 54.4097188 ], [ -126.1995022, 54.4096661 ], [ -126.1994857, 54.4096576 ], [ -126.1993967, 54.4096191 ], [ -126.199336, 54.4096177 ], [ -126.1991976, 54.4096149 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17065413, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 3302.1626924709299, "blue_line_key": 360851751, "length_metre": 8.1391474602615297, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1906287, 54.5716201 ], [ -126.190556599999979, 54.5715603 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092455, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 10544.755804352901, "blue_line_key": 360862508, "length_metre": 277.06915142290302, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4317924, 54.4080895 ], [ -126.431410499999984, 54.4080553 ], [ -126.4311637, 54.4080682 ], [ -126.4310219, 54.4081095 ], [ -126.430722499999987, 54.408202 ], [ -126.430375, 54.4083473 ], [ -126.4302485, 54.4083801 ], [ -126.4301108, 54.4083957 ], [ -126.429753199999979, 54.4084242 ], [ -126.429461, 54.4084271 ], [ -126.4293378, 54.4084157 ], [ -126.4290941, 54.4083644 ], [ -126.4288211, 54.408306 ], [ -126.4287119, 54.4083032 ], [ -126.4283906, 54.4082775 ], [ -126.4280359, 54.4082704 ], [ -126.4277137, 54.408281800000012 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17066027, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 3310.30183993119, "blue_line_key": 360851751, "length_metre": 485.58489894084198, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.190556599999979, 54.5715603 ], [ -126.1904984, 54.571523299999988 ], [ -126.1904225, 54.5712797 ], [ -126.1904178, 54.5710988 ], [ -126.190388599999977, 54.5708553 ], [ -126.19026, 54.5706915 ], [ -126.190171, 54.5706445 ], [ -126.1900336, 54.5706232 ], [ -126.189908699999989, 54.5706288 ], [ -126.1897093, 54.5708311 ], [ -126.1895817, 54.5708724 ], [ -126.1894148, 54.570851 ], [ -126.1892961, 54.570777 ], [ -126.1891387, 54.5705833 ], [ -126.1890748, 54.5703753 ], [ -126.1890584, 54.5701859 ], [ -126.1889825, 54.5699424 ], [ -126.1889181, 54.569743 ], [ -126.1886642, 54.5696205 ], [ -126.1883611, 54.5695052 ], [ -126.188185199999978, 54.569357 ], [ -126.1878587, 54.569169 ], [ -126.1876421, 54.5689483 ], [ -126.1875629, 54.5687489 ], [ -126.187402299999988, 54.5685922 ], [ -126.1873772, 54.5685381 ], [ -126.1873826, 54.5684398 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17104476, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 23310.2727463431, "blue_line_key": 360877225, "length_metre": 62.240813923574201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.278526, 54.2130953 ], [ -126.278637, 54.2132862 ], [ -126.2789076, 54.213346 ], [ -126.279076499999988, 54.2133503 ], [ -126.2792289, 54.2133531 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17099192, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 16412.365473190101, "blue_line_key": 360886221, "length_metre": 2188.9083387533301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6468205, 54.3024018 ], [ -126.6470388, 54.3023434 ], [ -126.64710310000001, 54.3022993 ], [ -126.647187799999983, 54.3021483 ], [ -126.6471933, 54.3020771 ], [ -126.6471733, 54.3019047 ], [ -126.647151400000013, 54.3017168 ], [ -126.6471168, 54.301544399999983 ], [ -126.647030500000014, 54.3014077 ], [ -126.646873, 54.3012169 ], [ -126.646836199999981, 54.3010716 ], [ -126.646753300000015, 54.3008907 ], [ -126.6467031, 54.3006999 ], [ -126.6466487, 54.300556 ], [ -126.6466224, 54.3004919 ], [ -126.646562800000012, 54.3004464 ], [ -126.6464585, 54.3004165 ], [ -126.6463039, 54.3004051 ], [ -126.6459683, 54.3003808 ], [ -126.645614400000014, 54.300373699999987 ], [ -126.6453084, 54.3003766 ], [ -126.6449399, 54.3003695 ], [ -126.6448311, 54.3003666 ], [ -126.6445258, 54.3003253 ], [ -126.644220899999979, 54.3003111 ], [ -126.6440242, 54.3002527 ], [ -126.643918699999986, 54.3002057 ], [ -126.643690799999973, 54.3001387 ], [ -126.643404, 54.3000519 ], [ -126.6433454, 54.2999963 ], [ -126.6432424, 54.299949299999987 ], [ -126.6431521, 54.2998938 ], [ -126.643064200000012, 54.2998382 ], [ -126.6429465, 54.2997286 ], [ -126.642861599999989, 54.2996089 ], [ -126.6428172, 54.2995548 ], [ -126.6427614, 54.2994637 ], [ -126.6426481, 54.2992999 ], [ -126.6425201, 54.2991361 ], [ -126.6424613, 54.2990535 ], [ -126.6424209, 54.2989808 ], [ -126.6423524, 54.2988356 ], [ -126.6423131, 54.2986903 ], [ -126.6422631, 54.2984923 ], [ -126.6422396, 54.2983927 ], [ -126.64215990000001, 54.2981747 ], [ -126.642093099999983, 54.2980038 ], [ -126.642063799999988, 54.2979483 ], [ -126.6420544, 54.29785 ], [ -126.64204740000001, 54.2976962 ], [ -126.642102900000012, 54.2975452 ], [ -126.6421518, 54.2974826 ], [ -126.6422026, 54.2974213 ], [ -126.642345399999982, 54.2973345 ], [ -126.64253260000001, 54.2973017 ], [ -126.642641199999986, 54.2972775 ], [ -126.6427497, 54.297260400000013 ], [ -126.6429359, 54.2972376 ], [ -126.643259, 54.2972348 ], [ -126.643441599999989, 54.2972291 ], [ -126.643596799999983, 54.2972319 ], [ -126.6439042, 54.297239 ], [ -126.6441644, 54.2972348 ], [ -126.644302499999981, 54.2972376 ], [ -126.6446403, 54.2972348 ], [ -126.644903, 54.2972305 ], [ -126.6452267, 54.2972191 ], [ -126.6453184, 54.297222 ], [ -126.6454874, 54.2972063 ], [ -126.64574949999998, 54.2972034 ], [ -126.645841800000014, 54.2972049 ], [ -126.6460727, 54.2972006 ], [ -126.6462108, 54.2972034 ], [ -126.6464257, 54.2971892 ], [ -126.646674199999978, 54.2971764 ], [ -126.6467963, 54.2971693 ], [ -126.646936, 54.2971536 ], [ -126.6471827, 54.2971322 ], [ -126.6474299, 54.2971094 ], [ -126.647707700000012, 54.2970966 ], [ -126.6481723, 54.2970525 ], [ -126.6483893, 54.2970112 ], [ -126.6484833, 54.296987 ], [ -126.648575799999975, 54.2969528 ], [ -126.648735699999975, 54.2968659 ], [ -126.648832599999977, 54.2967776 ], [ -126.6488248, 54.2966608 ], [ -126.6487809, 54.2966053 ], [ -126.648692699999984, 54.2965227 ], [ -126.6485753, 54.2964401 ], [ -126.648349700000011, 54.2963461 ], [ -126.6482154, 54.2962976 ], [ -126.6480016, 54.2962392 ], [ -126.647836700000013, 54.2961737 ], [ -126.647703, 54.2961168 ], [ -126.6475986, 54.2960527 ], [ -126.6475248, 54.2960057 ], [ -126.6474052, 54.2959501 ], [ -126.647269600000016, 54.2958846 ], [ -126.6471768, 54.2958917 ], [ -126.6470716, 54.2958718 ], [ -126.6468567, 54.2958305 ], [ -126.6467526, 54.2957935 ], [ -126.6466782, 54.295755 ], [ -126.646560600000015, 54.295645399999984 ], [ -126.646535700000015, 54.2955286 ], [ -126.6466356, 54.2954317 ], [ -126.6467627, 54.2953619 ], [ -126.6469176, 54.2953377 ], [ -126.6470725, 54.2953135 ], [ -126.6471651, 54.2952793 ], [ -126.647244799999982, 54.2952537 ], [ -126.647386, 54.2951853 ], [ -126.6475459, 54.2950985 ], [ -126.6476149, 54.2949646 ], [ -126.6475569, 54.2949005 ], [ -126.6474229, 54.2948165 ], [ -126.6472726, 54.294751 ], [ -126.6471826, 54.2947225 ], [ -126.6471066, 54.2947025 ], [ -126.6469586, 54.2946099 ], [ -126.6468263, 54.2945003 ], [ -126.646752299999989, 54.2944262 ], [ -126.6467103, 54.2943721 ], [ -126.6466572, 54.2942454 ], [ -126.646605499999978, 54.294073 ], [ -126.6465923, 54.2940274 ], [ -126.646565200000012, 54.2939377 ], [ -126.6464853, 54.2937554 ], [ -126.646432, 54.2936016 ], [ -126.6464193, 54.2935475 ], [ -126.6463883, 54.2932954 ], [ -126.646412599999977, 54.293143 ], [ -126.6464485, 54.2930547 ], [ -126.6464819, 54.2929735 ], [ -126.6465385, 54.2928126 ], [ -126.646578499999976, 54.2926431 ], [ -126.6465868, 54.2924808 ], [ -126.6465954, 54.2923383 ], [ -126.646616299999977, 54.2922301 ], [ -126.6466229, 54.2921489 ], [ -126.646641199999976, 54.2920692 ], [ -126.64666459999998, 54.2919609 ], [ -126.6466701, 54.291827 ], [ -126.646659899999989, 54.2917729 ], [ -126.6466656, 54.2916732 ], [ -126.6466728, 54.2915208 ], [ -126.6466496, 54.2913855 ], [ -126.6465811, 54.2912403 ], [ -126.64650850000001, 54.2911762 ], [ -126.6463589, 54.2911021 ], [ -126.6461945, 54.2910352 ], [ -126.6461039, 54.2910152 ], [ -126.6460285, 54.2909868 ], [ -126.6458601, 54.2909383 ], [ -126.6456955, 54.2908999 ], [ -126.6455572, 54.29087 ], [ -126.6454378, 54.2908415 ], [ -126.6452241, 54.2907831 ], [ -126.6450123, 54.2907333 ], [ -126.644739699999974, 54.2906478 ], [ -126.6446185, 54.2906179 ], [ -126.6444373, 54.290578 ], [ -126.644270299999988, 54.2905396 ], [ -126.644136, 54.2904911 ], [ -126.6440443, 54.2904812 ], [ -126.6439519, 54.2904527 ], [ -126.6438635, 54.2904057 ], [ -126.6437586, 54.2903501 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17083844, "stream_order": 5, "gnis_name": "Ailport Creek", "downstream_route_measure": 90.2002740440075, "blue_line_key": 360878058, "length_metre": 436.29532824641399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.255944899999989, 54.4788329 ], [ -126.2561177, 54.4787745 ], [ -126.2561677, 54.4787303 ], [ -126.2561562, 54.4786662 ], [ -126.2561282, 54.4786207 ], [ -126.2559063, 54.4784725 ], [ -126.2556344, 54.4783757 ], [ -126.255544599999979, 54.4783387 ], [ -126.255487699999989, 54.4782917 ], [ -126.2554751, 54.4782375 ], [ -126.255528899999987, 54.4781136 ], [ -126.2558005, 54.477984 ], [ -126.255761100000015, 54.4778672 ], [ -126.2556872, 54.4778202 ], [ -126.2555792, 54.4778274 ], [ -126.2553893, 54.4778858 ], [ -126.2552672, 54.4778915 ], [ -126.255130200000011, 54.4778701 ], [ -126.2551022, 54.4778245 ], [ -126.2550896, 54.4777704 ], [ -126.2551025, 54.4775824 ], [ -126.2550757, 54.4775269 ], [ -126.2549699, 54.477479900000013 ], [ -126.2546515, 54.4774101 ], [ -126.2545411, 54.4774172 ], [ -126.25444730000001, 54.4774329 ], [ -126.2543684, 54.4774756 ], [ -126.254171899999989, 54.4776422 ], [ -126.2540769, 54.477675 ], [ -126.2537517, 54.4776864 ], [ -126.2536613, 54.4776579 ], [ -126.25346110000001, 54.4776351 ], [ -126.2533373, 54.4776593 ], [ -126.2531451, 54.4777448 ], [ -126.252930499999977, 54.4779555 ], [ -126.2527402, 54.4780495 ], [ -126.252551399999987, 54.4780908 ], [ -126.2524582, 54.478098 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17105742, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 9307.3798778599503, "blue_line_key": 360882583, "length_metre": 343.334203481663, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.958277099999975, 54.1946518 ], [ -125.958245299999973, 54.1946262 ], [ -125.9582861, 54.1945621 ], [ -125.9582842, 54.194508 ], [ -125.9581121, 54.1944667 ], [ -125.9580559, 54.1943428 ], [ -125.958045899999988, 54.1941989 ], [ -125.958008400000011, 54.1940836 ], [ -125.9580875, 54.1939098 ], [ -125.9579989, 54.1937417 ], [ -125.9580856, 54.1936591 ], [ -125.9580823, 54.1936221 ], [ -125.958017399999989, 54.1935609 ], [ -125.958073200000015, 54.1935153 ], [ -125.958040200000013, 54.193479700000012 ], [ -125.9580345, 54.19339 ], [ -125.9581023, 54.1932532 ], [ -125.958130399999973, 54.1932433 ], [ -125.9581212, 54.1930909 ], [ -125.9582338, 54.1929712 ], [ -125.958269699999988, 54.1928089 ], [ -125.9582165, 54.1927291 ], [ -125.958063599999988, 54.1927149 ], [ -125.95803, 54.1924642 ], [ -125.958087600000013, 54.1924272 ], [ -125.9583168, 54.1921965 ], [ -125.958278100000015, 54.1920711 ], [ -125.9583605, 54.1919344 ], [ -125.9583404, 54.1918903 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17086445, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 195501.57208665699, "blue_line_key": 360873822, "length_metre": 1380.8251423019601, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5200506, 54.4635084 ], [ -126.5186289, 54.4631523 ], [ -126.518011199999989, 54.463195 ], [ -126.517177800000013, 54.4631466 ], [ -126.5159145, 54.4628561 ], [ -126.5154276, 54.4626367 ], [ -126.515000199999989, 54.4623035 ], [ -126.514929599999974, 54.4621198 ], [ -126.5149592, 54.4619019 ], [ -126.5152819, 54.4613364 ], [ -126.5152569, 54.4610715 ], [ -126.514851, 54.4606485 ], [ -126.5145276, 54.4604663 ], [ -126.514242599999989, 54.4604264 ], [ -126.5137363, 54.4604591 ], [ -126.512645400000011, 54.460818 ], [ -126.512511600000011, 54.4609063 ], [ -126.512443100000013, 54.4611513 ], [ -126.512441699999982, 54.4613094 ], [ -126.512619300000011, 54.4617053 ], [ -126.5128133, 54.4619916 ], [ -126.51328239999998, 54.462416 ], [ -126.514175099999989, 54.4635212 ], [ -126.5143784, 54.4641521 ], [ -126.514749099999989, 54.4643045 ], [ -126.5150662, 54.4642945 ], [ -126.5159091, 54.4641265 ], [ -126.516236400000011, 54.4641436 ], [ -126.516764099999989, 54.4642532 ], [ -126.5170336, 54.4643586 ], [ -126.5171966, 54.4644882 ], [ -126.5173194, 54.4647047 ], [ -126.517305600000014, 54.4649055 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17085024, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 0.0, "blue_line_key": 360846413, "length_metre": 857.19159527352201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2586295, 54.4721775 ], [ -126.2589124, 54.472085 ], [ -126.2592796, 54.4721206 ], [ -126.259479899999988, 54.4721433 ], [ -126.2596919, 54.4722017 ], [ -126.2599046, 54.4722516 ], [ -126.260254300000014, 54.4723228 ], [ -126.260439, 54.4723271 ], [ -126.2605653, 54.472302899999981 ], [ -126.260660800000011, 54.4722687 ], [ -126.260801199999989, 54.4722459 ], [ -126.260956299999989, 54.4722302 ], [ -126.261309399999988, 54.4722573 ], [ -126.261619799999977, 54.4722459 ], [ -126.26174420000001, 54.4722131 ], [ -126.2620284, 54.4721377 ], [ -126.2623726, 54.472038 ], [ -126.2625176, 54.471961 ], [ -126.2626278, 54.4719269 ], [ -126.2629745, 54.4718272 ], [ -126.26303919999998, 54.471783 ], [ -126.263291, 54.471709 ], [ -126.2635274, 54.4716506 ], [ -126.263652399999984, 54.4716093 ], [ -126.263797899999986, 54.4715309 ], [ -126.263913, 54.471407 ], [ -126.2639429, 54.471192 ], [ -126.2639961, 54.4710766 ], [ -126.2640792, 54.4710154 ], [ -126.2641564, 54.4709912 ], [ -126.2642649, 54.4709755 ], [ -126.26459, 54.470964099999989 ], [ -126.264823799999974, 54.4709613 ], [ -126.265147899999988, 54.4709598 ], [ -126.2654883, 54.4709399 ], [ -126.2658123, 54.4709385 ], [ -126.2660742, 54.4709257 ], [ -126.2663221, 54.4709313 ], [ -126.2666786, 54.4709214 ], [ -126.2668478, 54.4709071 ], [ -126.267080299999989, 54.4708943 ], [ -126.2673749, 54.4708929 ], [ -126.2676535, 54.4708815 ], [ -126.2679933, 54.4708701 ], [ -126.2681462, 54.4708744 ], [ -126.2685345, 54.4708644 ], [ -126.268827699999989, 54.470853 ], [ -126.2689831, 54.4708573 ], [ -126.2692286, 54.470863 ], [ -126.2693371, 54.4708473 ], [ -126.2696322, 54.4708445 ], [ -126.2698622, 54.4708317 ], [ -126.2700961, 54.4708288 ], [ -126.2702506, 54.4708146 ], [ -126.270545499999983, 54.4707846 ], [ -126.2706848, 54.470779 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092328, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 11592.541607502701, "blue_line_key": 360862508, "length_metre": 486.05551422253501, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4180096, 54.410861 ], [ -126.4170315, 54.4106555 ], [ -126.4151529, 54.4103968 ], [ -126.412817499999989, 54.4101536 ], [ -126.4107327, 54.4098199 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17078670, "stream_order": 4, "gnis_name": "Ailport Creek", "downstream_route_measure": 15616.9428782785, "blue_line_key": 360878058, "length_metre": 663.73680208389203, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1029952, 54.5018381 ], [ -126.1028535, 54.5018709 ], [ -126.1025501, 54.5020261 ], [ -126.102259600000011, 54.502207 ], [ -126.1019585, 54.5023081 ], [ -126.101689799999988, 54.5024007 ], [ -126.1014341, 54.5025118 ], [ -126.1013474, 54.5026442 ], [ -126.101207699999989, 54.5028835 ], [ -126.1011871, 54.5029547 ], [ -126.1008299, 54.5031982 ], [ -126.10054, 54.5033435 ], [ -126.100343599999988, 54.5035286 ], [ -126.099977900000013, 54.5036454 ], [ -126.0996502, 54.5037181 ], [ -126.099333, 54.5038092 ], [ -126.099049, 54.503910299999987 ], [ -126.0987875, 54.5041197 ], [ -126.0986052, 54.504286300000011 ], [ -126.0984204, 54.50448 ], [ -126.0980697, 54.5046509 ], [ -126.0978095, 54.5048432 ], [ -126.097383600000015, 54.50495 ], [ -126.0969808, 54.5049586 ], [ -126.0966245, 54.5049671 ], [ -126.0961602, 54.5049828 ], [ -126.0958057, 54.5049657 ], [ -126.095361499999981, 54.5049187 ], [ -126.0951789, 54.5048873 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17103945, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 32483.699297684499, "blue_line_key": 360881038, "length_metre": 48.855266812486803, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0581664, 54.2206436 ], [ -126.0583034, 54.2204499 ], [ -126.0582785, 54.2203588 ], [ -126.05816320000001, 54.2202748 ], [ -126.058148800000012, 54.2202477 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093868, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 16764.338720773299, "blue_line_key": 360846413, "length_metre": 83.256712536657105, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2624101, 54.3923565 ], [ -126.262620200000015, 54.3916206 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17106546, "stream_order": 4, "gnis_name": "Buck Creek", "downstream_route_measure": 62247.161377925098, "blue_line_key": 360886221, "length_metre": 486.54388029319199, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3832777, 54.1793829 ], [ -126.3808457, 54.1788331 ], [ -126.3774685, 54.1790339 ], [ -126.375999899999982, 54.179056 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102259, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 12704.6354983377, "blue_line_key": 360880905, "length_metre": 559.94338780309204, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.427469, 54.2424682 ], [ -126.427361, 54.2424568 ], [ -126.4272248, 54.2424355 ], [ -126.427117400000014, 54.2424155 ], [ -126.426968399999978, 54.2423756 ], [ -126.4268616, 54.2423472 ], [ -126.426680299999987, 54.2423158 ], [ -126.426588199999983, 54.2422873 ], [ -126.426469699999984, 54.2422304 ], [ -126.4263806, 54.2421934 ], [ -126.4262016, 54.2421079 ], [ -126.4260239, 54.2420053 ], [ -126.4258895, 54.2419313 ], [ -126.425788, 54.2418473 ], [ -126.425744099999989, 54.2417931 ], [ -126.425659099999976, 54.2416835 ], [ -126.4256193, 54.2416108 ], [ -126.4255758, 54.2415553 ], [ -126.4255208, 54.2414642 ], [ -126.4254627, 54.2414086 ], [ -126.4254193, 54.2413459 ], [ -126.4253606, 54.241298899999983 ], [ -126.425243400000014, 54.2412249 ], [ -126.4251207, 54.2412135 ], [ -126.424999299999982, 54.2412192 ], [ -126.4248589, 54.2412163 ], [ -126.424704, 54.2412406 ], [ -126.4245197, 54.2412719 ], [ -126.4243636, 54.2413132 ], [ -126.4242943, 54.2414115 ], [ -126.4242895, 54.2414926 ], [ -126.424271300000015, 54.2415638 ], [ -126.424265299999988, 54.2416351 ], [ -126.4242477, 54.2416977 ], [ -126.424259400000011, 54.2417604 ], [ -126.4242535, 54.241824500000014 ], [ -126.4242645, 54.2418957 ], [ -126.4242622, 54.2419498 ], [ -126.4242093, 54.2420566 ], [ -126.424066599999989, 54.242135 ], [ -126.4239264, 54.2421592 ], [ -126.423833, 54.2421748 ], [ -126.423679199999981, 54.2421891 ], [ -126.4236017, 54.2421876 ], [ -126.423466199999979, 54.2421577 ], [ -126.4233765, 54.2421293 ], [ -126.423254899999989, 54.2420808 ], [ -126.4231799, 54.2420524 ], [ -126.4230901, 54.242023900000014 ], [ -126.4228948, 54.2419569 ], [ -126.422789099999974, 54.241918500000011 ], [ -126.4226859, 54.24188 ], [ -126.4225364, 54.2418145 ], [ -126.4223574, 54.2417291 ], [ -126.4222677, 54.2417006 ], [ -126.422162700000015, 54.2416536 ], [ -126.422071, 54.2416237 ], [ -126.4219368, 54.2415767 ], [ -126.4218464, 54.2415567 ], [ -126.4217249, 54.2415354 ], [ -126.421633500000013, 54.2415254 ], [ -126.4215072, 54.2415582 ], [ -126.4214767, 54.2415752 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17088139, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 277933.30522920197, "blue_line_key": 360873822, "length_metre": 181.754678083919, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1418306, 54.4483334 ], [ -126.1418871, 54.4486126 ], [ -126.1420217, 54.4489131 ], [ -126.1421155, 54.4490954 ], [ -126.1422051, 54.4493574 ], [ -126.14225, 54.449628 ], [ -126.1421827, 54.4498972 ], [ -126.1421822, 54.4499328 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17106471, "stream_order": 4, "gnis_name": "Buck Creek", "downstream_route_measure": 59147.125807063203, "blue_line_key": 360886221, "length_metre": 946.55393126853596, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4251983, 54.182049 ], [ -126.425092899999981, 54.1820105 ], [ -126.4249893, 54.1819806 ], [ -126.4248949, 54.1820063 ], [ -126.4247846, 54.182049 ], [ -126.4246913, 54.1820917 ], [ -126.424581, 54.1821344 ], [ -126.4244871, 54.1821586 ], [ -126.4243629, 54.1821658 ], [ -126.424166, 54.1821515 ], [ -126.423895, 54.1820661 ], [ -126.4238212, 54.1820006 ], [ -126.4237348, 54.1819365 ], [ -126.4236148, 54.181871 ], [ -126.423466199999979, 54.181804 ], [ -126.4233322, 54.181757 ], [ -126.4231658, 54.181725699999987 ], [ -126.42302810000001, 54.1817228 ], [ -126.422635199999988, 54.1816246 ], [ -126.422501299999979, 54.1815505 ], [ -126.4223691, 54.1814579 ], [ -126.422250299999988, 54.1813825 ], [ -126.4221303, 54.181344 ], [ -126.4220116, 54.1812885 ], [ -126.421936699999975, 54.18126 ], [ -126.4217411, 54.1812286 ], [ -126.421573, 54.1812158 ], [ -126.4214041, 54.1812116 ], [ -126.4212043, 54.1812258 ], [ -126.4210026, 54.1812657 ], [ -126.4208606, 54.1813084 ], [ -126.4207375, 54.1813326 ], [ -126.420598, 54.1813483 ], [ -126.4202448, 54.1811062 ], [ -126.4202205, 54.181025 ], [ -126.4201797, 54.1809424 ], [ -126.420106100000012, 54.1808697 ], [ -126.4200202, 54.1808042 ], [ -126.419897699999979, 54.18076580000001 ], [ -126.41976, 54.1807629 ], [ -126.4196078, 54.1807601 ], [ -126.419361599999974, 54.1807814 ], [ -126.419236699999985, 54.1807971 ], [ -126.419113599999989, 54.1808213 ], [ -126.4189728, 54.1808541 ], [ -126.418818, 54.1809053 ], [ -126.4187064, 54.1809652 ], [ -126.4185791, 54.1810349 ], [ -126.4184688, 54.1810777 ], [ -126.4183298, 54.1810919 ], [ -126.418224399999986, 54.1810535 ], [ -126.4181367, 54.1810065 ], [ -126.418014899999989, 54.1809865 ], [ -126.4175263, 54.180958 ], [ -126.4173587, 54.1809637 ], [ -126.417189900000011, 54.1809595 ], [ -126.417020600000015, 54.1809566 ], [ -126.4168378, 54.1809438 ], [ -126.4167026, 54.1808868 ], [ -126.4165997, 54.1808213 ], [ -126.41648210000001, 54.1807558 ], [ -126.4163506, 54.1806547 ], [ -126.4161874, 54.1805607 ], [ -126.4160858, 54.180478099999988 ], [ -126.415967599999988, 54.1803941 ], [ -126.4157898, 54.1803001 ], [ -126.4156711, 54.1802445 ], [ -126.4155505, 54.1801875 ], [ -126.4154585, 54.1801861 ], [ -126.415362799999983, 54.1802559 ], [ -126.4153139, 54.1803171 ], [ -126.4152938, 54.1803798 ], [ -126.4152761, 54.1804425 ], [ -126.4152522, 54.1805493 ], [ -126.415246599999989, 54.180639 ], [ -126.415241, 54.1807558 ], [ -126.41524579999998, 54.1808911 ], [ -126.4152297, 54.1811517 ], [ -126.4151492, 54.181213 ], [ -126.415069399999979, 54.1812657 ], [ -126.4149602, 54.1812984 ], [ -126.4148067, 54.1813127 ], [ -126.4146544, 54.1813098 ], [ -126.414471, 54.1813055 ], [ -126.414287, 54.1813027 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17083247, "stream_order": 4, "gnis_name": "Ailport Creek", "downstream_route_measure": 11180.840802582001, "blue_line_key": 360878058, "length_metre": 852.70689337830095, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.144112299999989, 54.4804479 ], [ -126.144106, 54.4805476 ], [ -126.144024, 54.480625900000014 ], [ -126.1439272, 54.4806772 ], [ -126.143803299999988, 54.4807014 ], [ -126.1435756, 54.4808581 ], [ -126.143227900000014, 54.480966300000013 ], [ -126.1429146, 54.4810404 ], [ -126.142775500000013, 54.481244 ], [ -126.142852, 54.481489 ], [ -126.1429455, 54.4816799 ], [ -126.142942, 54.4817511 ], [ -126.1428276, 54.4818379 ], [ -126.142541299999976, 54.4819391 ], [ -126.142207399999975, 54.4820843 ], [ -126.142175, 54.4821199 ], [ -126.142170299999989, 54.4821741 ], [ -126.142387199999988, 54.4823763 ], [ -126.142348899999988, 54.4824831 ], [ -126.1422694, 54.4825273 ], [ -126.141951299999988, 54.4826626 ], [ -126.141841, 54.4826967 ], [ -126.1415434, 54.4827608 ], [ -126.141257799999977, 54.4828534 ], [ -126.141192299999986, 54.4829061 ], [ -126.1411895, 54.4829688 ], [ -126.1412069, 54.4831667 ], [ -126.141331099999988, 54.4833675 ], [ -126.141340599999978, 54.4834573 ], [ -126.141295500000012, 54.4836723 ], [ -126.1413104, 54.4838703 ], [ -126.141338199999979, 54.4839159 ], [ -126.141401699999989, 54.4841153 ], [ -126.1414049, 54.4843047 ], [ -126.141237499999988, 54.4844984 ], [ -126.141097, 54.4845211 ], [ -126.140882, 54.4844984 ], [ -126.1407733, 54.484487 ], [ -126.140451500000012, 54.4844613 ], [ -126.1400944, 54.4845069 ], [ -126.139841299999986, 54.4845909 ], [ -126.1394994, 54.4846009 ], [ -126.13913380000001, 54.4845468 ], [ -126.138733500000015, 54.4845283 ], [ -126.138392199999984, 54.4845297 ], [ -126.138065700000013, 54.4845582 ], [ -126.1379844, 54.484628 ], [ -126.1377506, 54.4846579 ], [ -126.137451899999988, 54.4847319 ], [ -126.137125399999988, 54.4847604 ], [ -126.1370954, 54.484769 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17068555, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 10034.027508687301, "blue_line_key": 360875378, "length_metre": 233.74342354746099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5581295, 54.5532364 ], [ -126.558285700000013, 54.5532393 ], [ -126.558469399999979, 54.553262 ], [ -126.5585744, 54.5532991 ], [ -126.5586475, 54.5534002 ], [ -126.5587172, 54.5535184 ], [ -126.5587741, 54.5535739 ], [ -126.5589278, 54.553612400000013 ], [ -126.559299599999974, 54.5536024 ], [ -126.559422399999988, 54.5536309 ], [ -126.5594276, 54.5537933 ], [ -126.5596141, 54.5540211 ], [ -126.5598044, 54.5542234 ], [ -126.559964900000011, 54.5543701 ], [ -126.560023799999982, 54.55443420000001 ], [ -126.5601534, 54.5545994 ], [ -126.5601783, 54.554662 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17090664, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 182319.64004733, "blue_line_key": 360873822, "length_metre": 243.929319799864, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.603806699999978, 54.4255332 ], [ -126.6043163, 54.4256586 ], [ -126.6055467, 54.4256685 ], [ -126.6060668, 54.425735499999988 ], [ -126.6066513, 54.4259833 ], [ -126.60707810000001, 54.4263251 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17093595, "stream_order": 5, "gnis_name": "Bulkley River", "downstream_route_measure": 263743.73025518301, "blue_line_key": 360873822, "length_metre": 36.133438522785603, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.054991199999975, 54.3947447 ], [ -126.054973499999974, 54.3947532 ], [ -126.0547681, 54.3948472 ], [ -126.0545756, 54.3949597 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17106541, "stream_order": 4, "gnis_name": "Buck Creek", "downstream_route_measure": 62948.901576716496, "blue_line_key": 360886221, "length_metre": 135.73975514851099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.372697699999989, 54.1791213 ], [ -126.370620699999989, 54.1790175 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17105408, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 39829.783779816004, "blue_line_key": 360886221, "length_metre": 628.98759417365795, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5627784, 54.1968608 ], [ -126.562744900000013, 54.1968864 ], [ -126.5626494, 54.1969562 ], [ -126.562600300000014, 54.1970189 ], [ -126.5626267, 54.1970815 ], [ -126.5626854, 54.1971285 ], [ -126.5627903, 54.1971485 ], [ -126.5628671, 54.1971584 ], [ -126.562975, 54.1971698 ], [ -126.563112800000013, 54.1971727 ], [ -126.563264, 54.1971855 ], [ -126.5634011, 54.1971969 ], [ -126.5635102, 54.1971983 ], [ -126.563631599999979, 54.1972197 ], [ -126.563688500000012, 54.1972923 ], [ -126.5636833, 54.197382 ], [ -126.563615899999988, 54.1974618 ], [ -126.5634736, 54.1975401 ], [ -126.563362799999979, 54.1975914 ], [ -126.563219300000014, 54.1976868 ], [ -126.5631847, 54.1977495 ], [ -126.563225399999979, 54.1978677 ], [ -126.5632981, 54.1979232 ], [ -126.563356700000014, 54.1979773 ], [ -126.563368, 54.1980414 ], [ -126.5633621, 54.1981126 ], [ -126.563357, 54.1982294 ], [ -126.563212299999989, 54.1983348 ], [ -126.5631337, 54.1983505 ], [ -126.5630125, 54.1983491 ], [ -126.562892299999987, 54.1983106 ], [ -126.5627409, 54.1982707 ], [ -126.5626043, 54.1982237 ], [ -126.5625017, 54.1981767 ], [ -126.562396799999988, 54.1981297 ], [ -126.5623059, 54.1981183 ], [ -126.562213899999989, 54.1981169 ], [ -126.562105300000013, 54.1981141 ], [ -126.5620005, 54.1980941 ], [ -126.561880300000013, 54.1980557 ], [ -126.561775899999986, 54.1980001 ], [ -126.561733, 54.197936 ], [ -126.5617235, 54.1978193 ], [ -126.5616982, 54.1977466 ], [ -126.561626100000012, 54.1976825 ], [ -126.561490599999985, 54.1976256 ], [ -126.5613259, 54.1975686 ], [ -126.561218599999989, 54.1975487 ], [ -126.5611283, 54.1975287 ], [ -126.560964099999978, 54.1974703 ], [ -126.5608281, 54.1974148 ], [ -126.5607577, 54.1973322 ], [ -126.5607317, 54.197241 ], [ -126.5607668, 54.1971428 ], [ -126.5608482, 54.1970644 ], [ -126.560991199999989, 54.196977499999988 ], [ -126.5610709, 54.1969519 ], [ -126.5612263, 54.1969192 ], [ -126.561380899999989, 54.1968949 ], [ -126.561504, 54.1968707 ], [ -126.5615996, 54.196828 ], [ -126.5616487, 54.1967653 ], [ -126.561713599999976, 54.1966856 ], [ -126.5617862, 54.1965161 ], [ -126.5618049, 54.1964364 ], [ -126.5617989, 54.1963096 ], [ -126.5617291, 54.1961914 ], [ -126.561642299999988, 54.1961002 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091810, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 272114.34835146699, "blue_line_key": 360873822, "length_metre": 782.68406957774403, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.105362, 54.4159241 ], [ -126.1056862, 54.4159141 ], [ -126.105874899999989, 54.4158728 ], [ -126.106025599999981, 54.4157062 ], [ -126.106154800000013, 54.4156193 ], [ -126.1063588, 54.415569499999989 ], [ -126.1064655, 54.4155723 ], [ -126.1068431, 54.415672 ], [ -126.107158899999988, 54.4158144 ], [ -126.107331800000011, 54.4159797 ], [ -126.1073913, 54.4162146 ], [ -126.1074093, 54.4163955 ], [ -126.1074529, 54.4164511 ], [ -126.107752, 54.416565 ], [ -126.1081069, 54.416565 ], [ -126.108512, 54.4165208 ], [ -126.1088527, 54.4164924 ], [ -126.1089759, 54.4164696 ], [ -126.109298299999978, 54.4165123 ], [ -126.1093725, 54.4165508 ], [ -126.1093695, 54.4165864 ], [ -126.109414399999977, 54.4168214 ], [ -126.1094328, 54.4170008 ], [ -126.1094655, 54.4172087 ], [ -126.109493699999987, 54.4172458 ], [ -126.109569099999987, 54.4172743 ], [ -126.1098756, 54.4172728 ], [ -126.1100256, 54.4171147 ], [ -126.1101346, 54.4169011 ], [ -126.110244099999989, 54.4166519 ], [ -126.1103532, 54.4166277 ], [ -126.1108018, 54.416612 ], [ -126.1112038, 54.4166035 ], [ -126.1115574, 54.4165935 ], [ -126.1119595, 54.4165849 ], [ -126.1123273, 54.4166035 ], [ -126.1127109, 54.4166391 ], [ -126.113015, 54.4166917 ], [ -126.113303800000011, 54.4167801 ], [ -126.113361399999988, 54.4168171 ], [ -126.1134712, 54.4170079 ], [ -126.1134879, 54.4172059 ], [ -126.1134868, 54.4172429 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17094848, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 2656.8264974652202, "blue_line_key": 360881038, "length_metre": 632.84462259571399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1432461, 54.3723931 ], [ -126.1434175, 54.3723518 ], [ -126.1436821, 54.3723234 ], [ -126.143901199999988, 54.372265 ], [ -126.144145400000014, 54.3723063 ], [ -126.1444045, 54.3723404 ], [ -126.1446316, 54.3723817 ], [ -126.1448905, 54.3724231 ], [ -126.1451501, 54.3724558 ], [ -126.145414599999981, 54.3724273 ], [ -126.1456497, 54.3723789 ], [ -126.145854199999974, 54.3723205 ], [ -126.1460569, 54.3722536 ], [ -126.1462038, 54.3721582 ], [ -126.1464089, 54.3720912 ], [ -126.1465166, 54.3720841 ], [ -126.14665, 54.3721411 ], [ -126.1467327, 54.3722778 ], [ -126.146751599999973, 54.3724487 ], [ -126.1468527, 54.3725683 ], [ -126.147146, 54.3727649 ], [ -126.147198, 54.3729187 ], [ -126.147265300000015, 54.3730639 ], [ -126.1474587, 54.3731579 ], [ -126.1477025, 54.3732007 ], [ -126.147929, 54.3732505 ], [ -126.1481279, 54.3732819 ], [ -126.1482038, 54.3732747 ], [ -126.1483208, 54.3731608 ], [ -126.1483918, 54.3730184 ], [ -126.1484188, 54.3728489 ], [ -126.1483857, 54.3726766 ], [ -126.148334299999988, 54.3725142 ], [ -126.148235699999987, 54.3723946 ], [ -126.1481353, 54.3722664 ], [ -126.148037300000013, 54.3721382 ], [ -126.148019600000012, 54.3719573 ], [ -126.14815, 54.3718534 ], [ -126.148398, 54.3718235 ], [ -126.1486906, 54.3718121 ], [ -126.1487989, 54.3718235 ], [ -126.1488125, 54.3718334 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17104564, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 23372.5135602667, "blue_line_key": 360877225, "length_metre": 759.87574602570305, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2792289, 54.2133531 ], [ -126.2793706, 54.2133118 ], [ -126.2794829, 54.2132506 ], [ -126.27972050000001, 54.2131395 ], [ -126.2798121, 54.2131153 ], [ -126.2799211, 54.2131167 ], [ -126.2802108, 54.2131238 ], [ -126.2804401, 54.2131295 ], [ -126.2805505, 54.2131138 ], [ -126.280677, 54.213054 ], [ -126.2807577, 54.2129657 ], [ -126.2808612, 54.2128148 ], [ -126.2810657, 54.2127208 ], [ -126.2812518, 54.212698 ], [ -126.2814506, 54.2126937 ], [ -126.2817432, 54.2126994 ], [ -126.281882400000015, 54.2126852 ], [ -126.282008100000013, 54.2126339 ], [ -126.2820888, 54.2125726 ], [ -126.282139, 54.2125014 ], [ -126.282269199999988, 54.2123975 ], [ -126.282395, 54.2123462 ], [ -126.2825188, 54.2123405 ], [ -126.282809, 54.2123462 ], [ -126.2830827, 54.2123704 ], [ -126.28315760000001, 54.2123989 ], [ -126.2832314, 54.2124373 ], [ -126.2834706, 54.2125499 ], [ -126.283752, 54.2127008 ], [ -126.283840799999979, 54.2127378 ], [ -126.2840542, 54.2127606 ], [ -126.284283500000015, 54.2127663 ], [ -126.284532399999975, 54.212745 ], [ -126.2847782, 54.2127051 ], [ -126.285121800000013, 54.2126239 ], [ -126.2853105, 54.212547 ], [ -126.2854718, 54.2124245 ], [ -126.2857143, 54.2122593 ], [ -126.2860103, 54.2121753 ], [ -126.286257299999988, 54.2121724 ], [ -126.2864554, 54.2121767 ], [ -126.2865761, 54.2122066 ], [ -126.286888499999975, 54.2123391 ], [ -126.2871781, 54.2124003 ], [ -126.287298799999988, 54.2124032 ], [ -126.287409299999979, 54.2123604 ], [ -126.2875756, 54.2121838 ], [ -126.287653100000014, 54.2121582 ], [ -126.2878684, 54.2121553 ], [ -126.288066500000014, 54.2121867 ], [ -126.2882939, 54.212191 ], [ -126.2884812, 54.2121781 ], [ -126.2887289, 54.2121197 ], [ -126.2888236, 54.212087 ], [ -126.2889683, 54.2119901 ], [ -126.289035, 54.2119204 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092489, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 18121.332627383599, "blue_line_key": 360862508, "length_metre": 11.860898052418399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.345859499999975, 54.4079158 ], [ -126.346025, 54.407870200000012 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17105731, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 43152.839115793198, "blue_line_key": 360886221, "length_metre": 100.038391105671, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5441269, 54.1918148 ], [ -126.5440806, 54.1917877 ], [ -126.5439029, 54.1916852 ], [ -126.543740599999978, 54.1915741 ], [ -126.54355, 54.191426 ], [ -126.5434773, 54.1913704 ], [ -126.5432997, 54.1912679 ], [ -126.5431655, 54.1911938 ], [ -126.543091599999983, 54.1911554 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17082065, "stream_order": 5, "gnis_name": "Ailport Creek", "downstream_route_measure": 8761.1297969998395, "blue_line_key": 360878058, "length_metre": 123.831907599567, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.167316099999979, 54.4867401 ], [ -126.167039100000011, 54.4867329 ], [ -126.1669795, 54.4867144 ], [ -126.1666428, 54.4866617 ], [ -126.1663551, 54.486582 ], [ -126.1660258, 54.4864125 ], [ -126.1659715, 54.486331299999982 ], [ -126.1658442, 54.4861661 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17090716, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 11327.161953020201, "blue_line_key": 360846413, "length_metre": 323.42100937363898, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2904323, 54.4284922 ], [ -126.287905599999974, 54.4259924 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17057264, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 17478.381567036999, "blue_line_key": 360856488, "length_metre": 174.704765180463, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.505707099999981, 54.6141612 ], [ -126.505718, 54.6142153 ], [ -126.5056831, 54.6142951 ], [ -126.5055871, 54.6143378 ], [ -126.5054804, 54.6143264 ], [ -126.505298399999987, 54.6142695 ], [ -126.505204, 54.6142937 ], [ -126.5051681, 54.6143478 ], [ -126.505189699999988, 54.6144916 ], [ -126.5052635, 54.6145557 ], [ -126.5054431, 54.6146768 ], [ -126.50547060000001, 54.6147395 ], [ -126.505464699999976, 54.6148206 ], [ -126.505431300000012, 54.6148748 ], [ -126.5054259, 54.6149545 ], [ -126.5055863, 54.6151026 ], [ -126.5055518, 54.6151738 ], [ -126.50539, 54.6152864 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17093621, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 166030.426299618, "blue_line_key": 360873822, "length_metre": 4299.5418385912599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.7407, 54.4074088 ], [ -126.740712299999984, 54.406708 ], [ -126.7410053, 54.4058393 ], [ -126.7410316, 54.4054305 ], [ -126.7407112, 54.4047298 ], [ -126.7400748, 54.4043837 ], [ -126.7395685, 54.4042912 ], [ -126.738686699999988, 54.4042513 ], [ -126.7383821, 54.4043396 ], [ -126.7381273, 54.4045034 ], [ -126.7379274, 54.4048267 ], [ -126.738169399999975, 54.4053579 ], [ -126.738162499999973, 54.4055972 ], [ -126.738022500000014, 54.405825 ], [ -126.737886300000014, 54.4059219 ], [ -126.737102600000014, 54.4059945 ], [ -126.736301, 54.4059774 ], [ -126.735526600000014, 54.4058393 ], [ -126.7350286, 54.4055459 ], [ -126.7345893, 54.4050901 ], [ -126.7342393, 54.4038667 ], [ -126.733332, 54.4028684 ], [ -126.7332739, 54.402612 ], [ -126.733311500000013, 54.4020651 ], [ -126.7335551, 54.4015168 ], [ -126.7337008, 54.4009471 ], [ -126.7336321, 54.4006509 ], [ -126.733362500000013, 54.4004686 ], [ -126.733081899999974, 54.4003532 ], [ -126.732647, 54.4002948 ], [ -126.731893, 54.4002963 ], [ -126.7314661, 54.4003703 ], [ -126.731128099999978, 54.400527 ], [ -126.7305333, 54.4009941 ], [ -126.729925099999988, 54.4013445 ], [ -126.7293991, 54.4015353 ], [ -126.7289232, 54.4016307 ], [ -126.7281793, 54.4016806 ], [ -126.727185499999976, 54.4016749 ], [ -126.726458499999978, 54.4016122 ], [ -126.725757699999974, 54.401467 ], [ -126.7252747, 54.4013003 ], [ -126.7248052, 54.401024 ], [ -126.7243248, 54.400433 ], [ -126.724315499999989, 54.4000926 ], [ -126.7247812, 54.3994189 ], [ -126.724841, 54.3992039 ], [ -126.724648300000013, 54.3988421 ], [ -126.7245443, 54.3987467 ], [ -126.724160200000014, 54.3985772 ], [ -126.7228867, 54.3983622 ], [ -126.7218401, 54.3983608 ], [ -126.7211096, 54.3985274 ], [ -126.720677099999989, 54.3986883 ], [ -126.7203024, 54.3989789 ], [ -126.7197007, 54.3992537 ], [ -126.7193643, 54.3993349 ], [ -126.71897, 54.3993292 ], [ -126.7186707, 54.3992609 ], [ -126.7178724, 54.3988464 ], [ -126.7168401, 54.3979848 ], [ -126.7162247, 54.397643 ], [ -126.7154482, 54.3974763 ], [ -126.7136576, 54.3974265 ], [ -126.7127192, 54.3972541 ], [ -126.7121582, 54.3970448 ], [ -126.7108329, 54.3966902 ], [ -126.709850599999982, 54.396327 ], [ -126.7094477, 54.3961062 ], [ -126.709179, 54.3958371 ], [ -126.709125, 54.3955978 ], [ -126.709274099999988, 54.3953443 ], [ -126.709724, 54.3952531 ], [ -126.7111545, 54.3952973 ], [ -126.711644099999987, 54.395162 ], [ -126.7121126, 54.3949327 ], [ -126.7123246, 54.3947589 ], [ -126.7125638, 54.3943231 ], [ -126.7125236, 54.3940297 ], [ -126.7122023, 54.3936936 ], [ -126.7115906, 54.3932991 ], [ -126.710521, 54.3927793 ], [ -126.709722, 54.3925087 ], [ -126.7093264, 54.3924503 ], [ -126.7088635, 54.3924731 ], [ -126.7080777, 54.3927921 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17094887, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 5209.7827329820802, "blue_line_key": 360886524, "length_metre": 353.55960369033602, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.195397799999981, 54.3717921 ], [ -126.19558379999998, 54.3717779 ], [ -126.1958311, 54.3717565 ], [ -126.196036100000015, 54.3716896 ], [ -126.196301099999985, 54.3716326 ], [ -126.1963177, 54.371634 ], [ -126.196483, 54.371691 ], [ -126.196551199999988, 54.3718277 ], [ -126.1966652, 54.3719388 ], [ -126.1968611, 54.3720058 ], [ -126.197081499999982, 54.3719573 ], [ -126.197237499999986, 54.3719246 ], [ -126.197343499999974, 54.371936 ], [ -126.197524699999974, 54.3720029 ], [ -126.1976466, 54.3719972 ], [ -126.1977556, 54.3720001 ], [ -126.1978822, 54.3719403 ], [ -126.1981821, 54.3718477 ], [ -126.1982818, 54.3717337 ], [ -126.198412600000012, 54.3716283 ], [ -126.1985441, 54.3715144 ], [ -126.1986585, 54.3714005 ], [ -126.1988629, 54.3713421 ], [ -126.1991408, 54.3713307 ], [ -126.1993881, 54.3713093 ], [ -126.1995925, 54.3712509 ], [ -126.1997675, 54.3711655 ], [ -126.1997686, 54.3711555 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17065373, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 3028.2288079282798, "blue_line_key": 360851751, "length_metre": 256.18721527429, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1936241, 54.5732935 ], [ -126.192313899999974, 54.5722311 ], [ -126.1908653, 54.5717013 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17060278, "stream_order": 4, "gnis_name": "Richfield Creek", "downstream_route_measure": 19491.3123294414, "blue_line_key": 360788426, "length_metre": 452.19336549496398, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1822381, 54.5984159 ], [ -126.178013099999987, 54.5979594 ], [ -126.175783, 54.5983444 ], [ -126.1754153, 54.5982699 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101781, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 27335.4123327499, "blue_line_key": 360881038, "length_metre": 158.73838924502499, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.070251, 54.2506104 ], [ -126.0704759, 54.2504623 ], [ -126.070760399999983, 54.250371199999982 ], [ -126.070881299999982, 54.250374 ], [ -126.070992, 54.2503313 ], [ -126.071027199999975, 54.2502686 ], [ -126.070998800000012, 54.250233 ], [ -126.070762699999989, 54.2501191 ], [ -126.070632800000013, 54.250008 ], [ -126.0705931, 54.2499168 ], [ -126.0705958, 54.2498627 ], [ -126.070709900000011, 54.2497844 ], [ -126.0707564, 54.2497773 ], [ -126.070804099999989, 54.2497602 ], [ -126.070850600000014, 54.2497531 ], [ -126.0709766, 54.2497018 ], [ -126.0710092, 54.2496662 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17102101, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 373.57463768706998, "blue_line_key": 360871884, "length_metre": 771.30935773559304, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0749618, 54.2463193 ], [ -126.07511430000001, 54.2463221 ], [ -126.0754325, 54.2463848 ], [ -126.075571, 54.2464062 ], [ -126.0758727, 54.2464674 ], [ -126.0761591, 54.2465372 ], [ -126.0764633, 54.2465984 ], [ -126.0768299, 54.2466155 ], [ -126.076938, 54.2465998 ], [ -126.0769852, 54.2465842 ], [ -126.077094, 54.24656 ], [ -126.0773773, 54.2464589 ], [ -126.077490599999976, 54.2463891 ], [ -126.077557, 54.246327799999989 ], [ -126.0777655, 54.2461712 ], [ -126.07778279999998, 54.2461441 ], [ -126.0779633, 54.2459775 ], [ -126.078205399999987, 54.2458222 ], [ -126.0784774, 54.2456855 ], [ -126.078732300000013, 54.2455289 ], [ -126.07878, 54.2455118 ], [ -126.0788451, 54.245460500000014 ], [ -126.0790049, 54.2453836 ], [ -126.079257, 54.245281 ], [ -126.0795249, 54.2451885 ], [ -126.079839299999989, 54.2450888 ], [ -126.080042799999987, 54.2450389 ], [ -126.08034, 54.2449663 ], [ -126.080403, 54.2449406 ], [ -126.080572300000014, 54.2449179 ], [ -126.080896399999986, 54.2448979 ], [ -126.081216599999976, 54.2449421 ], [ -126.0812751, 54.244962 ], [ -126.0816256, 54.2450233 ], [ -126.0819407, 54.2450945 ], [ -126.0822569, 54.2451828 ], [ -126.08254380000001, 54.245271100000011 ], [ -126.0826765, 54.245328 ], [ -126.0829608, 54.2454434 ], [ -126.0832286, 54.2455573 ], [ -126.0835446, 54.2456727 ], [ -126.0838596, 54.245771 ], [ -126.0841923, 54.2458407 ], [ -126.0844947, 54.2458934 ], [ -126.0848017, 54.2459006 ], [ -126.0851286, 54.2458464 ], [ -126.0851605, 54.2458194 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104404, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 6033.2330547425399, "blue_line_key": 360882583, "length_metre": 202.63233379056999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.9803199, 54.2153911 ], [ -125.9801397, 54.2152331 ], [ -125.9800773, 54.2152174 ], [ -125.9799693, 54.2150223 ], [ -125.97987879999998, 54.2148257 ], [ -125.9798306, 54.2147916 ], [ -125.979636899999988, 54.2146434 ], [ -125.979320199999975, 54.2145252 ], [ -125.9792737, 54.2144996 ], [ -125.9792105, 54.2144925 ], [ -125.979116, 54.2144583 ], [ -125.979069899999985, 54.2144512 ], [ -125.979022699999987, 54.2144341 ], [ -125.978962, 54.214427 ], [ -125.9786491, 54.2143444 ], [ -125.978599, 54.2143088 ], [ -125.978538500000013, 54.2141037 ], [ -125.9785212, 54.214078 ], [ -125.97852, 54.2140681 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076186, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 207633.674101938, "blue_line_key": 360873822, "length_metre": 108.035949288678, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4437907, 54.514149 ], [ -126.4434347, 54.5140934 ], [ -126.442136499999989, 54.5141646 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102169, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 13639.6615439128, "blue_line_key": 360880905, "length_metre": 79.690979762086101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4177405, 54.243159 ], [ -126.417705899999987, 54.2432216 ], [ -126.417651699999979, 54.2433185 ], [ -126.4176353, 54.2433641 ], [ -126.4176, 54.2434082 ], [ -126.417566499999978, 54.243488 ], [ -126.4175441, 54.2435777 ], [ -126.4175704, 54.2436403 ], [ -126.4176139, 54.2436959 ], [ -126.4176103, 54.2437671 ], [ -126.4175749, 54.2438113 ], [ -126.4175433, 54.2438383 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091726, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 16873.5765768784, "blue_line_key": 360862508, "length_metre": 74.252651325665994, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.349485800000011, 54.416583 ], [ -126.3489135, 54.4160065 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17094713, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 2954.51013097027, "blue_line_key": 360886221, "length_metre": 2016.99740125828, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.636429299999975, 54.3863077 ], [ -126.63612280000001, 54.3862749 ], [ -126.6357703, 54.3862407 ], [ -126.635494599999987, 54.3862179 ], [ -126.6351274, 54.3861838 ], [ -126.635036499999984, 54.3861638 ], [ -126.6348999, 54.3861069 ], [ -126.634751199999982, 54.3860143 ], [ -126.6346819, 54.3859046 ], [ -126.6346894, 54.385770699999988 ], [ -126.634717, 54.3855728 ], [ -126.63472419999998, 54.3854118 ], [ -126.6347294, 54.3853478 ], [ -126.6347732, 54.3851242 ], [ -126.63479550000001, 54.3849903 ], [ -126.634836600000014, 54.3848023 ], [ -126.634830600000015, 54.3846584 ], [ -126.6348415, 54.3844519 ], [ -126.63483669999998, 54.3842625 ], [ -126.6348611, 54.3841016 ], [ -126.6348561, 54.3839478 ], [ -126.63486420000001, 54.3838053 ], [ -126.6348621, 54.3835803 ], [ -126.6348712, 54.3834279 ], [ -126.634876899999981, 54.3832926 ], [ -126.6349034, 54.3831046 ], [ -126.634909899999982, 54.3829878 ], [ -126.6349072, 54.3827714 ], [ -126.6349211, 54.3825563 ], [ -126.6349174, 54.3823498 ], [ -126.6349262, 54.3821703 ], [ -126.6349235, 54.3819539 ], [ -126.6349332, 54.3817929 ], [ -126.6349366, 54.3817203 ], [ -126.634929, 54.381595 ], [ -126.634918200000016, 54.3815138 ], [ -126.634900299999984, 54.3813058 ], [ -126.6349026, 54.3812432 ], [ -126.6348824, 54.3810908 ], [ -126.634802, 54.3808729 ], [ -126.6347778, 54.3807461 ], [ -126.634726500000014, 54.3805567 ], [ -126.6347221, 54.3803944 ], [ -126.6346254, 54.380195 ], [ -126.6344681, 54.3799942 ], [ -126.6343197, 54.379866 ], [ -126.6341466, 54.3796823 ], [ -126.6341035, 54.3796096 ], [ -126.6340678, 54.3794387 ], [ -126.633922899999973, 54.3793006 ], [ -126.6337332, 54.3791083 ], [ -126.633621, 54.3788904 ], [ -126.63357929999998, 54.3788348 ], [ -126.6332184, 54.3786568 ], [ -126.6330247, 54.3785813 ], [ -126.6329026, 54.3785529 ], [ -126.632687499999989, 54.3785386 ], [ -126.6325783, 54.3785642 ], [ -126.632264799999987, 54.3786568 ], [ -126.6321366, 54.3787437 ], [ -126.6320048, 54.3788761 ], [ -126.6319717, 54.3789288 ], [ -126.631719100000012, 54.3790499 ], [ -126.6314867, 54.3790641 ], [ -126.6313636, 54.3790528 ], [ -126.6312889, 54.3790143 ], [ -126.6312473, 54.3789516 ], [ -126.6312383, 54.3788163 ], [ -126.631250099999988, 54.3786283 ], [ -126.6312438, 54.3784574 ], [ -126.6312827, 54.3783321 ], [ -126.63134860000001, 54.3782694 ], [ -126.631513, 54.3780928 ], [ -126.631575899999987, 54.3780316 ], [ -126.631787899999978, 54.3778379 ], [ -126.631823399999988, 54.3777852 ], [ -126.6319404, 54.3775901 ], [ -126.631976099999989, 54.3775089 ], [ -126.632016100000016, 54.3773665 ], [ -126.6320998, 54.3772597 ], [ -126.63216340000001, 54.3771899 ], [ -126.6322584, 54.3771557 ], [ -126.632541, 54.377088799999989 ], [ -126.6328353, 54.3770233 ], [ -126.632945599999985, 54.3769805 ], [ -126.633338599999988, 54.3768353 ], [ -126.6334673, 54.3767469 ], [ -126.633503399999981, 54.3766857 ], [ -126.6335051, 54.3766316 ], [ -126.6334933, 54.3765675 ], [ -126.633377, 54.3764664 ], [ -126.6333019, 54.3764294 ], [ -126.6329241, 54.376314 ], [ -126.6326216, 54.3762001 ], [ -126.632321499999989, 54.3760861 ], [ -126.632067, 54.3759465 ], [ -126.631725, 54.3757429 ], [ -126.6314446, 54.3755307 ], [ -126.631203199999973, 54.3754167 ], [ -126.6311281, 54.3753797 ], [ -126.6310554, 54.3753427 ], [ -126.630720900000014, 54.3752644 ], [ -126.6304504, 54.3751148 ], [ -126.6304082, 54.3750607 ], [ -126.6303969, 54.3749881 ], [ -126.6302704, 54.3747972 ], [ -126.630174899999986, 54.3745879 ], [ -126.630162500000012, 54.3745252 ], [ -126.6301271, 54.3743258 ], [ -126.6301342, 54.3742005 ], [ -126.630129, 54.374012500000013 ], [ -126.6301542, 54.3738772 ], [ -126.6301723, 54.3737974 ], [ -126.6302064, 54.3737348 ], [ -126.6303249, 54.3735567 ], [ -126.6303497, 54.3734229 ], [ -126.630344600000015, 54.3732064 ], [ -126.6303817, 54.3731352 ], [ -126.630464199999977, 54.3730113 ], [ -126.63061, 54.3729158 ], [ -126.6308967, 54.3727321 ], [ -126.6310117, 54.3726267 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17077107, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 205661.320691937, "blue_line_key": 360873822, "length_metre": 313.42506170365698, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.468366299999985, 54.5094078 ], [ -126.468270599999983, 54.5099205 ], [ -126.4680699, 54.5101512 ], [ -126.4676708, 54.510296499999988 ], [ -126.4671846, 54.5102908 ], [ -126.466285099999979, 54.5106184 ], [ -126.465868, 54.5108434 ], [ -126.46536540000001, 54.511292 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17089095, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 276868.01203413401, "blue_line_key": 360873822, "length_metre": 714.96161040549396, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1425974, 54.4404034 ], [ -126.142511399999989, 54.4405544 ], [ -126.1423167, 54.440694 ], [ -126.1420754, 54.4408136 ], [ -126.1418064, 54.4409147 ], [ -126.141397, 54.441031499999987 ], [ -126.1410043, 54.4411568 ], [ -126.1407205, 54.4412309 ], [ -126.140297, 54.4413462 ], [ -126.139945399999988, 54.4415001 ], [ -126.13973, 54.4417108 ], [ -126.139747699999987, 54.441927299999989 ], [ -126.1400602, 54.4420598 ], [ -126.1403829, 54.442095400000014 ], [ -126.1407951, 54.442141 ], [ -126.1408582, 54.4423674 ], [ -126.140781499999989, 54.442581 ], [ -126.1406298, 54.4427576 ], [ -126.1403856, 54.4429399 ], [ -126.1402369, 54.4430809 ], [ -126.140221, 54.443098 ], [ -126.1399985, 54.44339 ], [ -126.1400434, 54.4436606 ], [ -126.1401842, 54.4438343 ], [ -126.1404295, 54.44406510000001 ], [ -126.1404796, 54.444245900000013 ], [ -126.140602799999982, 54.4444553 ], [ -126.14064350000001, 54.4445464 ], [ -126.140699, 54.4446376 ], [ -126.1408334, 54.444911 ], [ -126.1409396, 54.4451745 ], [ -126.140949599999985, 54.4452557 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17087732, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 191094.88540733699, "blue_line_key": 360873822, "length_metre": 366.53416592857798, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.544555, 54.4504783 ], [ -126.5443835, 54.4508642 ], [ -126.544145, 54.4510351 ], [ -126.5428597, 54.4514467 ], [ -126.5421818, 54.4520762 ], [ -126.5419001, 54.4522514 ], [ -126.5411625, 54.4525818 ], [ -126.540678, 54.4526644 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17051901, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1998.3644155792001, "blue_line_key": 360851779, "length_metre": 104.885664344082, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5258653, 54.6490045 ], [ -126.5258552, 54.6491484 ], [ -126.525861400000011, 54.6493022 ], [ -126.5258357, 54.6494987 ], [ -126.5257317, 54.6496582 ], [ -126.525634900000014, 54.6497465 ], [ -126.5254707, 54.6498875 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092498, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 10365.8104070217, "blue_line_key": 360862508, "length_metre": 178.945397331273, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4341715, 54.40751980000001 ], [ -126.434064299999974, 54.4075184 ], [ -126.4338469, 54.4075312 ], [ -126.433768, 54.407546900000014 ], [ -126.433592899999979, 54.4076338 ], [ -126.4333665, 54.4078175 ], [ -126.433241299999978, 54.4078602 ], [ -126.4330876, 54.4078659 ], [ -126.4329943, 54.407846 ], [ -126.4328076, 54.4078688 ], [ -126.4325056, 54.408024 ], [ -126.432427499999989, 54.4080582 ], [ -126.4322874, 54.4080739 ], [ -126.432007599999977, 54.4081038 ], [ -126.4317924, 54.4080895 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17105880, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 9936.8652578004003, "blue_line_key": 360882583, "length_metre": 19.913104235150598, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.9570897, 54.1900331 ], [ -125.9572071, 54.1899662 ], [ -125.957344, 54.189944800000013 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17075844, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 0.0, "blue_line_key": 360856488, "length_metre": 134.85301572859899, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4419385, 54.5160702 ], [ -126.4417357, 54.5161101 ], [ -126.4415893, 54.516234 ], [ -126.4414078, 54.5164092 ], [ -126.4413006, 54.5166314 ], [ -126.4412821, 54.5167126 ], [ -126.441262599999988, 54.5167752 ], [ -126.44124260000001, 54.5168464 ], [ -126.4412231, 54.5169091 ], [ -126.441213100000013, 54.517043 ], [ -126.4411957, 54.5170786 ], [ -126.441177400000015, 54.5171242 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091221, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1229.8056010308501, "blue_line_key": 360841027, "length_metre": 422.36467715002402, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0797954, 54.4220781 ], [ -126.0796746, 54.4220397 ], [ -126.0793497, 54.4220582 ], [ -126.07904139999998, 54.4220781 ], [ -126.07867, 54.4220966 ], [ -126.0782795, 54.4221678 ], [ -126.0782157, 54.422175 ], [ -126.0778437, 54.422202 ], [ -126.077489399999976, 54.4222205 ], [ -126.077412099999989, 54.4222177 ], [ -126.0768377, 54.422249 ], [ -126.0765134, 54.422259 ], [ -126.0760973, 54.422286 ], [ -126.0757417, 54.4222946 ], [ -126.0754923, 54.4223074 ], [ -126.0751214, 54.4223245 ], [ -126.0747499, 54.422343 ], [ -126.074425, 54.4223615 ], [ -126.0741174, 54.4223729 ], [ -126.073698, 54.4223886 ], [ -126.073653299999975, 54.4223971 ], [ -126.073590200000012, 54.422395699999981 ], [ -126.0735602, 54.422404300000011 ], [ -126.0733413, 54.4224342 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091106, "stream_order": 4, "gnis_name": "McKilligan Creek", "downstream_route_measure": 18.631064388634599, "blue_line_key": 360770255, "length_metre": 3015.4469136634898, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5892858, 54.4355839 ], [ -126.5891648, 54.4355725 ], [ -126.589073, 54.435534 ], [ -126.588843399999988, 54.435511299999988 ], [ -126.5885505, 54.4355155 ], [ -126.5883031, 54.43553690000001 ], [ -126.5879313, 54.4355568 ], [ -126.5875925, 54.4355312 ], [ -126.587488900000011, 54.4354842 ], [ -126.5872841, 54.4352919 ], [ -126.5871483, 54.4352179 ], [ -126.5870573, 54.4351979 ], [ -126.5867861, 54.435084 ], [ -126.58666479999998, 54.4350455 ], [ -126.5863908, 54.4349957 ], [ -126.5862391, 54.4349743 ], [ -126.585979199999983, 54.434933 ], [ -126.5856268, 54.4348903 ], [ -126.5853822, 54.4348405 ], [ -126.585291200000015, 54.4348205 ], [ -126.5849251, 54.4347678 ], [ -126.5847699, 54.4347564 ], [ -126.5844347, 54.4347137 ], [ -126.5841267, 54.434698 ], [ -126.5838951, 54.4347023 ], [ -126.583649200000011, 54.434698 ], [ -126.5833407, 54.4346909 ], [ -126.5829728, 54.4346297 ], [ -126.5828368, 54.4345912 ], [ -126.582549300000011, 54.4344958 ], [ -126.5824436, 54.4344759 ], [ -126.5822889, 54.434463 ], [ -126.5819824, 54.4344573 ], [ -126.5816739, 54.4344431 ], [ -126.5815672, 54.4344403 ], [ -126.5812577, 54.4344431 ], [ -126.580935599999989, 54.4344189 ], [ -126.5806736, 54.4344046 ], [ -126.580459299999987, 54.4343733 ], [ -126.580352499999989, 54.4343705 ], [ -126.579966, 54.4343904 ], [ -126.5797496, 54.4343861 ], [ -126.579579699999982, 54.4343819 ], [ -126.579457800000014, 54.4343804 ], [ -126.5792261, 54.4343847 ], [ -126.578996, 54.4343705 ], [ -126.5786107, 54.4343448 ], [ -126.5782734, 54.4343292 ], [ -126.577903099999986, 54.4343306 ], [ -126.577626, 54.4343249 ], [ -126.5774858, 54.4343406 ], [ -126.577144300000015, 54.434379 ], [ -126.577019899999982, 54.4343847 ], [ -126.5766486, 54.4343961 ], [ -126.576387, 54.4344089 ], [ -126.5761554, 54.4344132 ], [ -126.575892900000014, 54.4344075 ], [ -126.575600499999979, 54.4344103 ], [ -126.575230799999986, 54.4344032 ], [ -126.5749379, 54.4344146 ], [ -126.57462839999998, 54.4344175 ], [ -126.574350200000012, 54.4344217 ], [ -126.5740108, 54.4344331 ], [ -126.573670399999983, 54.434426 ], [ -126.5733954, 54.4343933 ], [ -126.5730874, 54.4343776 ], [ -126.5727338, 54.4343804 ], [ -126.572456699999989, 54.4343747 ], [ -126.5721032, 54.4343491 ], [ -126.571979899999988, 54.4343377 ], [ -126.5718418, 54.4343263 ], [ -126.571810500000012, 54.4343249 ], [ -126.571766399999987, 54.4343249 ], [ -126.5717498, 54.4343235 ], [ -126.5717179, 54.4343235 ], [ -126.57150390000001, 54.4343192 ], [ -126.5711353, 54.4343021 ], [ -126.570767300000014, 54.4342409 ], [ -126.5705712, 54.4341924 ], [ -126.5702101, 54.4340415 ], [ -126.5699828, 54.433956 ], [ -126.569744500000013, 54.433825 ], [ -126.5694788, 54.4336042 ], [ -126.5693796, 54.4334675 ], [ -126.5693274, 54.4333223 ], [ -126.569304199999976, 54.4331784 ], [ -126.569317, 54.4329804 ], [ -126.5693235, 54.4328637 ], [ -126.5693463, 54.4327212 ], [ -126.5693852, 54.4325959 ], [ -126.569506300000015, 54.4323823 ], [ -126.5696363, 54.4322413 ], [ -126.5698174, 54.4320732 ], [ -126.5698657, 54.432012 ], [ -126.5698904, 54.4318781 ], [ -126.569930500000012, 54.4317072 ], [ -126.5699055, 54.4316175 ], [ -126.569836599999988, 54.4314993 ], [ -126.5697521, 54.4313625 ], [ -126.5696369, 54.4312158 ], [ -126.5694322, 54.4310236 ], [ -126.569282899999976, 54.4309395 ], [ -126.5689652, 54.4308256 ], [ -126.568663199999989, 54.4307017 ], [ -126.5685899, 54.4306732 ], [ -126.5683963, 54.4305265 ], [ -126.568283, 54.4303884 ], [ -126.5682711, 54.4303172 ], [ -126.568236899999988, 54.4301277 ], [ -126.568139, 54.4299454 ], [ -126.568028399999989, 54.4297361 ], [ -126.567944, 54.4295994 ], [ -126.5678259, 54.42951679999998 ], [ -126.5677346, 54.4294698 ], [ -126.567629, 54.4294498 ], [ -126.5672955, 54.429353 ], [ -126.566996300000014, 54.4291935 ], [ -126.5668516, 54.4290468 ], [ -126.566632, 54.4288274 ], [ -126.56647550000001, 54.4286167 ], [ -126.5663003, 54.4284244 ], [ -126.566290900000013, 54.4283532 ], [ -126.566270800000012, 54.4281723 ], [ -126.5662908, 54.4281011 ], [ -126.5663738, 54.4279686 ], [ -126.5664095, 54.4278875 ], [ -126.566437600000015, 54.427681 ], [ -126.5664174, 54.4275286 ], [ -126.5663216, 54.4273192 ], [ -126.5661165, 54.4271355 ], [ -126.5659871, 54.4269802 ], [ -126.5659466, 54.426872 ], [ -126.5658937, 54.4267082 ], [ -126.5659028, 54.4265558 ], [ -126.5658839, 54.4263579 ], [ -126.5658573, 54.426293799999989 ], [ -126.5656689, 54.4261115 ], [ -126.5656641, 54.4259221 ], [ -126.5656722, 54.4257868 ], [ -126.565681899999987, 54.4256258 ], [ -126.5656274, 54.4254805 ], [ -126.565524599999989, 54.4253894 ], [ -126.565334, 54.4252413 ], [ -126.5651407, 54.4251288 ], [ -126.564868599999983, 54.4250248 ], [ -126.5646181, 54.4248311 ], [ -126.5644217, 54.4247556 ], [ -126.5642518, 54.4247514 ], [ -126.564097, 54.424767 ], [ -126.563847, 54.424824 ], [ -126.563707400000013, 54.4248311 ], [ -126.5635389, 54.4248368 ], [ -126.5632923, 54.424814 ], [ -126.5631406, 54.4247927 ], [ -126.562819300000015, 54.4247314 ], [ -126.5625596, 54.4246901 ], [ -126.5624377, 54.4246887 ], [ -126.562254700000011, 54.4246659 ], [ -126.5619176, 54.4246146 ], [ -126.56182720000001, 54.4245861 ], [ -126.5615415, 54.4244722 ], [ -126.561206, 54.4244024 ], [ -126.561085899999981, 54.4243469 ], [ -126.5609397, 54.4242258 ], [ -126.5608088, 54.4240891 ], [ -126.560696299999989, 54.4239068 ], [ -126.5606011, 54.4236889 ], [ -126.560517499999989, 54.423508 ], [ -126.5604226, 54.4233172 ], [ -126.5603496, 54.4232531 ], [ -126.5602057, 54.4230694 ], [ -126.560059099999989, 54.4229497 ], [ -126.560001199999988, 54.422877100000015 ], [ -126.5598732, 54.4226763 ], [ -126.5598054, 54.422541 ], [ -126.5597697, 54.4223772 ], [ -126.559767099999988, 54.4221536 ], [ -126.5597768, 54.4219998 ], [ -126.5598115, 54.4219286 ], [ -126.5598326, 54.4218403 ], [ -126.5598507, 54.4217676 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17081532, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 8210.1647580307708, "blue_line_key": 360875052, "length_metre": 56.595478126897703, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.409818300000012, 54.4879073 ], [ -126.410054, 54.487419 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100167, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 8682.8366012954502, "blue_line_key": 360877225, "length_metre": 640.93944753289702, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.19659369999998, 54.2791872 ], [ -126.1966769, 54.2791259 ], [ -126.1967495, 54.2789394 ], [ -126.1967354, 54.2789109 ], [ -126.196726399999989, 54.2788482 ], [ -126.1966469, 54.2786574 ], [ -126.1966323, 54.278630299999989 ], [ -126.1966355, 54.2785947 ], [ -126.1966634, 54.2783967 ], [ -126.196697799999981, 54.2783355 ], [ -126.1967639, 54.2782743 ], [ -126.196891, 54.278213 ], [ -126.1972192, 54.2781489 ], [ -126.197363599999974, 54.2780535 ], [ -126.1974018, 54.2779282 ], [ -126.1971854, 54.2777445 ], [ -126.1968833, 54.2776562 ], [ -126.1968381, 54.2776462 ], [ -126.1967936, 54.2776277 ], [ -126.196746499999989, 54.2776163 ], [ -126.1966441, 54.2775422 ], [ -126.1966059, 54.2774525 ], [ -126.1966097, 54.2773884 ], [ -126.1966772, 54.277283 ], [ -126.1967114, 54.277256 ], [ -126.19675860000001, 54.2772403 ], [ -126.196823400000014, 54.2771961 ], [ -126.1969322, 54.2771449 ], [ -126.1970066, 54.2769668 ], [ -126.1970052, 54.2767689 ], [ -126.1969907, 54.2767418 ], [ -126.1969328, 54.2766863 ], [ -126.196699299999977, 54.2765097 ], [ -126.196566300000015, 54.2764527 ], [ -126.1965211, 54.2764427 ], [ -126.1962037, 54.276363 ], [ -126.196113399999973, 54.276316 ], [ -126.1960842, 54.2762889 ], [ -126.196039700000014, 54.2762704 ], [ -126.195983, 54.276204899999982 ], [ -126.1958806, 54.2761308 ], [ -126.195866, 54.2761038 ], [ -126.1958105, 54.2760482 ], [ -126.195761600000012, 54.2758403 ], [ -126.1958385, 54.2756352 ], [ -126.1958392, 54.2755996 ], [ -126.19588370000001, 54.2754031 ], [ -126.19577360000001, 54.2752293 ], [ -126.1957297, 54.2752023 ], [ -126.1956687, 54.2751823 ], [ -126.1953145, 54.2751837 ], [ -126.1952686, 54.2751823 ], [ -126.1949334, 54.275165200000011 ], [ -126.194712, 54.2750157 ], [ -126.1946974, 54.274988600000015 ], [ -126.194670699999989, 54.2749616 ], [ -126.19460260000001, 54.2748334 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17078882, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 204247.83836775701, "blue_line_key": 360873822, "length_metre": 0.24815287619766799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4775455, 54.4997516 ], [ -126.477542599999978, 54.4997531 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17083787, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 8370.5529701758005, "blue_line_key": 360875052, "length_metre": 1309.3169054581299, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4111274, 54.4867529 ], [ -126.411293500000014, 54.4865592 ], [ -126.4113308, 54.486488 ], [ -126.41142, 54.4862829 ], [ -126.4114905, 54.486159 ], [ -126.411610599999989, 54.4859639 ], [ -126.4117295, 54.4857858 ], [ -126.4118978, 54.4855651 ], [ -126.412033399999984, 54.4853885 ], [ -126.4121481, 54.4852646 ], [ -126.412358899999987, 54.485125 ], [ -126.4126496, 54.4849256 ], [ -126.41293730000001, 54.4847419 ], [ -126.413003499999974, 54.4846721 ], [ -126.413171, 54.4844955 ], [ -126.4133014, 54.484354499999988 ], [ -126.4134534, 54.484159399999989 ], [ -126.413621100000015, 54.4839472 ], [ -126.413694299999989, 54.4837877 ], [ -126.413768, 54.483564099999988 ], [ -126.4138883, 54.483396 ], [ -126.4140212, 54.483255 ], [ -126.4140863, 54.4832023 ], [ -126.4143111, 54.4830371 ], [ -126.4144418, 54.4829232 ], [ -126.414538799999988, 54.4828705 ], [ -126.414858400000014, 54.4826797 ], [ -126.4150368, 54.4825486 ], [ -126.4151697, 54.4824076 ], [ -126.415346500000012, 54.4822951 ], [ -126.4155726, 54.482147 ], [ -126.4157203, 54.482006 ], [ -126.4159177, 54.4818209 ], [ -126.4160707, 54.4816086 ], [ -126.4162207, 54.481405 ], [ -126.416368299999988, 54.481264 ], [ -126.4164664, 54.4811942 ], [ -126.416740799999985, 54.4810204 ], [ -126.416929599999975, 54.4809435 ], [ -126.4173252, 54.4808082 ], [ -126.4175861, 54.4805889 ], [ -126.417685, 54.480475 ], [ -126.4177697, 54.4803596 ], [ -126.4177933, 54.4802158 ], [ -126.4178488, 54.4800648 ], [ -126.41784, 54.4799922 ], [ -126.417754599999981, 54.4798654 ], [ -126.4176362, 54.4797629 ], [ -126.4175185, 54.4797073 ], [ -126.4171867, 54.479556400000014 ], [ -126.416932499999987, 54.479442400000011 ], [ -126.4166894, 54.4793741 ], [ -126.416384900000011, 54.4793057 ], [ -126.4162478, 54.4792843 ], [ -126.41604959999998, 54.4792345 ], [ -126.4158231, 54.4791675 ], [ -126.4156429, 54.4790736 ], [ -126.415417099999985, 54.4789696 ], [ -126.415284899999989, 54.4788856 ], [ -126.415091800000013, 54.4787374 ], [ -126.414811300000011, 54.4785523 ], [ -126.414667799999989, 54.4783956 ], [ -126.414428699999988, 54.478239 ], [ -126.414342, 54.4781649 ], [ -126.4142144, 54.4779911 ], [ -126.414104099999989, 54.4777818 ], [ -126.414022, 54.477618 ], [ -126.413920499999989, 54.4774813 ], [ -126.4137916, 54.4773531 ], [ -126.4137485, 54.4772805 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17051754, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 2103.2500799232798, "blue_line_key": 360851779, "length_metre": 451.58728866875703, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5254707, 54.6498875 ], [ -126.525382900000011, 54.650028500000012 ], [ -126.5252498, 54.6502151 ], [ -126.5251658, 54.6502948 ], [ -126.524924399999989, 54.6504601 ], [ -126.5248728, 54.6505313 ], [ -126.52486660000001, 54.650621 ], [ -126.5248877, 54.6508104 ], [ -126.5250613, 54.6509927 ], [ -126.525179299999976, 54.6511223 ], [ -126.5253382, 54.6513046 ], [ -126.525591100000014, 54.6514712 ], [ -126.5256942, 54.6515724 ], [ -126.525780499999982, 54.6516649 ], [ -126.52597, 54.6518658 ], [ -126.526114600000014, 54.6520395 ], [ -126.526291199999974, 54.6521776 ], [ -126.5265604, 54.6523543 ], [ -126.526634399999978, 54.6524183 ], [ -126.5268692, 54.652630599999981 ], [ -126.5270281, 54.6528129 ], [ -126.527158, 54.6529866 ], [ -126.5272305, 54.6530692 ], [ -126.5273747, 54.6532515 ], [ -126.527472499999988, 54.6534253 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099987, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 22943.375253142302, "blue_line_key": 360880905, "length_metre": 134.70409462615399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3903503, 54.2789351 ], [ -126.390313400000011, 54.2790519 ], [ -126.3902716, 54.2792299 ], [ -126.390371300000012, 54.2793396 ], [ -126.390668600000012, 54.2795176 ], [ -126.3907402, 54.2795902 ], [ -126.390793699999989, 54.279727 ], [ -126.3908917, 54.2798551 ], [ -126.3911149, 54.2799677 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17084589, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 5010.7829099370701, "blue_line_key": 360846413, "length_metre": 156.65291904518099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.320513299999988, 54.4733511 ], [ -126.320630600000015, 54.473395 ], [ -126.3210094, 54.4731785 ], [ -126.321057200000013, 54.4726621 ], [ -126.321914400000011, 54.4726383 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17086160, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 0.0, "blue_line_key": 360869846, "length_metre": 2074.30835650578, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.522366, 54.4632848 ], [ -126.5227041, 54.463291899999987 ], [ -126.5230438, 54.4632805 ], [ -126.523273799999984, 54.4633303 ], [ -126.5235051, 54.4633346 ], [ -126.523716599999986, 54.4633745 ], [ -126.523838, 54.463412899999987 ], [ -126.524035599999976, 54.4634713 ], [ -126.5243249, 54.4635411 ], [ -126.524478300000013, 54.463544 ], [ -126.524709, 54.4635568 ], [ -126.5249272, 54.4635354 ], [ -126.5250351, 54.4635283 ], [ -126.525142399999979, 54.4635297 ], [ -126.5254494, 54.463591 ], [ -126.525696400000015, 54.4635781 ], [ -126.525790300000011, 54.463534 ], [ -126.5258887, 54.4634557 ], [ -126.5261941, 54.4632549 ], [ -126.5263245, 54.4631409 ], [ -126.526551500000011, 54.4629472 ], [ -126.5267656, 54.462755 ], [ -126.5268595, 54.4627108 ], [ -126.527022299999985, 54.4625883 ], [ -126.5271004, 54.4625541 ], [ -126.527443799999986, 54.4624901 ], [ -126.527722200000014, 54.4624858 ], [ -126.5280461, 54.4624844 ], [ -126.528290499999983, 54.4625071 ], [ -126.5285321, 54.4626011 ], [ -126.52877380000001, 54.462688 ], [ -126.528867299999987, 54.462708 ], [ -126.5291546, 54.4627763 ], [ -126.529426, 54.4628903 ], [ -126.5297366, 54.4631025 ], [ -126.5297804, 54.4631666 ], [ -126.5297995, 54.4633645 ], [ -126.5299275, 54.4635383 ], [ -126.530024099999977, 54.4637106 ], [ -126.5300593, 54.4639185 ], [ -126.5300455, 54.4641336 ], [ -126.529939, 54.4643472 ], [ -126.5298371, 54.4645338 ], [ -126.5298177, 54.4645965 ], [ -126.529772599999987, 54.464803 ], [ -126.5297687, 54.4648842 ], [ -126.5297817, 54.4649383 ], [ -126.5298763, 54.4651377 ], [ -126.5299018, 54.4652188 ], [ -126.5299712, 54.4653641 ], [ -126.530005, 54.4655621 ], [ -126.530060299999988, 54.4656632 ], [ -126.5301297, 54.465808499999987 ], [ -126.530243, 54.4659893 ], [ -126.53037, 54.4661731 ], [ -126.5304295, 54.4662272 ], [ -126.530631299999982, 54.4664565 ], [ -126.530718, 54.4665661 ], [ -126.5307451, 54.4666288 ], [ -126.5307823, 54.466747 ], [ -126.5308114, 54.466811100000015 ], [ -126.5308046, 54.4669008 ], [ -126.5308107, 54.4670447 ], [ -126.5308561, 54.467090199999987 ], [ -126.5309815, 54.4672996 ], [ -126.5310218, 54.4673808 ], [ -126.531087, 54.4675802 ], [ -126.5311893, 54.4677084 ], [ -126.531261399999977, 54.4677824 ], [ -126.531466, 54.4679476 ], [ -126.5314951, 54.4680117 ], [ -126.531501299999988, 54.4681556 ], [ -126.531496499999989, 54.468218199999988 ], [ -126.531491699999989, 54.4683165 ], [ -126.5315553, 54.4685344 ], [ -126.5315677, 54.4685971 ], [ -126.5315874, 54.4687865 ], [ -126.5316549, 54.4689232 ], [ -126.5317992, 54.4690784 ], [ -126.531903199999974, 54.4691525 ], [ -126.5321248, 54.4693462 ], [ -126.532208, 54.4694729 ], [ -126.53222, 54.469537 ], [ -126.532349599999975, 54.4696923 ], [ -126.532419, 54.4698375 ], [ -126.532468599999987, 54.4700184 ], [ -126.5324659, 54.4700896 ], [ -126.5324673, 54.4702961 ], [ -126.5324598, 54.4704229 ], [ -126.532535200000012, 54.4704599 ], [ -126.53275330000001, 54.4706707 ], [ -126.532780399999979, 54.4707263 ], [ -126.5328791, 54.4709071 ], [ -126.5329052, 54.4709798 ], [ -126.532910199999989, 54.4711692 ], [ -126.532898499999988, 54.4713572 ], [ -126.532937599999983, 54.4714839 ], [ -126.5329705, 54.4716919 ], [ -126.5331316, 54.47182 ], [ -126.5332378, 54.4718671 ], [ -126.5335366, 54.472008 ], [ -126.533611799999974, 54.4720736 ], [ -126.533668299999988, 54.4721647 ], [ -126.533752400000012, 54.47231 ], [ -126.5340072, 54.4724225 ], [ -126.53417, 54.472525 ], [ -126.534256700000014, 54.4726347 ], [ -126.5343838, 54.4728255 ], [ -126.5345292, 54.4729637 ], [ -126.5347498, 54.4731745 ], [ -126.5348541, 54.4732129 ], [ -126.534962299999989, 54.4732329 ], [ -126.535235, 54.4733012 ], [ -126.5353727, 54.473314 ], [ -126.535496199999983, 54.4733254 ], [ -126.5357888, 54.4733226 ], [ -126.5360202, 54.473326899999989 ], [ -126.5361897, 54.4733397 ], [ -126.5363426, 54.4733511 ], [ -126.536405899999977, 54.4733525 ], [ -126.5364514, 54.4733625 ], [ -126.536544, 54.4733639 ], [ -126.5366357, 54.4733753 ], [ -126.5368178, 54.473415200000012 ], [ -126.5371015, 54.4735647 ], [ -126.537400199999979, 54.4737413 ], [ -126.5377231, 54.473757 ], [ -126.5379727, 54.4737442 ], [ -126.5381748, 54.4737128 ], [ -126.5384618, 54.4735647 ], [ -126.5386336, 54.4735149 ], [ -126.538854, 54.4734379 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17067829, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 231.74507441050201, "blue_line_key": 360881574, "length_metre": 211.34199824397501, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.592685499999988, 54.5576059 ], [ -126.592934, 54.5576116 ], [ -126.5932887, 54.5576087 ], [ -126.59366, 54.5576073 ], [ -126.5939385, 54.557604500000011 ], [ -126.594249, 54.5576016 ], [ -126.5943556, 54.557613 ], [ -126.5944774, 54.5576514 ], [ -126.594553499999989, 54.557679899999989 ], [ -126.5948856, 54.5578209 ], [ -126.5951121, 54.5579334 ], [ -126.5953385, 54.5580104 ], [ -126.5956873, 54.5581243 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17064675, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 2160.5806418618699, "blue_line_key": 360851751, "length_metre": 425.22205742723202, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.201639799999981, 54.5789747 ], [ -126.201487399999976, 54.5789263 ], [ -126.2013224, 54.5788508 ], [ -126.2009774, 54.5786799 ], [ -126.200920899999986, 54.5786244 ], [ -126.200795899999974, 54.578415 ], [ -126.2005917, 54.578221299999989 ], [ -126.2005344, 54.5781401 ], [ -126.2004793, 54.578039 ], [ -126.2003994, 54.5778482 ], [ -126.2003312, 54.5777214 ], [ -126.2002624, 54.5776032 ], [ -126.2001953, 54.5774665 ], [ -126.200155, 54.5773582 ], [ -126.2001188, 54.5772315 ], [ -126.2000856, 54.5770406 ], [ -126.2000683, 54.5768256 ], [ -126.199996199999987, 54.5767515 ], [ -126.199981200000011, 54.5767245 ], [ -126.199972499999987, 54.5766518 ], [ -126.1998776, 54.5764339 ], [ -126.199832, 54.576424 ], [ -126.199804700000016, 54.5763969 ], [ -126.199804499999985, 54.5763698 ], [ -126.1994401, 54.5762887 ], [ -126.1991683, 54.5761747 ], [ -126.198868199999978, 54.5760508 ], [ -126.1987164, 54.5759938 ], [ -126.198535, 54.575944 ], [ -126.198504700000015, 54.5759255 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17099377, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 18601.2738119434, "blue_line_key": 360886221, "length_metre": 488.092676742165, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6437586, 54.2903501 ], [ -126.643684799999974, 54.2903031 ], [ -126.6436263, 54.2902476 ], [ -126.6434667, 54.2900838 ], [ -126.6434117, 54.2899556 ], [ -126.643402, 54.289893 ], [ -126.6433894, 54.2898388 ], [ -126.643396599999988, 54.289686499999988 ], [ -126.6434013, 54.2895967 ], [ -126.6434535, 54.2894899 ], [ -126.6436509, 54.2892962 ], [ -126.6437953, 54.2891908 ], [ -126.643874899999986, 54.2891381 ], [ -126.6439533, 54.2890954 ], [ -126.6441126, 54.2890171 ], [ -126.644256500000012, 54.2889202 ], [ -126.6443032, 54.2888775 ], [ -126.6443529, 54.2888334 ], [ -126.6444203, 54.288718 ], [ -126.6444115, 54.2886183 ], [ -126.644235, 54.2884887 ], [ -126.6441279, 54.2884602 ], [ -126.643916600000011, 54.2884018 ], [ -126.6436725, 54.2883605 ], [ -126.643595499999989, 54.2883506 ], [ -126.643442799999988, 54.2883477 ], [ -126.643198899999987, 54.2883335 ], [ -126.6429678, 54.2883107 ], [ -126.642817900000011, 54.2882722 ], [ -126.6427735, 54.2882181 ], [ -126.6427674, 54.2880828 ], [ -126.6428342, 54.287976 ], [ -126.6429149, 54.2879062 ], [ -126.6429798, 54.2878535 ], [ -126.6430588, 54.2878094 ], [ -126.643183600000015, 54.2877666 ], [ -126.6433244, 54.2877339 ], [ -126.6434482, 54.2877011 ], [ -126.643574299999983, 54.2876755 ], [ -126.6436991, 54.2876327 ], [ -126.643841099999975, 54.2875829 ], [ -126.6439659, 54.2875402 ], [ -126.6440924, 54.2874789 ], [ -126.64417250000001, 54.2874177 ], [ -126.6442368, 54.2873735 ], [ -126.644252, 54.287365 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17084270, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 230453.07085181901, "blue_line_key": 360873822, "length_metre": 58.223416653968201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2605156, 54.4752283 ], [ -126.2606117, 54.4750544 ], [ -126.2605595, 54.4749462 ], [ -126.2603774, 54.4748793 ], [ -126.2602596, 54.4748038 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17055486, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 24115.197445191101, "blue_line_key": 360856488, "length_metre": 265.00041878507301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5432822, 54.6257003 ], [ -126.5436066, 54.6240752 ], [ -126.5443401, 54.6234704 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17070877, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 7387.47238236469, "blue_line_key": 360875378, "length_metre": 848.45038999356495, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5277371, 54.542542 ], [ -126.5277975, 54.542552 ], [ -126.527843100000013, 54.542562 ], [ -126.528103800000011, 54.5426033 ], [ -126.5282437, 54.5425961 ], [ -126.5285683, 54.5425947 ], [ -126.528953699999988, 54.5426018 ], [ -126.529310200000012, 54.5426004 ], [ -126.529603399999985, 54.5425976 ], [ -126.5298518, 54.5426033 ], [ -126.5301774, 54.5428254 ], [ -126.53038979999998, 54.542928 ], [ -126.530585099999982, 54.5429949 ], [ -126.5306449, 54.5430419 ], [ -126.5308863, 54.5431459 ], [ -126.530991300000011, 54.5431829 ], [ -126.53122, 54.5432242 ], [ -126.5312936, 54.5432883 ], [ -126.5314984, 54.5434905 ], [ -126.5317875, 54.5435774 ], [ -126.532136400000013, 54.5436828 ], [ -126.5323479, 54.5437597 ], [ -126.532439200000013, 54.5437797 ], [ -126.5328099, 54.5437868 ], [ -126.5330877, 54.5438281 ], [ -126.5334205, 54.5439164 ], [ -126.5335402, 54.5439819 ], [ -126.5336325, 54.5439919 ], [ -126.5337415, 54.5440033 ], [ -126.534127899999987, 54.5439933 ], [ -126.5343729, 54.5440161 ], [ -126.534719799999976, 54.544177 ], [ -126.534914, 54.54429660000001 ], [ -126.535228499999988, 54.5444661 ], [ -126.535304499999981, 54.5444946 ], [ -126.535683399999982, 54.5446271 ], [ -126.5357894, 54.544647 ], [ -126.53608, 54.544708199999988 ], [ -126.536248399999977, 54.5447111 ], [ -126.536481099999989, 54.5447339 ], [ -126.53668, 54.5447552 ], [ -126.536897, 54.5447595 ], [ -126.537125299999985, 54.5448094 ], [ -126.537351499999986, 54.5448863 ], [ -126.5376553, 54.5449731 ], [ -126.5377952, 54.5449945 ], [ -126.5381016, 54.5450102 ], [ -126.538330800000011, 54.5450857 ], [ -126.538387700000015, 54.5451412 ], [ -126.538423200000011, 54.5453221 ], [ -126.538450599999976, 54.5453847 ], [ -126.5384937, 54.5454303 ], [ -126.538600699999989, 54.5454688 ], [ -126.5387244, 54.5454802 ], [ -126.5389567, 54.5454759 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091753, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 271908.981484599, "blue_line_key": 360873822, "length_metre": 39.488611875861601, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.102550900000011, 54.4164226 ], [ -126.1026388, 54.4162389 ], [ -126.1028651, 54.416142 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17081429, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 8124.2982301258598, "blue_line_key": 360875052, "length_metre": 85.8665279049047, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4097056, 54.4886738 ], [ -126.409818300000012, 54.4879073 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17106895, "stream_order": 4, "gnis_name": "Buck Creek", "downstream_route_measure": 64893.868596786197, "blue_line_key": 360886221, "length_metre": 102.26730058327399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.346210899999988, 54.171464699999987 ], [ -126.3448859, 54.170973 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17083503, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 229640.31097074601, "blue_line_key": 360873822, "length_metre": 77.005144502576897, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.25636, 54.4795549 ], [ -126.2570276, 54.4793043 ], [ -126.2572537, 54.4791163 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17065408, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 9237.9607633801006, "blue_line_key": 360856488, "length_metre": 400.84386835432201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4512559, 54.5708994 ], [ -126.4513604, 54.5709379 ], [ -126.451434, 54.571002 ], [ -126.4515139, 54.5712099 ], [ -126.4515865, 54.571284 ], [ -126.4516919, 54.5713481 ], [ -126.451814200000015, 54.571378 ], [ -126.4520142, 54.5713823 ], [ -126.4522476, 54.5713609 ], [ -126.4524034, 54.5713367 ], [ -126.4527476, 54.571272599999986 ], [ -126.452841, 54.57126550000001 ], [ -126.452995699999988, 54.5712868 ], [ -126.4530997, 54.5713338 ], [ -126.453232, 54.571462 ], [ -126.4531578, 54.57164 ], [ -126.4530871, 54.571801 ], [ -126.4530961, 54.5719092 ], [ -126.453124, 54.5719633 ], [ -126.453269, 54.5721186 ], [ -126.4534334, 54.572204 ], [ -126.453648500000014, 54.5722354 ], [ -126.453862699999988, 54.5722482 ], [ -126.4540977, 54.5722083 ], [ -126.454193100000012, 54.5721741 ], [ -126.4544171, 54.5720531 ], [ -126.454728099999983, 54.5720417 ], [ -126.45494020000001, 54.57211 ], [ -126.455015799999984, 54.572147099999988 ], [ -126.4550726, 54.5722026 ], [ -126.4552045, 54.5723393 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091642, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 271320.57930702699, "blue_line_key": 360873822, "length_metre": 236.773890163846, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.094827099999989, 54.4181758 ], [ -126.098128, 54.4174736 ], [ -126.0982274, 54.4174153 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17077683, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 216733.390327692, "blue_line_key": 360873822, "length_metre": 755.53334434052499, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3541485, 54.5104816 ], [ -126.3532075, 54.5104788 ], [ -126.35243509999998, 54.5107565 ], [ -126.351953200000011, 54.5107038 ], [ -126.351783699999984, 54.5105372 ], [ -126.3512278, 54.5094548 ], [ -126.3510707, 54.509273900000011 ], [ -126.3500401, 54.508606 ], [ -126.349700200000015, 54.5084707 ], [ -126.3486774, 54.508512 ], [ -126.348201499999973, 54.5083937 ], [ -126.3479307, 54.5081459 ], [ -126.3473647, 54.5070578 ], [ -126.3471122, 54.5069111 ], [ -126.3467573, 54.5068186 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17103147, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 14946.2475074129, "blue_line_key": 360877225, "length_metre": 737.39444880838801, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.203893, 54.2363171 ], [ -126.2038854, 54.2362174 ], [ -126.203856300000012, 54.2361632 ], [ -126.2037833, 54.2361162 ], [ -126.2034727, 54.235965299999989 ], [ -126.203388299999986, 54.2358556 ], [ -126.203375799999975, 54.235783 ], [ -126.203374700000012, 54.235585 ], [ -126.2034448, 54.2354526 ], [ -126.2035751, 54.2353557 ], [ -126.2038296, 54.235219 ], [ -126.2039446, 54.2351036 ], [ -126.2040014, 54.2349612 ], [ -126.203981399999989, 54.2347818 ], [ -126.2038412, 54.234571 ], [ -126.203832299999988, 54.2345083 ], [ -126.2038129, 54.2343274 ], [ -126.2037489, 54.2341551 ], [ -126.2034392, 54.2339415 ], [ -126.2032443, 54.2338745 ], [ -126.2031414, 54.233809 ], [ -126.2031014, 54.2337449 ], [ -126.2031054, 54.2336737 ], [ -126.2031252, 54.2335926 ], [ -126.2031724, 54.2333689 ], [ -126.203146, 54.2332878 ], [ -126.203043799999989, 54.2332137 ], [ -126.2029155, 54.2330841 ], [ -126.2027145, 54.232873299999987 ], [ -126.202538600000011, 54.2327337 ], [ -126.2022143, 54.2325472 ], [ -126.2021344, 54.232364900000015 ], [ -126.201943199999988, 54.2322609 ], [ -126.2018513, 54.2322324 ], [ -126.201746500000013, 54.2322125 ], [ -126.2015451, 54.2322168 ], [ -126.2011637, 54.2322068 ], [ -126.2009764, 54.232239499999984 ], [ -126.2008543, 54.2322267 ], [ -126.200780099999989, 54.2321897 ], [ -126.2007554, 54.2321171 ], [ -126.2007632, 54.2319818 ], [ -126.2008141, 54.2319291 ], [ -126.200918, 54.2317439 ], [ -126.2008978, 54.2315987 ], [ -126.200799, 54.2314619 ], [ -126.2007394, 54.2314249 ], [ -126.2006504, 54.231395 ], [ -126.200436900000014, 54.2313722 ], [ -126.2003486, 54.2313338 ], [ -126.200290299999978, 54.2312796 ], [ -126.2002942, 54.2312155 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17086315, "stream_order": 4, "gnis_name": "Raspberry Creek", "downstream_route_measure": 3895.8274261077299, "blue_line_key": 360817924, "length_metre": 198.541015333237, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.623938200000012, 54.4608835 ], [ -126.6240141, 54.460912 ], [ -126.6243308, 54.461044500000014 ], [ -126.6245286, 54.4611029 ], [ -126.6246501, 54.4611057 ], [ -126.624928, 54.46111 ], [ -126.625238200000013, 54.4610986 ], [ -126.6255176, 54.4610772 ], [ -126.625902299999979, 54.4610844 ], [ -126.626039399999982, 54.4611057 ], [ -126.6263242, 54.461245299999987 ], [ -126.6265153, 54.461429 ], [ -126.626557299999973, 54.4614846 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17077840, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 220069.09181164799, "blue_line_key": 360873822, "length_metre": 128.26093710301799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.326535499999977, 54.5066989 ], [ -126.3259855, 54.5067004 ], [ -126.3255448, 54.5066007 ], [ -126.325377499999988, 54.506491 ], [ -126.3251492, 54.5061022 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17077861, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 220197.352748751, "blue_line_key": 360873822, "length_metre": 115.371334660485, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3251492, 54.5061022 ], [ -126.3250392, 54.5060039 ], [ -126.3249334, 54.505984 ], [ -126.32454749999998, 54.5060139 ], [ -126.3244784, 54.506063700000013 ], [ -126.3243765, 54.5064497 ], [ -126.3240872, 54.506491 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17087568, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 193107.11522969999, "blue_line_key": 360873822, "length_metre": 129.93713780517999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.527977, 54.4528653 ], [ -126.5279476, 54.4526132 ], [ -126.5281628, 54.4520606 ], [ -126.527983800000015, 54.4517316 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17078174, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 220389.77574435301, "blue_line_key": 360873822, "length_metre": 821.31567156384403, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3232655, 54.5060324 ], [ -126.322977499999979, 54.5060281 ], [ -126.322591499999987, 54.506135 ], [ -126.3221468, 54.5061022 ], [ -126.321109400000012, 54.5056849 ], [ -126.3208708, 54.505645 ], [ -126.3202737, 54.5058216 ], [ -126.3196012, 54.5058159 ], [ -126.319283399999989, 54.5057504 ], [ -126.3189192, 54.5055938 ], [ -126.3189274, 54.5052719 ], [ -126.3187017, 54.5050497 ], [ -126.318431100000012, 54.5049201 ], [ -126.3180898, 54.5048446 ], [ -126.317863800000012, 54.5048247 ], [ -126.317539199999985, 54.5049173 ], [ -126.3171445, 54.5052847 ], [ -126.316828699999988, 54.5053317 ], [ -126.3155027, 54.5050511 ], [ -126.3140789, 54.5046167 ], [ -126.3126037, 54.5044601 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17106230, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 498.00737724353797, "blue_line_key": 360880905, "length_metre": 1471.68458717003, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4220149, 54.1844345 ], [ -126.421949, 54.1845228 ], [ -126.4218935, 54.1846838 ], [ -126.421855099999974, 54.1847906 ], [ -126.4218495, 54.1848803 ], [ -126.421845300000015, 54.1849529 ], [ -126.421838400000013, 54.1850598 ], [ -126.4218342, 54.1851324 ], [ -126.4218304, 54.1852036 ], [ -126.4218554, 54.1852762 ], [ -126.4218943, 54.1853845 ], [ -126.4219345, 54.1854756 ], [ -126.4219917, 54.1855668 ], [ -126.422030100000015, 54.1856765 ], [ -126.4220531, 54.1858018 ], [ -126.4220166, 54.185883 ], [ -126.421922, 54.1859428 ], [ -126.4217794, 54.185994 ], [ -126.4216088, 54.1860354 ], [ -126.421516200000013, 54.1860425 ], [ -126.421423599999983, 54.1860496 ], [ -126.4213175, 54.1860467 ], [ -126.421146900000011, 54.186061 ], [ -126.4209921, 54.1860852 ], [ -126.420867199999989, 54.1861279 ], [ -126.4207708, 54.1862063 ], [ -126.420687300000012, 54.1863031 ], [ -126.4206678, 54.1863843 ], [ -126.4206634, 54.186464 ], [ -126.420641499999974, 54.1865452 ], [ -126.420573800000014, 54.186652 ], [ -126.420479199999974, 54.1867118 ], [ -126.4203678, 54.1867645 ], [ -126.420228099999989, 54.1867873 ], [ -126.4200258, 54.1868286 ], [ -126.4198247, 54.18686 ], [ -126.419685199999989, 54.1869027 ], [ -126.4195132, 54.1869611 ], [ -126.4192634, 54.1870465 ], [ -126.4191189, 54.1871234 ], [ -126.4190384, 54.187184699999989 ], [ -126.4189568, 54.1872559 ], [ -126.418878100000015, 54.1873257 ], [ -126.418797, 54.1873684 ], [ -126.4185074, 54.1875778 ], [ -126.418365400000013, 54.1876476 ], [ -126.4181771, 54.1877245 ], [ -126.41801980000001, 54.1877829 ], [ -126.417893, 54.1878441 ], [ -126.4177376, 54.1879039 ], [ -126.4175493, 54.1879808 ], [ -126.4174688, 54.1880421 ], [ -126.4174474, 54.1881218 ], [ -126.41749, 54.1881859 ], [ -126.417559399999988, 54.1882771 ], [ -126.4176167, 54.1883682 ], [ -126.4176569, 54.1884594 ], [ -126.41765070000001, 54.1885576 ], [ -126.417522, 54.1886445 ], [ -126.417364799999987, 54.1886958 ], [ -126.4171015, 54.1887713 ], [ -126.4169144, 54.1888111 ], [ -126.416682200000011, 54.1888339 ], [ -126.4164068, 54.1888282 ], [ -126.4160381, 54.1888652 ], [ -126.4159862, 54.188935 ], [ -126.4159795, 54.1890347 ], [ -126.416067200000015, 54.1891088 ], [ -126.4161579, 54.1891544 ], [ -126.4163188, 54.1892484 ], [ -126.4164242, 54.1892868 ], [ -126.4165594, 54.1893438 ], [ -126.4166624, 54.1894093 ], [ -126.41678490000001, 54.1894207 ], [ -126.4167933, 54.189519 ], [ -126.416728100000014, 54.1895717 ], [ -126.416634800000011, 54.1896144 ], [ -126.4164319, 54.1896642 ], [ -126.416277099999988, 54.189688399999987 ], [ -126.4161052, 54.1897198 ], [ -126.4159498, 54.1897525 ], [ -126.4158071, 54.1898309 ], [ -126.415743100000014, 54.1899007 ], [ -126.4157211, 54.1899818 ], [ -126.4157149, 54.19008010000001 ], [ -126.4157082, 54.1902069 ], [ -126.415701399999989, 54.1903137 ], [ -126.415694699999975, 54.1904134 ], [ -126.4156903, 54.1904931 ], [ -126.4157159, 54.1905843 ], [ -126.41571110000001, 54.1906384 ], [ -126.415723199999974, 54.1906925 ], [ -126.4157652, 54.1907651 ], [ -126.4157913, 54.1908278 ], [ -126.4158492, 54.1908834 ], [ -126.415830899999975, 54.1909546 ], [ -126.4157511, 54.1910073 ], [ -126.4156535, 54.1910685 ], [ -126.4155426, 54.1911198 ], [ -126.4154017, 54.1911796 ], [ -126.4152286, 54.191248 ], [ -126.41503849999998, 54.1913434 ], [ -126.414864099999988, 54.1914288 ], [ -126.4147215, 54.191507200000011 ], [ -126.414385099999976, 54.191508600000013 ], [ -126.4141888, 54.1914587 ], [ -126.414065199999982, 54.1914573 ], [ -126.4140005, 54.191508600000013 ], [ -126.4139498, 54.1915883 ], [ -126.4139449, 54.1916966 ], [ -126.413969199999983, 54.1917778 ], [ -126.4140424, 54.1918518 ], [ -126.4141441, 54.1919344 ], [ -126.414258600000011, 54.1920626 ], [ -126.4143432, 54.1921723 ], [ -126.4143365, 54.192272 ], [ -126.414286499999989, 54.1923432 ], [ -126.4141457, 54.192403 ], [ -126.4140043, 54.1924443 ], [ -126.413803800000011, 54.1924671 ], [ -126.4136636, 54.1925183 ], [ -126.4135367, 54.1925867 ], [ -126.413484899999986, 54.1926494 ], [ -126.4134514, 54.1927021 ], [ -126.4134465, 54.1927833 ], [ -126.413440299999976, 54.1928815 ], [ -126.413340299999987, 54.1929969 ], [ -126.4132477, 54.193031100000013 ], [ -126.413121499999988, 54.1930638 ], [ -126.4129318, 54.1931578 ], [ -126.4127898, 54.1932276 ], [ -126.4126332, 54.1932775 ], [ -126.412432599999988, 54.1933273 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17066300, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 4346.0291847347098, "blue_line_key": 360851751, "length_metre": 253.60026756485101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.180396499999986, 54.5671979 ], [ -126.180164599999983, 54.5672008 ], [ -126.179840299999981, 54.5671937 ], [ -126.1794369, 54.5672022 ], [ -126.179098, 54.5671951 ], [ -126.178695600000012, 54.5671937 ], [ -126.1783252, 54.5671851 ], [ -126.177986300000015, 54.567178 ], [ -126.1776145, 54.5671595 ], [ -126.1773073, 54.5671253 ], [ -126.1772019, 54.5670968 ], [ -126.1768836, 54.56699 ], [ -126.1765461, 54.5669373 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099280, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 5499.2456733675299, "blue_line_key": 360877225, "length_metre": 903.88660811950297, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1683455, 54.2932171 ], [ -126.1684557, 54.2931758 ], [ -126.168784, 54.2930846 ], [ -126.169111, 54.2930376 ], [ -126.169434299999978, 54.2930006 ], [ -126.1697779, 54.292928 ], [ -126.1700935, 54.2928183 ], [ -126.1703028, 54.2926787 ], [ -126.170512699999989, 54.2925306 ], [ -126.170709399999978, 54.2923654 ], [ -126.17092, 54.2922087 ], [ -126.171113299999988, 54.2920592 ], [ -126.1713691, 54.2919125 ], [ -126.171624799999975, 54.2917929 ], [ -126.1718928, 54.2916732 ], [ -126.172177300000016, 54.291555 ], [ -126.172418899999983, 54.2914069 ], [ -126.172674, 54.2912688 ], [ -126.172928, 54.2911406 ], [ -126.173271599999978, 54.2910679 ], [ -126.173629100000014, 54.2910309 ], [ -126.1739377, 54.2909939 ], [ -126.1742323, 54.2909554 ], [ -126.1745759, 54.2908828 ], [ -126.1749627, 54.2908458 ], [ -126.17527, 54.2908529 ], [ -126.1756188, 54.290907 ], [ -126.1759535, 54.2909597 ], [ -126.1762857, 54.2910395 ], [ -126.176618499999989, 54.2911107 ], [ -126.1769347, 54.2912346 ], [ -126.1772185, 54.29134 ], [ -126.177520799999982, 54.2914012 ], [ -126.1778727, 54.291426799999989 ], [ -126.178196, 54.2914169 ], [ -126.1785185, 54.2914425 ], [ -126.1788074, 54.2914938 ], [ -126.1791103, 54.2915465 ], [ -126.179464, 54.2915536 ], [ -126.1798007, 54.2915536 ], [ -126.1801398, 54.2915337 ], [ -126.180498700000015, 54.2914795 ], [ -126.1805598, 54.2914724 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17087124, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 234714.66550077999, "blue_line_key": 360873822, "length_metre": 46.482702090607397, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2395626, 54.4561623 ], [ -126.2394645, 54.4562107 ], [ -126.2391706, 54.4562036 ], [ -126.2390309, 54.4560526 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17076795, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 8600.2778066927294, "blue_line_key": 360869846, "length_metre": 5.6937447581167904, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.583095300000011, 54.5104179 ], [ -126.5831717, 54.5104434 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17105960, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 44798.970588549397, "blue_line_key": 360886221, "length_metre": 209.849037435799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5237185, 54.1885121 ], [ -126.523579500000011, 54.1885263 ], [ -126.5234594, 54.1885149 ], [ -126.5233369, 54.1885035 ], [ -126.5232138, 54.1885007 ], [ -126.5230926, 54.1884992 ], [ -126.5229536, 54.1884864 ], [ -126.5228311, 54.188475 ], [ -126.522711, 54.1884636 ], [ -126.5225417, 54.1884608 ], [ -126.52246430000001, 54.1884594 ], [ -126.522343600000013, 54.1884565 ], [ -126.522220499999975, 54.1884537 ], [ -126.5220828, 54.1884508 ], [ -126.521976199999983, 54.1884494 ], [ -126.5218677, 54.1884465 ], [ -126.5217605, 54.1884537 ], [ -126.5216373, 54.1884508 ], [ -126.5215319, 54.1884394 ], [ -126.521424, 54.188428 ], [ -126.521332, 54.1884266 ], [ -126.521241199999977, 54.1884152 ], [ -126.521149799999989, 54.1884052 ], [ -126.521058900000014, 54.1883938 ], [ -126.520968699999983, 54.1883739 ], [ -126.520893099999981, 54.188354 ], [ -126.5208035, 54.1883255 ], [ -126.5207114, 54.188297 ], [ -126.5206364, 54.1882685 ], [ -126.5205778, 54.1882486 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17065690, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 2314.8606600340499, "blue_line_key": 360881574, "length_metre": 140.767471903532, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6147778, 54.5684789 ], [ -126.61493729999998, 54.5690053 ], [ -126.6147482, 54.5695479 ], [ -126.6148707, 54.569706 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17104275, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 16404.292213506, "blue_line_key": 360877225, "length_metre": 2791.8180397675701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.202621, 54.2267663 ], [ -126.2026884, 54.2266951 ], [ -126.2027725, 54.2265712 ], [ -126.20291, 54.2263675 ], [ -126.202976299999989, 54.2262792 ], [ -126.2031385, 54.2261482 ], [ -126.203223799999989, 54.2260343 ], [ -126.2032615, 54.2259175 ], [ -126.203254, 54.2258178 ], [ -126.203266499999984, 54.2256027 ], [ -126.2033233, 54.2254603 ], [ -126.203419199999985, 54.2254176 ], [ -126.2035407, 54.2254119 ], [ -126.203907199999989, 54.225429 ], [ -126.2040176, 54.2254133 ], [ -126.2040965, 54.2253706 ], [ -126.2041316, 54.2253079 ], [ -126.20413809999998, 54.2252097 ], [ -126.2041592, 54.2251384 ], [ -126.204357099999982, 54.2249362 ], [ -126.204713500000011, 54.2248807 ], [ -126.2047912, 54.2248479 ], [ -126.2048732, 54.2247767 ], [ -126.2049077, 54.2247155 ], [ -126.204902799999985, 54.2245616 ], [ -126.204941799999986, 54.2244278 ], [ -126.2049927, 54.2243751 ], [ -126.20519059999998, 54.2241728 ], [ -126.205423900000014, 54.2241073 ], [ -126.2055167, 54.2241002 ], [ -126.205887100000012, 54.2240731 ], [ -126.2059664, 54.224056 ], [ -126.2060459, 54.2240048 ], [ -126.2060411, 54.223851 ], [ -126.205944799999983, 54.2236872 ], [ -126.205948099999986, 54.2236245 ], [ -126.2059831, 54.2235618 ], [ -126.20605, 54.2234921 ], [ -126.206213, 54.2233254 ], [ -126.206232700000015, 54.2232713 ], [ -126.206262200000012, 54.2230833 ], [ -126.206296, 54.2230306 ], [ -126.206376799999987, 54.2229694 ], [ -126.2064543, 54.2229437 ], [ -126.2065775, 54.2229466 ], [ -126.2066881, 54.2229039 ], [ -126.2067663, 54.2228697 ], [ -126.206794699999989, 54.2226646 ], [ -126.206856, 54.2224495 ], [ -126.2069419, 54.2223342 ], [ -126.207116199999973, 54.2222302 ], [ -126.2071379, 54.2221505 ], [ -126.2071101, 54.2220864 ], [ -126.2070536, 54.2220408 ], [ -126.206842199999983, 54.2219724 ], [ -126.206784500000012, 54.2219169 ], [ -126.206763099999989, 54.2217816 ], [ -126.2067736, 54.2216392 ], [ -126.206823199999988, 54.2215765 ], [ -126.2069199, 54.2215252 ], [ -126.206983400000013, 54.221491 ], [ -126.2070902, 54.2214654 ], [ -126.207305, 54.2214711 ], [ -126.2076899, 54.2214711 ], [ -126.2080556, 54.2214967 ], [ -126.2084302, 54.221632 ], [ -126.2085383, 54.2216164 ], [ -126.20865280000001, 54.2215024 ], [ -126.20872150000001, 54.2214141 ], [ -126.208889599999978, 54.2211934 ], [ -126.2090035, 54.221088 ], [ -126.209346700000012, 54.2210154 ], [ -126.2095448, 54.2210196 ], [ -126.209847599999975, 54.221098 ], [ -126.210224900000014, 54.2211791 ], [ -126.2104966, 54.2212489 ], [ -126.2105868, 54.2212689 ], [ -126.2108344, 54.2212646 ], [ -126.2109565, 54.2212503 ], [ -126.2111173, 54.22116350000001 ], [ -126.211181599999989, 54.2210937 ], [ -126.2113033, 54.220880099999988 ], [ -126.211383900000016, 54.2208459 ], [ -126.2114773, 54.2208302 ], [ -126.211568899999989, 54.2208331 ], [ -126.211796199999981, 54.2208644 ], [ -126.211886400000012, 54.2208843 ], [ -126.2122489, 54.2209926 ], [ -126.2125238, 54.2210068 ], [ -126.212808, 54.2208886 ], [ -126.2127795, 54.2208331 ], [ -126.212707900000012, 54.220769 ], [ -126.2125295, 54.2206835 ], [ -126.2125029, 54.2206294 ], [ -126.212517199999979, 54.2204229 ], [ -126.2125522, 54.2203602 ], [ -126.2126318, 54.2203089 ], [ -126.212854299999989, 54.2202064 ], [ -126.212977599999988, 54.2201822 ], [ -126.2132081, 54.2201779 ], [ -126.21356, 54.220195 ], [ -126.213699800000015, 54.2201722 ], [ -126.213967499999981, 54.2200526 ], [ -126.214222400000011, 54.2199144 ], [ -126.214575099999976, 54.2197151 ], [ -126.214701800000014, 54.2196282 ], [ -126.2148606, 54.2195598 ], [ -126.214984500000014, 54.2195541 ], [ -126.215182, 54.2195669 ], [ -126.215392799999989, 54.2196168 ], [ -126.215671, 54.2196154 ], [ -126.2159519, 54.2195128 ], [ -126.216061900000014, 54.2194986 ], [ -126.2162601, 54.2195028 ], [ -126.2165813, 54.219537 ], [ -126.2167185, 54.2195484 ], [ -126.2170215, 54.2195926 ], [ -126.2172348, 54.2196154 ], [ -126.2175112, 54.2196125 ], [ -126.217619199999987, 54.2195968 ], [ -126.2177462, 54.2195555 ], [ -126.2177958, 54.2194929 ], [ -126.2177864, 54.2194117 ], [ -126.2178141, 54.2192152 ], [ -126.21781679999998, 54.219161 ], [ -126.2178676, 54.2191083 ], [ -126.2179618, 54.2190571 ], [ -126.218277, 54.2189474 ], [ -126.21842190000001, 54.2188506 ], [ -126.2184563, 54.2187893 ], [ -126.2184979, 54.2186284 ], [ -126.2184612, 54.2185016 ], [ -126.2184279, 54.2183122 ], [ -126.218419199999985, 54.218195400000013 ], [ -126.2184415, 54.2181142 ], [ -126.2185204, 54.218071499999986 ], [ -126.218612400000012, 54.2180729 ], [ -126.2187026, 54.2180929 ], [ -126.218775600000015, 54.2181399 ], [ -126.2188816, 54.2181698 ], [ -126.2190188, 54.2181812 ], [ -126.2192367, 54.2181513 ], [ -126.21936190000001, 54.2181085 ], [ -126.21974, 54.2179462 ], [ -126.219867099999988, 54.2179049 ], [ -126.2199891, 54.2178978 ], [ -126.2201441, 54.2178935 ], [ -126.220248899999987, 54.217913399999986 ], [ -126.2205312, 54.2180544 ], [ -126.2206711, 54.2180316 ], [ -126.220766399999974, 54.2179704 ], [ -126.220818099999988, 54.2178821 ], [ -126.220876100000012, 54.2177026 ], [ -126.220887, 54.2175588 ], [ -126.220938, 54.217479 ], [ -126.221018199999989, 54.2174192 ], [ -126.221220800000012, 54.2173779 ], [ -126.2214196, 54.2174007 ], [ -126.2214919, 54.2174563 ], [ -126.2214993, 54.217583 ], [ -126.2215387, 54.2176556 ], [ -126.221612900000011, 54.2176927 ], [ -126.221706200000014, 54.2177041 ], [ -126.221921, 54.2176827 ], [ -126.2222831, 54.2175645 ], [ -126.2223791, 54.2174947 ], [ -126.222551400000015, 54.21743630000001 ], [ -126.222884400000012, 54.2172911 ], [ -126.2229678, 54.217175700000013 ], [ -126.223132599999985, 54.2169905 ], [ -126.223214, 54.2169208 ], [ -126.223427699999988, 54.2167285 ], [ -126.2236197, 54.216616 ], [ -126.2237773, 54.2165376 ], [ -126.223994599999983, 54.2164892 ], [ -126.224288699999974, 54.2164778 ], [ -126.22463, 54.2163966 ], [ -126.224893499999979, 54.2163753 ], [ -126.2252148, 54.2163824 ], [ -126.2254467, 54.216361 ], [ -126.2255707, 54.2163283 ], [ -126.225794400000012, 54.2161887 ], [ -126.225893699999986, 54.2160833 ], [ -126.2262273, 54.2159295 ], [ -126.226336, 54.2159053 ], [ -126.2266275, 54.2158939 ], [ -126.226858, 54.2158896 ], [ -126.2271673, 54.2158697 ], [ -126.227290599999989, 54.2158455 ], [ -126.2276762, 54.2158099 ], [ -126.2279754, 54.2157173 ], [ -126.2280879, 54.2156489 ], [ -126.2281695, 54.215552099999989 ], [ -126.228360099999989, 54.2154567 ], [ -126.2284706, 54.2154139 ], [ -126.2285774, 54.2154082 ], [ -126.2289609, 54.2154253 ], [ -126.229113500000011, 54.2154211 ], [ -126.2292856, 54.2153698 ], [ -126.229655099999988, 54.2153783 ], [ -126.2297594, 54.2153997 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17054299, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 28457.094758587202, "blue_line_key": 360856488, "length_metre": 313.00332210259802, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5925946, 54.631293 ], [ -126.592670099999978, 54.6313386 ], [ -126.592912899999988, 54.631434 ], [ -126.593178899999984, 54.6316633 ], [ -126.5932685, 54.6317103 ], [ -126.5933726, 54.6317659 ], [ -126.593585300000015, 54.6318342 ], [ -126.593885, 54.6320009 ], [ -126.5939943, 54.6320123 ], [ -126.594351099999983, 54.6320194 ], [ -126.594445099999973, 54.6320037 ], [ -126.5945384, 54.631961 ], [ -126.594911400000015, 54.6319496 ], [ -126.5952372, 54.6319468 ], [ -126.5953745, 54.6319767 ], [ -126.5957619, 54.6320023 ], [ -126.5958673, 54.6320322 ], [ -126.595958, 54.6320692 ], [ -126.596063500000014, 54.6321348 ], [ -126.5961375, 54.6321988 ], [ -126.5963871, 54.6324111 ], [ -126.5964593, 54.6325022 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17061233, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 24333.752266506999, "blue_line_key": 360875378, "length_metre": 25.876649364932799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6985525, 54.5912201 ], [ -126.69862879999998, 54.5912485 ], [ -126.6988706, 54.5913611 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102325, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 28911.1792681919, "blue_line_key": 360881038, "length_metre": 36.8734860843714, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.067564799999985, 54.2411038 ], [ -126.0672573, 54.2410782 ], [ -126.0672128, 54.2410867 ], [ -126.0671358, 54.2410839 ], [ -126.06701, 54.2411081 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17091706, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 180292.98801000501, "blue_line_key": 360873822, "length_metre": 453.24209551100301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.612738900000011, 54.4152519 ], [ -126.6124955, 54.415381499999981 ], [ -126.6123744, 54.4156165 ], [ -126.6124955, 54.4160694 ], [ -126.612464, 54.4169182 ], [ -126.6127513, 54.4173227 ], [ -126.6131081, 54.4176403 ], [ -126.6138699, 54.4181373 ], [ -126.6140902, 54.418341 ], [ -126.614261, 54.4186657 ], [ -126.6142525, 54.418788199999987 ], [ -126.614150099999989, 54.4189064 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17106064, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 45008.819625985197, "blue_line_key": 360886221, "length_metre": 2227.5844768428801, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5205778, 54.1882486 ], [ -126.5205334, 54.1882301 ], [ -126.520427799999979, 54.1881916 ], [ -126.520307699999989, 54.1881531 ], [ -126.5202011, 54.1881247 ], [ -126.520094899999989, 54.1880948 ], [ -126.5199907, 54.1880663 ], [ -126.5198835, 54.1880463 ], [ -126.5197773, 54.1880164 ], [ -126.519673700000013, 54.1879794 ], [ -126.5195828, 54.1879409 ], [ -126.5194926, 54.187921 ], [ -126.519388400000011, 54.1878925 ], [ -126.5192951, 54.1878811 ], [ -126.5191903, 54.1878612 ], [ -126.5190689, 54.1878398 ], [ -126.5189616, 54.187819899999987 ], [ -126.5187801, 54.18779 ], [ -126.518703800000011, 54.1877786 ], [ -126.5185813, 54.1877672 ], [ -126.518461300000013, 54.1877558 ], [ -126.518352199999981, 54.1877544 ], [ -126.5182322, 54.187743 ], [ -126.5181237, 54.1877401 ], [ -126.518018200000014, 54.1877287 ], [ -126.5178354, 54.1877159 ], [ -126.517667800000012, 54.1876945 ], [ -126.5175453, 54.1876832 ], [ -126.5173003, 54.1876604 ], [ -126.5171948, 54.187649 ], [ -126.517102899999983, 54.1876476 ], [ -126.517012, 54.1876362 ], [ -126.5169035, 54.1876333 ], [ -126.516797499999981, 54.1876233 ], [ -126.516692100000014, 54.187612 ], [ -126.516598800000011, 54.1876006 ], [ -126.5165086, 54.1875806 ], [ -126.516419, 54.1875521 ], [ -126.5163434, 54.1875322 ], [ -126.516253799999987, 54.1875037 ], [ -126.516116, 54.1874738 ], [ -126.5159538, 54.1873898 ], [ -126.515878699999988, 54.1873342 ], [ -126.5157909, 54.1872872 ], [ -126.515701199999981, 54.1872317 ], [ -126.5156151, 54.1871662 ], [ -126.5155389, 54.1871206 ], [ -126.5154529, 54.1870551 ], [ -126.515348, 54.1870081 ], [ -126.5152437, 54.1869525 ], [ -126.5151528, 54.1869141 ], [ -126.515063200000014, 54.1868856 ], [ -126.5149736, 54.1868571 ], [ -126.514883399999974, 54.1868372 ], [ -126.5148078, 54.1868172 ], [ -126.514717600000012, 54.1867973 ], [ -126.514624900000015, 54.1867774 ], [ -126.5145335, 54.1867674 ], [ -126.514442699999989, 54.186756 ], [ -126.5143507, 54.1867546 ], [ -126.5142446, 54.1867517 ], [ -126.514135, 54.1867859 ], [ -126.5140601, 54.1867574 ], [ -126.513966799999977, 54.1867731 ], [ -126.5138901, 54.1867902 ], [ -126.5137792, 54.1868144 ], [ -126.5136884, 54.1868301 ], [ -126.5135941, 54.1868557 ], [ -126.513546, 54.1868813 ], [ -126.513452799999982, 54.1869241 ], [ -126.51337239999998, 54.1869582 ], [ -126.5132951, 54.1869839 ], [ -126.5132178, 54.1870095 ], [ -126.5131234, 54.187035099999989 ], [ -126.5129681, 54.1870679 ], [ -126.5128755, 54.187075 ], [ -126.512784, 54.1870722 ], [ -126.5127072, 54.1870622 ], [ -126.5126158, 54.1870594 ], [ -126.512539, 54.1870494 ], [ -126.512464099999988, 54.187048 ], [ -126.512387300000015, 54.187038 ], [ -126.5123111, 54.1870266 ], [ -126.512220199999987, 54.1870152 ], [ -126.5121435, 54.1870052 ], [ -126.512053199999983, 54.1869853 ], [ -126.511946599999987, 54.186956800000011 ], [ -126.5118575, 54.1869269 ], [ -126.5117832, 54.1868899 ], [ -126.5116765, 54.1868614 ], [ -126.511588100000012, 54.1868229 ], [ -126.5114985, 54.1867944 ], [ -126.5114064, 54.186766 ], [ -126.5112552, 54.1867261 ], [ -126.5111035, 54.1867147 ], [ -126.5109798, 54.1867204 ], [ -126.5108866, 54.1867631 ], [ -126.5108203, 54.1868258 ], [ -126.5107857, 54.1869226 ], [ -126.5108097, 54.1870052 ], [ -126.510850600000012, 54.187095 ], [ -126.5108794, 54.1871505 ], [ -126.51090619999998, 54.1872046 ], [ -126.51093370000001, 54.1872502 ], [ -126.5109612, 54.1872958 ], [ -126.5109881, 54.1873499 ], [ -126.511017400000014, 54.187404 ], [ -126.5110584, 54.1874596 ], [ -126.511085899999983, 54.1875051 ], [ -126.5110982, 54.1875593 ], [ -126.5111281, 54.1876048 ], [ -126.5111379, 54.1876589 ], [ -126.511150199999975, 54.1877131 ], [ -126.5111473, 54.1877757 ], [ -126.5111456, 54.1878213 ], [ -126.5111578, 54.1878754 ], [ -126.5111396, 54.1879196 ], [ -126.5111214, 54.1879637 ], [ -126.511102, 54.1880179 ], [ -126.5110691, 54.188062 ], [ -126.5109718, 54.1881503 ], [ -126.5109219, 54.1881945 ], [ -126.5107953, 54.1882628 ], [ -126.510670399999981, 54.1883055 ], [ -126.510532099999978, 54.1883112 ], [ -126.510455299999975, 54.1883013 ], [ -126.5103645, 54.1882899 ], [ -126.510196900000011, 54.1882685 ], [ -126.510092700000015, 54.18824 ], [ -126.5100177, 54.1882115 ], [ -126.5099274, 54.1881645 ], [ -126.5098396, 54.1881175 ], [ -126.509766899999988, 54.188062 ], [ -126.509707800000015, 54.1880164 ], [ -126.5096175, 54.1879694 ], [ -126.5095144, 54.1879039 ], [ -126.5093814, 54.1878199 ], [ -126.5093223, 54.1877743 ], [ -126.509249, 54.1877273 ], [ -126.509116, 54.1876433 ], [ -126.5089972, 54.1875877 ], [ -126.5088934, 54.1875308 ], [ -126.5087118, 54.1874738 ], [ -126.508575799999988, 54.1874524 ], [ -126.5084985, 54.187451 ], [ -126.5083614, 54.1874396 ], [ -126.508269399999989, 54.1874382 ], [ -126.5081317, 54.1874353 ], [ -126.5079927, 54.1874496 ], [ -126.5078686, 54.1875108 ], [ -126.5078174, 54.1875721 ], [ -126.5078145, 54.1876347 ], [ -126.507810299999974, 54.1876803 ], [ -126.507809099999974, 54.1877245 ], [ -126.5078038, 54.1878142 ], [ -126.5078167, 54.1878598 ], [ -126.5078119, 54.1879139 ], [ -126.507809599999987, 54.187968 ], [ -126.507805300000015, 54.1880207 ], [ -126.507803, 54.1880748 ], [ -126.5078013, 54.1881204 ], [ -126.5077965, 54.1881745 ], [ -126.507794699999977, 54.1882272 ], [ -126.5077759, 54.1882728 ], [ -126.5077712, 54.1883269 ], [ -126.507769900000014, 54.1883711 ], [ -126.5077676, 54.1884252 ], [ -126.507764, 54.1884693 ], [ -126.5077616, 54.1885234 ], [ -126.507756899999976, 54.1885776 ], [ -126.507754499999976, 54.1886317 ], [ -126.507748499999977, 54.188702899999988 ], [ -126.5077444, 54.1887755 ], [ -126.5077408, 54.1888467 ], [ -126.5077367, 54.1889194 ], [ -126.5077161, 54.1889906 ], [ -126.5076815, 54.1890532 ], [ -126.5076328, 54.1891145 ], [ -126.5075677, 54.1891672 ], [ -126.50750570000001, 54.1892113 ], [ -126.507441700000015, 54.1892541 ], [ -126.5073912, 54.1893068 ], [ -126.5073437, 54.1893509 ], [ -126.5071836, 54.1894378 ], [ -126.5070911, 54.189472 ], [ -126.5069802, 54.1895232 ], [ -126.5068377, 54.1895745 ], [ -126.506743399999976, 54.1896272 ], [ -126.506649599999989, 54.1896785 ], [ -126.5065516, 54.1897483 ], [ -126.506456700000015, 54.1898095 ], [ -126.506363400000012, 54.1898252 ], [ -126.5062433, 54.1897867 ], [ -126.5061872, 54.1897055 ], [ -126.506160799999989, 54.18965 ], [ -126.5061199, 54.1895603 ], [ -126.506062500000013, 54.1894691 ], [ -126.506036099999989, 54.1894136 ], [ -126.5060227, 54.1893694 ], [ -126.5059817, 54.1893139 ], [ -126.5059531, 54.1892512 ], [ -126.505927299999982, 54.1891871 ], [ -126.5058998, 54.1891145 ], [ -126.5058893, 54.1890419 ], [ -126.5058477, 54.1889607 ], [ -126.5058226, 54.188888 ], [ -126.505765200000013, 54.188824 ], [ -126.5057225, 54.1887599 ], [ -126.5056804, 54.1887143 ], [ -126.505577199999976, 54.188648799999989 ], [ -126.505488199999988, 54.1885847 ], [ -126.5053688, 54.1885377 ], [ -126.505247399999988, 54.1885163 ], [ -126.505107899999985, 54.188532 ], [ -126.5050001, 54.1885477 ], [ -126.504890499999973, 54.1885818 ], [ -126.504795500000014, 54.188616 ], [ -126.5047193, 54.1886317 ], [ -126.504595, 54.1886388 ], [ -126.5045194, 54.1886189 ], [ -126.5043981, 54.1885975 ], [ -126.5042646, 54.188542 ], [ -126.504173099999974, 54.188512 ], [ -126.504023800000013, 54.1884736 ], [ -126.503948099999974, 54.1884537 ], [ -126.5038568, 54.1884437 ], [ -126.503765299999984, 54.1884408 ], [ -126.503627, 54.1884465 ], [ -126.503501, 54.1884722 ], [ -126.5033779, 54.1884964 ], [ -126.5032378, 54.1885206 ], [ -126.5030995, 54.1885534 ], [ -126.503020799999987, 54.188569 ], [ -126.5028661, 54.1885932 ], [ -126.502757699999989, 54.1886174 ], [ -126.502710799999974, 54.188626 ], [ -126.5025585, 54.1886231 ], [ -126.502403699999988, 54.1886203 ], [ -126.502266, 54.1886174 ], [ -126.5021154, 54.1885961 ], [ -126.5020398, 54.1885761 ], [ -126.5019502, 54.1885477 ], [ -126.501753799999989, 54.1884707 ], [ -126.501664799999986, 54.1884337 ], [ -126.5015594, 54.1883953 ], [ -126.501409400000014, 54.1883383 ], [ -126.501273399999974, 54.1883169 ], [ -126.5011498, 54.1883155 ], [ -126.5010572, 54.1883226 ], [ -126.5009505, 54.1883283 ], [ -126.5008286, 54.1883354 ], [ -126.50068850000001, 54.1883597 ], [ -126.5006082, 54.1884209 ], [ -126.5005272, 54.18849070000001 ], [ -126.500477299999986, 54.1885348 ], [ -126.5004116, 54.1886231 ], [ -126.5003788, 54.1886673 ], [ -126.500296, 54.1887556 ], [ -126.5002626, 54.1888083 ], [ -126.500228599999986, 54.1888624 ], [ -126.500194, 54.1889251 ], [ -126.5001605, 54.1889778 ], [ -126.50011, 54.1890305 ], [ -126.5000625, 54.1890746 ], [ -126.5000126, 54.1891188 ], [ -126.4999652, 54.1891629 ], [ -126.4999171, 54.1892156 ], [ -126.4998531, 54.1892583 ], [ -126.49974109999998, 54.1893196 ], [ -126.499630900000014, 54.1893623 ], [ -126.499552900000012, 54.1893965 ], [ -126.4994732, 54.1894221 ], [ -126.4993976, 54.1894292 ], [ -126.4992276, 54.189462 ], [ -126.499115, 54.1895318 ], [ -126.499067599999975, 54.1895759 ], [ -126.4990323, 54.1896201 ], [ -126.4989994, 54.1896642 ], [ -126.49899640000001, 54.1897269 ], [ -126.498977599999975, 54.1897796 ], [ -126.4989759, 54.1898252 ], [ -126.4989711, 54.1898793 ], [ -126.4989827, 54.189942 ], [ -126.498995, 54.1899961 ], [ -126.4989926, 54.1900502 ], [ -126.498987199999974, 54.1901129 ], [ -126.4989697, 54.1901755 ], [ -126.4989344, 54.1902197 ], [ -126.498809, 54.190298 ], [ -126.498665799999984, 54.1903578 ], [ -126.4985891, 54.1903749 ], [ -126.4984976, 54.1903721 ], [ -126.4984203, 54.1903706 ], [ -126.498267899999988, 54.1903407 ], [ -126.498135600000012, 54.1902752 ], [ -126.4980154, 54.1902097 ], [ -126.4979587, 54.1901641 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17087999, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 235856.91893389699, "blue_line_key": 360873822, "length_metre": 1034.35685958302, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2334802, 54.4511605 ], [ -126.2334689, 54.4511234 ], [ -126.2334547, 54.451087799999989 ], [ -126.233309299999988, 54.4509668 ], [ -126.233081899999988, 54.4508899 ], [ -126.2327752, 54.4508913 ], [ -126.2325406, 54.4509312 ], [ -126.232301799999988, 54.4510166 ], [ -126.231967700000013, 54.4511704 ], [ -126.231779699999976, 54.4512374 ], [ -126.2314358, 54.4512744 ], [ -126.2311904, 54.4512687 ], [ -126.231094899999988, 54.4513029 ], [ -126.2310921, 54.4513656 ], [ -126.231133, 54.4514296 ], [ -126.2311762, 54.4514937 ], [ -126.2313977, 54.4516419 ], [ -126.2314251, 54.4516889 ], [ -126.231467, 54.451743 ], [ -126.2314698, 54.4519409 ], [ -126.2314175, 54.4520121 ], [ -126.2313039, 54.4521175 ], [ -126.231085600000014, 54.4521389 ], [ -126.230796399999988, 54.4520777 ], [ -126.230600400000014, 54.4520022 ], [ -126.23031970000001, 54.4518071 ], [ -126.2302834, 54.4516618 ], [ -126.2303193, 54.4516091 ], [ -126.230432299999975, 54.4515122 ], [ -126.230473299999986, 54.4513698 ], [ -126.23045230000001, 54.451216 ], [ -126.230400099999983, 54.4510807 ], [ -126.2303075, 54.4508528 ], [ -126.2302656, 54.4507987 ], [ -126.230139, 54.450625 ], [ -126.2301117, 54.4505708 ], [ -126.2300459, 54.4503985 ], [ -126.2297994, 54.4501763 ], [ -126.2296039, 54.4500994 ], [ -126.229390299999977, 54.4500596 ], [ -126.2292811, 54.4500567 ], [ -126.2291743, 54.4500539 ], [ -126.2290789, 54.450088 ], [ -126.228878900000012, 54.4500923 ], [ -126.228736799999979, 54.4501336 ], [ -126.2285607, 54.450229 ], [ -126.2284742, 54.4503615 ], [ -126.2284235, 54.4504142 ], [ -126.2281986, 54.4505708 ], [ -126.2281014, 54.4506235 ], [ -126.22781, 54.4506164 ], [ -126.2276606, 54.4505409 ], [ -126.2275601, 54.4504313 ], [ -126.227372, 54.4502376 ], [ -126.227182899999988, 54.4500539 ], [ -126.226934199999988, 54.4498858 ], [ -126.2268087, 54.4496679 ], [ -126.2266678, 54.4494657 ], [ -126.2266098, 54.4494016 ], [ -126.226521299999987, 54.4493546 ], [ -126.226399699999988, 54.4493247 ], [ -126.2262758, 54.4493218 ], [ -126.2261844, 54.4493375 ], [ -126.226148599999988, 54.4493831 ], [ -126.2261547, 54.4495169 ], [ -126.2262979, 54.4496921 ], [ -126.226337, 54.4498089 ], [ -126.226331799999983, 54.4498716 ], [ -126.226213, 54.4500396 ], [ -126.2259715, 54.4501877 ], [ -126.225781, 54.4502547 ], [ -126.2257657, 54.4502632 ], [ -126.2257327, 54.4502803 ], [ -126.225718, 54.4502803 ], [ -126.225688, 54.4502889 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17101685, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 12998.0380832463, "blue_line_key": 360877225, "length_metre": 1.58831950503617, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2058736, 54.2508298 ], [ -126.205860499999986, 54.2508177 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17078760, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 125.006341248269, "blue_line_key": 360747751, "length_metre": 600.90532146299404, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4788873, 54.5005022 ], [ -126.4789774, 54.5005321 ], [ -126.4790528, 54.5005691 ], [ -126.4791418, 54.5006161 ], [ -126.479280499999987, 54.5006546 ], [ -126.479658, 54.5007885 ], [ -126.4799156, 54.5008654 ], [ -126.4801481, 54.5010776 ], [ -126.4803134, 54.5011801 ], [ -126.4803887, 54.5012172 ], [ -126.4807197, 54.5013582 ], [ -126.4808087, 54.5014052 ], [ -126.481072, 54.5016273 ], [ -126.481107499999979, 54.5018068 ], [ -126.4811412, 54.5020332 ], [ -126.4811213, 54.5021044 ], [ -126.481094500000012, 54.5022654 ], [ -126.4810581, 54.5023907 ], [ -126.4808736, 54.5026029 ], [ -126.4807283, 54.5027169 ], [ -126.480500400000011, 54.502892 ], [ -126.4804343, 54.5029618 ], [ -126.4803499, 54.5030772 ], [ -126.4803088, 54.5032652 ], [ -126.480342600000014, 54.5034631 ], [ -126.4804002, 54.5035372 ], [ -126.4804426, 54.5035913 ], [ -126.4807075, 54.503795 ], [ -126.4809435, 54.5039972 ], [ -126.481014699999989, 54.5040884 ], [ -126.4810346, 54.5042422 ], [ -126.4810276, 54.5043675 ], [ -126.4809699, 54.504547 ], [ -126.4808691, 54.504688 ], [ -126.4806867, 54.5048731 ], [ -126.4805567, 54.5049785 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091761, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 8093.5695054199796, "blue_line_key": 360862508, "length_metre": 67.105058030365598, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4593652, 54.4152989 ], [ -126.4590128, 54.4152918 ], [ -126.4586873, 54.4152846 ], [ -126.4584264, 54.4152889 ], [ -126.4583355, 54.415269 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17055325, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 27108.2346311691, "blue_line_key": 360856488, "length_metre": 702.53965605139103, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.581127099999989, 54.6245195 ], [ -126.5812864, 54.6244782 ], [ -126.581536699999987, 54.6244013 ], [ -126.5816626, 54.6243856 ], [ -126.5818018, 54.6243885 ], [ -126.5821271, 54.6243871 ], [ -126.5824232, 54.6243842 ], [ -126.5827642, 54.6243728 ], [ -126.58307880000001, 54.6242802 ], [ -126.583457400000015, 54.6241521 ], [ -126.5835976, 54.6241378 ], [ -126.583940500000011, 54.624135 ], [ -126.5840325, 54.6241464 ], [ -126.5841531, 54.6241748 ], [ -126.5844393, 54.6243158 ], [ -126.5848171, 54.6244768 ], [ -126.5850165, 54.6245337 ], [ -126.5851081, 54.6245537 ], [ -126.585491499999989, 54.6246334 ], [ -126.585707, 54.6246292 ], [ -126.586093799999986, 54.6246277 ], [ -126.5864195, 54.6246249 ], [ -126.5866203, 54.6246562 ], [ -126.586896900000013, 54.624689 ], [ -126.587003199999984, 54.6247089 ], [ -126.5873867, 54.6247887 ], [ -126.5877392, 54.624858499999988 ], [ -126.5878632, 54.6248699 ], [ -126.5880019, 54.6248813 ], [ -126.5882957, 54.6248784 ], [ -126.5886686, 54.624867 ], [ -126.589009, 54.624857 ], [ -126.5892547, 54.6249154 ], [ -126.5894679, 54.6249824 ], [ -126.5895709, 54.6250479 ], [ -126.589807099999987, 54.6252416 ], [ -126.5899269, 54.625315600000015 ], [ -126.59025459999998, 54.6255293 ], [ -126.5904446, 54.6257215 ], [ -126.590623099999988, 54.625868199999985 ], [ -126.590712699999983, 54.6259152 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17077739, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 25.691690427533999, "blue_line_key": 360237077, "length_metre": 11.197000197011199, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.324, 54.5067103 ], [ -126.3240115, 54.5067474 ], [ -126.3240106, 54.5067915 ], [ -126.32401, 54.5068001 ], [ -126.324009, 54.50681 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17098557, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 19105.5282637938, "blue_line_key": 360881038, "length_metre": 321.91298530542798, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0955447, 54.3053884 ], [ -126.093322199999989, 54.3028102 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17073211, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 3064.6155658166199, "blue_line_key": 360875378, "length_metre": 551.83825722054405, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4829067, 54.530083 ], [ -126.4830295, 54.5300759 ], [ -126.483371099999985, 54.5300745 ], [ -126.4836013, 54.5300973 ], [ -126.483878, 54.5301201 ], [ -126.4842428, 54.5302354 ], [ -126.4845396, 54.5304405 ], [ -126.4845359, 54.5304932 ], [ -126.484538699999987, 54.5306826 ], [ -126.4845512, 54.5307453 ], [ -126.4845938, 54.5307923 ], [ -126.484835899999979, 54.5308863 ], [ -126.485170900000014, 54.5309746 ], [ -126.485278900000012, 54.5309675 ], [ -126.485602899999989, 54.5309746 ], [ -126.4857579, 54.5309874 ], [ -126.4860138, 54.5310914 ], [ -126.4863462, 54.5312153 ], [ -126.4864216, 54.5312523 ], [ -126.4867829, 54.5314132 ], [ -126.487050899999986, 54.5315528 ], [ -126.487188699999976, 54.5316012 ], [ -126.487491699999978, 54.5316967 ], [ -126.4878084, 54.531802100000014 ], [ -126.488082, 54.5318975 ], [ -126.4882036, 54.5319359 ], [ -126.4884338, 54.5319587 ], [ -126.4886974, 54.5319559 ], [ -126.488958599999989, 54.531953 ], [ -126.4892978, 54.5319587 ], [ -126.4896415, 54.5319302 ], [ -126.4897821, 54.531879 ], [ -126.4900047, 54.5318035 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17075880, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 214407.42620558201, "blue_line_key": 360873822, "length_metre": 201.328559825978, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.380191199999985, 54.5160546 ], [ -126.379542, 54.5162753 ], [ -126.3782975, 54.5163608 ], [ -126.3771961, 54.5162764 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17085291, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 199106.85022620799, "blue_line_key": 360873822, "length_metre": 697.74897413695703, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4976426, 54.4682339 ], [ -126.495911, 54.4685672 ], [ -126.494598, 54.4686355 ], [ -126.494122100000013, 54.4687281 ], [ -126.4933527, 54.4687908 ], [ -126.4932367, 54.468842 ], [ -126.4930857, 54.4690286 ], [ -126.4931592, 54.4694559 ], [ -126.4930594, 54.469678 ], [ -126.49219429999998, 54.4702591 ], [ -126.4915689, 54.4712831 ], [ -126.491130099999978, 54.471563700000011 ], [ -126.4903864, 54.4718329 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17097660, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 15798.523343651899, "blue_line_key": 360886524, "length_metre": 396.63711481236197, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2591908, 54.3214634 ], [ -126.2589742, 54.3212783 ], [ -126.2589056, 54.3211501 ], [ -126.2588946, 54.3210789 ], [ -126.2590131, 54.3209194 ], [ -126.2590485, 54.3208482 ], [ -126.25906, 54.3206872 ], [ -126.2590936, 54.3206416 ], [ -126.259286100000011, 54.3204935 ], [ -126.2594174, 54.3203796 ], [ -126.2595042, 54.3202471 ], [ -126.2597138, 54.320099 ], [ -126.2598146, 54.3199751 ], [ -126.2599649, 54.3197814 ], [ -126.260189200000013, 54.3196604 ], [ -126.2603927, 54.3195835 ], [ -126.260646400000013, 54.3194823 ], [ -126.260841899999988, 54.3193328 ], [ -126.261029599999986, 54.3192659 ], [ -126.261265, 54.3192089 ], [ -126.261428099999975, 54.3190679 ], [ -126.26153930000001, 54.3190166 ], [ -126.2617257, 54.3189668 ], [ -126.2618064, 54.3189326 ], [ -126.261907199999982, 54.3188087 ], [ -126.2618527, 54.3186819 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093054, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 18876.4857976524, "blue_line_key": 360862508, "length_metre": 157.33248697726901, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3436009, 54.4019825 ], [ -126.3434947, 54.401944099999987 ], [ -126.3431797, 54.4018116 ], [ -126.342841400000012, 54.4015795 ], [ -126.3427687, 54.4015154 ], [ -126.3427045, 54.4013245 ], [ -126.342646, 54.401269 ], [ -126.3424738, 54.4010582 ], [ -126.3424142, 54.4010126 ], [ -126.34216, 54.4009087 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17086897, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 234363.65161287901, "blue_line_key": 360873822, "length_metre": 27.664755363195798, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.242643499999986, 54.4580764 ], [ -126.242494600000015, 54.4579924 ], [ -126.2423315, 54.457907 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17079866, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 225794.55272062801, "blue_line_key": 360873822, "length_metre": 111.450821525417, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.282846299999989, 54.4961484 ], [ -126.2816971, 54.4958963 ], [ -126.2814531, 54.4959276 ], [ -126.2812799, 54.4960288 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17077280, "stream_order": 4, "gnis_name": "Cesford Creek", "downstream_route_measure": 933.34895058227903, "blue_line_key": 360765936, "length_metre": 962.39022435719005, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3017798, 54.5091016 ], [ -126.301732, 54.5091187 ], [ -126.3016857, 54.5091457 ], [ -126.30163730000001, 54.5091714 ], [ -126.301571899999985, 54.509197 ], [ -126.301272499999982, 54.5093152 ], [ -126.3009527, 54.5094705 ], [ -126.3008245, 54.5095488 ], [ -126.3005513, 54.509704 ], [ -126.3003094, 54.5098607 ], [ -126.2999857, 54.5100686 ], [ -126.2998075, 54.5101911 ], [ -126.2996113, 54.5103577 ], [ -126.2995438, 54.5104375 ], [ -126.299541299999987, 54.5105001 ], [ -126.2995283, 54.5106967 ], [ -126.29950860000001, 54.5107594 ], [ -126.2994653, 54.5109303 ], [ -126.2993624, 54.5110898 ], [ -126.299228, 54.5112479 ], [ -126.2991328, 54.5113091 ], [ -126.2988615, 54.5114102 ], [ -126.2986294, 54.5114145 ], [ -126.298319799999987, 54.5114159 ], [ -126.298163500000015, 54.5114487 ], [ -126.2980527, 54.5114914 ], [ -126.297828400000014, 54.5116125 ], [ -126.2977803, 54.5116652 ], [ -126.2975482, 54.5118845 ], [ -126.297498, 54.5119642 ], [ -126.2973778, 54.5121238 ], [ -126.2972237, 54.5123445 ], [ -126.2969639, 54.5125453 ], [ -126.29682, 54.5126051 ], [ -126.2966806, 54.5126108 ], [ -126.2963433, 54.5128017 ], [ -126.29600760000001, 54.512974 ], [ -126.2958766, 54.5130879 ], [ -126.2956864, 54.5131819 ], [ -126.295368200000013, 54.5133187 ], [ -126.2949706, 54.5134995 ], [ -126.2946808, 54.5136462 ], [ -126.2944878, 54.5137758 ], [ -126.294392300000013, 54.51381 ], [ -126.294040699999982, 54.5139994 ], [ -126.293912800000015, 54.514042200000013 ], [ -126.293646700000011, 54.5141077 ], [ -126.293505700000011, 54.5141319 ], [ -126.293163299999989, 54.5141775 ], [ -126.2930383, 54.51421160000001 ], [ -126.2929234, 54.51428 ], [ -126.2926052, 54.5144167 ], [ -126.292315599999981, 54.5145905 ], [ -126.2920607, 54.5147286 ], [ -126.2917089, 54.514891 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17075487, "stream_order": 4, "gnis_name": "Robert Hatch Creek", "downstream_route_measure": 0.0, "blue_line_key": 360872999, "length_metre": 2874.2297629285399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.335637899999981, 54.5184843 ], [ -126.335879099999985, 54.5185797 ], [ -126.336013400000013, 54.5186723 ], [ -126.336337, 54.5188959 ], [ -126.3365114, 54.5190696 ], [ -126.3367024, 54.5192448 ], [ -126.3368432, 54.5194371 ], [ -126.3369881, 54.5196108 ], [ -126.337096500000015, 54.5198116 ], [ -126.3372567, 54.5199768 ], [ -126.337371100000013, 54.520105 ], [ -126.337473199999977, 54.5202332 ], [ -126.337628200000012, 54.520434 ], [ -126.3377447, 54.5205351 ], [ -126.3378144, 54.5206719 ], [ -126.3378515, 54.5208171 ], [ -126.337976, 54.521035 ], [ -126.3380778, 54.5211361 ], [ -126.338234199999988, 54.5213469 ], [ -126.3383811, 54.5214666 ], [ -126.338618, 54.5216161 ], [ -126.338976800000012, 54.5218027 ], [ -126.3391381, 54.5219508 ], [ -126.339300200000011, 54.5220619 ], [ -126.3395538, 54.52222 ], [ -126.339869499999978, 54.5223268 ], [ -126.3399925, 54.5223467 ], [ -126.3402652, 54.5224436 ], [ -126.340508, 54.5225205 ], [ -126.3406723, 54.5226045 ], [ -126.3409711, 54.5227455 ], [ -126.3412102, 54.522868 ], [ -126.3415858, 54.523056 ], [ -126.341871, 54.5231799 ], [ -126.3419419, 54.523271 ], [ -126.34210130000001, 54.5234177 ], [ -126.342204299999977, 54.5235018 ], [ -126.3425007, 54.5237054 ], [ -126.3426795, 54.5238179 ], [ -126.3429918, 54.5240045 ], [ -126.3431089, 54.5240971 ], [ -126.343214499999974, 54.524152600000015 ], [ -126.3435107, 54.5243221 ], [ -126.3437036, 54.5244432 ], [ -126.3439084, 54.5246354 ], [ -126.344052, 54.5247921 ], [ -126.344109399999979, 54.5248733 ], [ -126.34419, 54.5250556 ], [ -126.344287, 54.5252194 ], [ -126.3443891, 54.5253475 ], [ -126.344653099999974, 54.5255597 ], [ -126.344771299999977, 54.5256352 ], [ -126.3450825, 54.5258389 ], [ -126.345168799999982, 54.5259215 ], [ -126.3453101, 54.5261408 ], [ -126.3453505, 54.5262491 ], [ -126.345400900000016, 54.5264128 ], [ -126.3454228, 54.5265667 ], [ -126.3455013, 54.5267831 ], [ -126.3455516, 54.5269469 ], [ -126.3455899, 54.5270822 ], [ -126.3456234, 54.5272802 ], [ -126.3456765, 54.5274084 ], [ -126.345757600000013, 54.527589199999987 ], [ -126.345823799999977, 54.5277431 ], [ -126.34601330000001, 54.5279367 ], [ -126.3461575, 54.528092 ], [ -126.3463342, 54.5282316 ], [ -126.3463927, 54.5282956 ], [ -126.346565, 54.5284965 ], [ -126.3466288, 54.5287058 ], [ -126.346622900000014, 54.5287856 ], [ -126.3466228, 54.5290021 ], [ -126.3466161, 54.5291188 ], [ -126.3466855, 54.5292285 ], [ -126.346800299999984, 54.5293837 ], [ -126.3468506, 54.5295546 ], [ -126.3469139, 54.5297726 ], [ -126.3469219, 54.5298893 ], [ -126.346895, 54.5300773 ], [ -126.3468103, 54.5301927 ], [ -126.3466947, 54.5302981 ], [ -126.3464179, 54.5304989 ], [ -126.3463342, 54.5306043 ], [ -126.346329299999979, 54.530667 ], [ -126.346335200000013, 54.5308108 ], [ -126.3463465, 54.5308834 ], [ -126.346403900000013, 54.5309575 ], [ -126.346517299999988, 54.531102800000014 ], [ -126.346620500000014, 54.5312139 ], [ -126.3468391, 54.5314161 ], [ -126.346997, 54.5315813 ], [ -126.347142299999987, 54.5317194 ], [ -126.3472295, 54.5318206 ], [ -126.3473895, 54.5319587 ], [ -126.347564100000014, 54.5321325 ], [ -126.347894700000012, 54.532302 ], [ -126.3480607, 54.5323603 ], [ -126.348350599999975, 54.5324016 ], [ -126.3484884, 54.5324145 ], [ -126.3488301, 54.532413 ], [ -126.349184099999974, 54.5324116 ], [ -126.3494319, 54.5324259 ], [ -126.3497233, 54.5324415 ], [ -126.349955900000012, 54.5324643 ], [ -126.3500926, 54.5324942 ], [ -126.3503814, 54.5325455 ], [ -126.3506885, 54.5325797 ], [ -126.350844599999988, 54.5325825 ], [ -126.351197, 54.5325996 ], [ -126.3514778, 54.5325968 ], [ -126.351737899999975, 54.532611 ], [ -126.351981399999985, 54.5326794 ], [ -126.352327300000013, 54.5328403 ], [ -126.3525325, 54.532997 ], [ -126.3526035, 54.5330881 ], [ -126.3527315, 54.5332619 ], [ -126.352842, 54.5334712 ], [ -126.3529562, 54.533635 ], [ -126.3530311, 54.5336735 ], [ -126.353324199999989, 54.5338871 ], [ -126.353619200000011, 54.5338928 ], [ -126.353929, 54.5338914 ], [ -126.3540376, 54.5338757 ], [ -126.3541159, 54.5338415 ], [ -126.3543438, 54.5336749 ], [ -126.3544848, 54.5336507 ], [ -126.354591899999988, 54.5336535 ], [ -126.3549163, 54.5336521 ], [ -126.355193899999989, 54.5336934 ], [ -126.3554549, 54.5337262 ], [ -126.3557121, 54.5338045 ], [ -126.3558808, 54.5338344 ], [ -126.3561701, 54.5338771 ], [ -126.356536399999982, 54.5339384 ], [ -126.356691499999982, 54.5339512 ], [ -126.3567988, 54.5339811 ], [ -126.3569919, 54.5341022 ], [ -126.357093, 54.5341848 ], [ -126.3571646, 54.5342674 ], [ -126.3573208, 54.5344867 ], [ -126.3573808, 54.5345323 ], [ -126.357632699999982, 54.5346818 ], [ -126.3579908, 54.5348783 ], [ -126.3583068, 54.5350478 ], [ -126.358512499999989, 54.5351959 ], [ -126.3586574, 54.5353426 ], [ -126.35872950000001, 54.5354167 ], [ -126.3589216, 54.5355548 ], [ -126.3592068, 54.5357144 ], [ -126.359444599999975, 54.535826899999989 ], [ -126.359594899999976, 54.5359024 ], [ -126.359821, 54.5360063 ], [ -126.360194899999982, 54.5361858 ], [ -126.360404699999975, 54.5363154 ], [ -126.360523, 54.536390900000015 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17066094, "stream_order": 5, "gnis_name": "Richfield Creek", "downstream_route_measure": 10883.3889119877, "blue_line_key": 360788426, "length_metre": 1469.3851048206, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2888127, 54.5679058 ], [ -126.288456, 54.5679072 ], [ -126.288101699999984, 54.5679086 ], [ -126.28800720000001, 54.5679328 ], [ -126.2877514, 54.5680525 ], [ -126.287492300000011, 54.5682091 ], [ -126.2873782, 54.568296 ], [ -126.287197299999988, 54.5684541 ], [ -126.2869756, 54.5685395 ], [ -126.2867115, 54.568578 ], [ -126.2865066, 54.5686364 ], [ -126.2864237, 54.5686976 ], [ -126.28624, 54.5688913 ], [ -126.286109, 54.5690053 ], [ -126.285818299999974, 54.5691961 ], [ -126.2856444, 54.5692645 ], [ -126.285292399999989, 54.5694268 ], [ -126.2850653, 54.5695835 ], [ -126.284778300000013, 54.5697216 ], [ -126.284697, 54.5697644 ], [ -126.284359, 54.56996370000001 ], [ -126.2842806, 54.5699979 ], [ -126.2840272, 54.5700549 ], [ -126.283852700000011, 54.5701318 ], [ -126.2837091, 54.5702187 ], [ -126.283642, 54.5702628 ], [ -126.283444100000011, 54.5704551 ], [ -126.2833593, 54.5705705 ], [ -126.2832092, 54.5707385 ], [ -126.283174300000013, 54.5708097 ], [ -126.2830674, 54.5709949 ], [ -126.2828457, 54.5710803 ], [ -126.2825056, 54.5710903 ], [ -126.282379699999979, 54.571106 ], [ -126.2820438, 54.5712783 ], [ -126.281940099999986, 54.5714193 ], [ -126.281828, 54.5715076 ], [ -126.2817157, 54.5715403 ], [ -126.2816086, 54.5715375 ], [ -126.28131519999998, 54.5715403 ], [ -126.2810057, 54.5715332 ], [ -126.2809118, 54.5715489 ], [ -126.280753100000013, 54.5716087 ], [ -126.2805413, 54.5717568 ], [ -126.2803968, 54.5718252 ], [ -126.280192899999989, 54.5719021 ], [ -126.2800833, 54.5718992 ], [ -126.2797727, 54.5719021 ], [ -126.2794434, 54.5719932 ], [ -126.2791413, 54.5721114 ], [ -126.2790332, 54.5721186 ], [ -126.27864550000001, 54.57211 ], [ -126.2784281, 54.5721414 ], [ -126.278115899999989, 54.5721698 ], [ -126.2780072, 54.5721855 ], [ -126.277691199999978, 54.5722596 ], [ -126.2775803, 54.5723023 ], [ -126.277261400000015, 54.5724476 ], [ -126.2770039, 54.5725857 ], [ -126.2769244, 54.572637 ], [ -126.276692900000015, 54.5728478 ], [ -126.2765799, 54.5729176 ], [ -126.2764685, 54.5729688 ], [ -126.276374, 54.572993 ], [ -126.276233299999987, 54.5730087 ], [ -126.2761257, 54.5730144 ], [ -126.2758004, 54.5730173 ], [ -126.275764599999988, 54.5730699 ], [ -126.275703100000015, 54.5732935 ], [ -126.275654499999987, 54.5733548 ], [ -126.2755865, 54.5734431 ], [ -126.275393200000011, 54.5735385 ], [ -126.2752987, 54.5735627 ], [ -126.275173900000013, 54.5735684 ], [ -126.2749266, 54.5735727 ], [ -126.2746024, 54.5735656 ], [ -126.2742308, 54.5735741 ], [ -126.2741374, 54.5735812 ], [ -126.2740418, 54.5736154 ], [ -126.273939, 54.5737749 ], [ -126.2739041, 54.5738461 ], [ -126.273796, 54.5740413 ], [ -126.2737817, 54.5742563 ], [ -126.273644499999975, 54.5744785 ], [ -126.2735478, 54.5745298 ], [ -126.2732826, 54.5745782 ], [ -126.2731556, 54.5746109 ], [ -126.2729937, 54.5747149 ], [ -126.2728089, 54.5749186 ], [ -126.2726728, 54.5751308 ], [ -126.272607, 54.575192 ], [ -126.27242840000001, 54.5752874 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091816, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 12896.280090420199, "blue_line_key": 360846413, "length_metre": 108.642779113617, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2807297, 54.4162082 ], [ -126.2808624, 54.4152379 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17089129, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 276839.816557149, "blue_line_key": 360873822, "length_metre": 28.195476985806899, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1427231, 54.4401627 ], [ -126.1426836, 54.4402795 ], [ -126.1425974, 54.4404034 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104123, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 4105.9636742464099, "blue_line_key": 360882583, "length_metre": 438.55234779105899, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.003189400000011, 54.2177155 ], [ -126.0030832, 54.2179106 ], [ -126.0030665, 54.2179362 ], [ -126.0029696, 54.2179875 ], [ -126.0029073, 54.2180046 ], [ -126.002599600000011, 54.2180331 ], [ -126.0022805, 54.2179804 ], [ -126.0022201, 54.2179789 ], [ -126.0021712, 54.2179861 ], [ -126.0020651, 54.2179832 ], [ -126.0018959, 54.218006 ], [ -126.001585, 54.218043 ], [ -126.001524699999976, 54.2180416 ], [ -126.0014777, 54.2180501 ], [ -126.0011522, 54.2180872 ], [ -126.000796099999988, 54.2181413 ], [ -126.0005259, 54.2182595 ], [ -126.0003209, 54.2183264 ], [ -126.000198200000014, 54.2183421 ], [ -125.9999989, 54.2183279 ], [ -125.9999562, 54.2183378 ], [ -125.999772, 54.2183421 ], [ -125.9996779, 54.2183264 ], [ -125.999583799999982, 54.2183108 ], [ -125.9994911, 54.218278 ], [ -125.9994378, 54.2181983 ], [ -125.99943589999998, 54.2181441 ], [ -125.9993657, 54.2180373 ], [ -125.9992685, 54.2179775 ], [ -125.999224099999978, 54.2179789 ], [ -125.9991761, 54.2179704 ], [ -125.9991147, 54.2179718 ], [ -125.9990708, 54.2179918 ], [ -125.9988039, 54.2181142 ], [ -125.998790899999975, 54.2181427 ], [ -125.9987614, 54.2181698 ], [ -125.9985874, 54.2183179 ], [ -125.9983852, 54.218476 ], [ -125.9980537, 54.2185557 ], [ -125.997932100000014, 54.2185686 ], [ -125.9977471, 54.2185814 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17088429, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 188767.746223325, "blue_line_key": 360873822, "length_metre": 1336.61433547827, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5580373, 54.4447586 ], [ -126.558387400000015, 54.445166 ], [ -126.5584153, 54.4455704 ], [ -126.558220600000013, 54.4457912 ], [ -126.5576911, 54.4460874 ], [ -126.5575969, 54.4463011 ], [ -126.557710500000013, 54.446509 ], [ -126.5584097, 54.4472567 ], [ -126.5584893, 54.4477025 ], [ -126.5582744, 54.4478691 ], [ -126.557892700000011, 54.4479731 ], [ -126.5571523, 54.4480101 ], [ -126.5567718, 54.4478862 ], [ -126.556308500000014, 54.4474803 ], [ -126.5562904, 54.4465987 ], [ -126.5561946, 54.446452 ], [ -126.555913100000012, 54.4463182 ], [ -126.555340199999975, 54.4462826 ], [ -126.554792800000016, 54.4465176 ], [ -126.55468879999998, 54.4466329 ], [ -126.5546848, 54.446749700000012 ], [ -126.5556187, 54.4477723 ], [ -126.5556944, 54.4480187 ], [ -126.555581, 54.4481611 ], [ -126.555174400000013, 54.448238 ], [ -126.5548982, 54.4482294 ], [ -126.5546241, 54.4481867 ], [ -126.5540196, 54.4479745 ], [ -126.553426899999977, 54.4479745 ], [ -126.5531536, 54.4480557 ], [ -126.5525836, 54.4484815 ], [ -126.5518848, 54.4487151 ], [ -126.551124699999988, 54.4486681 ], [ -126.5506756, 54.448453 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17092031, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 179282.666915273, "blue_line_key": 360873822, "length_metre": 652.26966226433001, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6255523, 54.4119406 ], [ -126.62495, 54.4120887 ], [ -126.6241421, 54.4120403 ], [ -126.6231584, 54.4119135 ], [ -126.621987800000014, 54.4118879 ], [ -126.6216866, 54.4119235 ], [ -126.6200675, 54.412328 ], [ -126.6194743, 54.4127097 ], [ -126.618968599999988, 54.4129461 ], [ -126.618550899999988, 54.4130771 ], [ -126.6175405, 54.4132936 ], [ -126.6173036, 54.4133904 ], [ -126.6171213, 54.4135485 ], [ -126.6171092, 54.4139274 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102679, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 29326.711248145599, "blue_line_key": 360881038, "length_metre": 332.32773171577003, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0672567, 54.2389291 ], [ -126.0673452, 54.238761 ], [ -126.0673497, 54.2387154 ], [ -126.067309599999973, 54.2386257 ], [ -126.067226, 54.238514599999988 ], [ -126.0671482, 54.2383152 ], [ -126.0672624, 54.2382098 ], [ -126.06731760000001, 54.2380859 ], [ -126.0673495, 54.2380589 ], [ -126.0673887, 54.2379521 ], [ -126.0674329, 54.2377655 ], [ -126.0674794, 54.2377384 ], [ -126.0676364, 54.2377156 ], [ -126.0679455, 54.2376701 ], [ -126.0680086, 54.237644400000015 ], [ -126.0680749, 54.2375832 ], [ -126.068110800000014, 54.237512 ], [ -126.068097599999987, 54.2374749 ], [ -126.0679409, 54.2372912 ], [ -126.0677056, 54.2371687 ], [ -126.0676043, 54.2370861 ], [ -126.0675904, 54.2370576 ], [ -126.067572899999988, 54.2368597 ], [ -126.067657200000014, 54.2367628 ], [ -126.067673899999988, 54.2367372 ], [ -126.0677389, 54.2366931 ], [ -126.067790100000011, 54.2366133 ], [ -126.067834800000014, 54.2364253 ], [ -126.0678508, 54.2364082 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17095362, "stream_order": 4, "gnis_name": "Dungate Creek", "downstream_route_measure": 11.570182270718201, "blue_line_key": 360760898, "length_metre": 2289.9972069804198, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6216877, 54.3604868 ], [ -126.621668500000013, 54.3605765 ], [ -126.6215988, 54.3606918 ], [ -126.621440799999988, 54.3607873 ], [ -126.6213305, 54.36083 ], [ -126.6209727, 54.3608955 ], [ -126.620847799999979, 54.3609382 ], [ -126.6207169, 54.3610607 ], [ -126.6206656, 54.3611234 ], [ -126.620553, 54.3612288 ], [ -126.6203297, 54.3613498 ], [ -126.6201097, 54.361426699999981 ], [ -126.6200021, 54.3614339 ], [ -126.619675199999989, 54.3614809 ], [ -126.619442099999986, 54.3615392 ], [ -126.6192977, 54.3616446 ], [ -126.619208199999974, 54.3618583 ], [ -126.6191433, 54.361911 ], [ -126.618813, 54.3620306 ], [ -126.618539899999988, 54.3622314 ], [ -126.618440799999988, 54.3623468 ], [ -126.6182354, 54.3624237 ], [ -126.618142, 54.3624393 ], [ -126.618001799999973, 54.3624906 ], [ -126.6178768, 54.3625333 ], [ -126.617495800000015, 54.3627142 ], [ -126.617401199999989, 54.3627399 ], [ -126.6170445, 54.3627954 ], [ -126.6168116, 54.3628182 ], [ -126.6165176, 54.3628481 ], [ -126.616425, 54.3628823 ], [ -126.6161931, 54.3628951 ], [ -126.6160992, 54.3629122 ], [ -126.6157717, 54.3629677 ], [ -126.6154438, 54.3628082 ], [ -126.615231200000011, 54.3627242 ], [ -126.615139899999988, 54.3627128 ], [ -126.614755100000011, 54.3627228 ], [ -126.6146907, 54.3627669 ], [ -126.6146536, 54.3629008 ], [ -126.614504899999986, 54.3630603 ], [ -126.614407699999987, 54.3631215 ], [ -126.6142194, 54.3631984 ], [ -126.6141113, 54.3632141 ], [ -126.6140037, 54.3632212 ], [ -126.6136784, 54.3632497 ], [ -126.6134324, 54.363254 ], [ -126.6133245, 54.3632341 ], [ -126.6131291, 54.36315 ], [ -126.612952599999986, 54.3630119 ], [ -126.6127889, 54.3629278 ], [ -126.6125939, 54.3628424 ], [ -126.6124855, 54.362831 ], [ -126.6123472, 54.3628282 ], [ -126.6122072, 54.3628438 ], [ -126.6121439, 54.362878 ], [ -126.6120961, 54.3629307 ], [ -126.612031800000011, 54.3629748 ], [ -126.611742899999982, 54.3631856 ], [ -126.611551100000014, 54.3632796 ], [ -126.611459, 54.3633053 ], [ -126.6113353, 54.3633024 ], [ -126.6112288, 54.3632924 ], [ -126.6111372, 54.363254 ], [ -126.6108712, 54.3630503 ], [ -126.610782, 54.3630048 ], [ -126.6106782, 54.3629663 ], [ -126.610462699999985, 54.362953499999989 ], [ -126.6100784, 54.3629549 ], [ -126.6098439, 54.3630033 ], [ -126.6096845, 54.3630817 ], [ -126.609576300000015, 54.3630973 ], [ -126.6093602, 54.3630931 ], [ -126.6092401, 54.3630731 ], [ -126.609060899999989, 54.3629706 ], [ -126.6089293, 54.3628509 ], [ -126.608838699999978, 54.3627954 ], [ -126.6086615, 54.3627014 ], [ -126.6082841, 54.3625504 ], [ -126.608008, 54.3625362 ], [ -126.607671299999978, 54.3625205 ], [ -126.607333700000012, 54.3624863 ], [ -126.6071209, 54.3624379 ], [ -126.6068136, 54.3624223 ], [ -126.606445, 54.3624066 ], [ -126.606339, 54.3623952 ], [ -126.606154499999988, 54.3623639 ], [ -126.605895499999974, 54.3623496 ], [ -126.605787600000014, 54.3623297 ], [ -126.605466600000014, 54.3622969 ], [ -126.605221500000013, 54.3622642 ], [ -126.605071200000012, 54.3622257 ], [ -126.604860500000015, 54.3621502 ], [ -126.6045571, 54.3620534 ], [ -126.6044209, 54.3620235 ], [ -126.6043307, 54.361995 ], [ -126.6039668, 54.3618896 ], [ -126.6037691, 54.3618398 ], [ -126.6036779, 54.3618212 ], [ -126.6032933, 54.3617956 ], [ -126.6030797, 54.3617913 ], [ -126.6028446, 54.3618483 ], [ -126.6027651, 54.361901 ], [ -126.602714800000015, 54.361953699999987 ], [ -126.602635299999989, 54.3620064 ], [ -126.6025864, 54.3620691 ], [ -126.6024892, 54.3621303 ], [ -126.6024253, 54.362173 ], [ -126.602123299999974, 54.3623653 ], [ -126.6019024, 54.3624237 ], [ -126.6017948, 54.3624308 ], [ -126.60157980000001, 54.3624166 ], [ -126.601488499999988, 54.362398 ], [ -126.6013243, 54.3623226 ], [ -126.6012639, 54.3622855 ], [ -126.600983899999989, 54.3620733 ], [ -126.600912099999974, 54.3619993 ], [ -126.6007682, 54.361817 ], [ -126.6007167, 54.3616361 ], [ -126.600661, 54.361572 ], [ -126.600421499999982, 54.3614324 ], [ -126.600304499999979, 54.3613128 ], [ -126.600238100000013, 54.3611675 ], [ -126.6000635, 54.3609753 ], [ -126.600003699999988, 54.3609297 ], [ -126.599958899999976, 54.3609112 ], [ -126.599734699999985, 54.3608257 ], [ -126.599463899999989, 54.3606847 ], [ -126.599147800000011, 54.3605893 ], [ -126.599043099999989, 54.3605323 ], [ -126.5987874, 54.3604113 ], [ -126.59865520000001, 54.3603002 ], [ -126.598387500000015, 54.3601506 ], [ -126.5981763, 54.3600837 ], [ -126.5978719, 54.3599968 ], [ -126.597783799999988, 54.3599413 ], [ -126.5974892, 54.3597291 ], [ -126.597445099999987, 54.3596735 ], [ -126.5974231, 54.3595482 ], [ -126.5974153, 54.3594029 ], [ -126.5974832, 54.359279 ], [ -126.597487500000014, 54.3592249 ], [ -126.597430499999987, 54.3591437 ], [ -126.597203799999974, 54.3590583 ], [ -126.596887400000014, 54.3589429 ], [ -126.596783099999982, 54.3589059 ], [ -126.596463500000013, 54.3588276 ], [ -126.596283199999988, 54.3587421 ], [ -126.5959523, 54.3586196 ], [ -126.595845700000012, 54.3586168 ], [ -126.5957216, 54.3586153 ], [ -126.5954865, 54.3586723 ], [ -126.595286, 54.3586866 ], [ -126.5949757, 54.358735 ], [ -126.5948833, 54.358733600000015 ], [ -126.5944985, 54.3587435 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17101119, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 11584.822323394799, "blue_line_key": 360877225, "length_metre": 138.22865897893999, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2044455, 54.2617207 ], [ -126.20442, 54.2616566 ], [ -126.204277599999983, 54.2614914 ], [ -126.204107199999982, 54.2612891 ], [ -126.204038, 54.2611709 ], [ -126.204026, 54.2611168 ], [ -126.2039681, 54.2610613 ], [ -126.2039586, 54.2609801 ], [ -126.2039726, 54.2607736 ], [ -126.2040248, 54.2607038 ], [ -126.2041253, 54.260561400000014 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102460, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 29008.853204688101, "blue_line_key": 360881038, "length_metre": 240.80911676601201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.066088399999984, 54.2411223 ], [ -126.065986900000013, 54.2410469 ], [ -126.0659732, 54.2410113 ], [ -126.0659918, 54.2409671 ], [ -126.0661663, 54.2408902 ], [ -126.0661981, 54.2408631 ], [ -126.0662168, 54.240819 ], [ -126.0662055, 54.2407834 ], [ -126.066177, 54.2407549 ], [ -126.0660001, 54.2406524 ], [ -126.065985700000013, 54.2406253 ], [ -126.066198, 54.2404587 ], [ -126.06623, 54.2404245 ], [ -126.066249199999987, 54.2403789 ], [ -126.0662208, 54.2403433 ], [ -126.066088399999984, 54.2402593 ], [ -126.065958599999973, 54.2401482 ], [ -126.0659307, 54.2401112 ], [ -126.065918200000013, 54.2400656 ], [ -126.065968699999985, 54.2399944 ], [ -126.066121, 54.2397921 ], [ -126.0661706, 54.2397565 ], [ -126.066480500000011, 54.2397024 ], [ -126.0666774, 54.2395443 ], [ -126.0667784, 54.2394218 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17086481, "stream_order": 4, "gnis_name": "Raspberry Creek", "downstream_route_measure": 3644.2226557883901, "blue_line_key": 360817924, "length_metre": 78.103266892060603, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6207679, 54.4596616 ], [ -126.6211326, 54.4597684 ], [ -126.6212535, 54.4598154 ], [ -126.6213426, 54.4598624 ], [ -126.6215645, 54.4600561 ], [ -126.621668199999988, 54.4601031 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17106535, "stream_order": 4, "gnis_name": "Buck Creek", "downstream_route_measure": 62875.165676716599, "blue_line_key": 360886221, "length_metre": 73.735899999970599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.37383, 54.1791178 ], [ -126.372697699999989, 54.1791213 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17079856, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 225906.00354215299, "blue_line_key": 360873822, "length_metre": 158.567136626766, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2812799, 54.4960288 ], [ -126.2811302, 54.4961883 ], [ -126.2810519, 54.4962225 ], [ -126.2807249, 54.4962595 ], [ -126.2806316, 54.4962666 ], [ -126.2802749, 54.4962766 ], [ -126.280168, 54.4962737 ], [ -126.2800787, 54.4962353 ], [ -126.2799447, 54.4961427 ], [ -126.2796453, 54.4960188 ], [ -126.2795532, 54.4960088 ], [ -126.2792002, 54.4959462 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076252, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 207279.338042836, "blue_line_key": 360873822, "length_metre": 354.33605910177403, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4489993, 54.5139453 ], [ -126.4485755, 54.5140208 ], [ -126.448164299999988, 54.5140251 ], [ -126.4467365, 54.5137231 ], [ -126.4459757, 54.5136676 ], [ -126.444964, 54.5139439 ], [ -126.4437907, 54.514149 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17087579, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 278447.81219369097, "blue_line_key": 360873822, "length_metre": 119.398184913132, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.143824400000014, 54.4527143 ], [ -126.144070899999988, 54.452935 ], [ -126.1443796, 54.4531672 ], [ -126.144600899999986, 54.4533082 ], [ -126.1448368, 54.4534563 ], [ -126.144969699999976, 54.4535503 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17077009, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 216161.475107212, "blue_line_key": 360873822, "length_metre": 432.01015827790002, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3609734, 54.5106696 ], [ -126.359902, 54.5103748 ], [ -126.358770799999988, 54.510278 ], [ -126.3584738, 54.5104318 ], [ -126.357881299999988, 54.5110698 ], [ -126.3574947, 54.5111368 ], [ -126.357001700000012, 54.5111154 ], [ -126.3567722, 54.510973 ], [ -126.356409499999984, 54.5103933 ], [ -126.3561105, 54.510232399999985 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17067117, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 7961.7434640942702, "blue_line_key": 360856488, "length_metre": 447.25642832003598, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4473005, 54.5621135 ], [ -126.4473745, 54.562169 ], [ -126.4473855, 54.5622502 ], [ -126.4473295, 54.5624112 ], [ -126.4472599, 54.5625265 ], [ -126.4471242, 54.5627117 ], [ -126.447007199999987, 54.5628712 ], [ -126.44692329999998, 54.562978 ], [ -126.4467425, 54.5631446 ], [ -126.4467073, 54.5632244 ], [ -126.44668080000001, 54.5633853 ], [ -126.4467212, 54.563495 ], [ -126.4469569, 54.5636787 ], [ -126.4470136, 54.5637699 ], [ -126.447035799999981, 54.5638966 ], [ -126.4470878, 54.5640504 ], [ -126.447139899999982, 54.5642042 ], [ -126.4472356, 54.5643951 ], [ -126.4473642, 54.5645688 ], [ -126.4474367, 54.5646429 ], [ -126.4475432, 54.5646899 ], [ -126.4477694, 54.5647668 ], [ -126.4478738, 54.5648409 ], [ -126.447932, 54.5649135 ], [ -126.4480581, 54.5651229 ], [ -126.4481889, 54.5652339 ], [ -126.4482959, 54.5652724 ], [ -126.4483689, 54.565345 ], [ -126.44841049999998, 54.5654091 ], [ -126.4484452, 54.5655985 ], [ -126.44840809999998, 54.5657054 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17055111, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 23751.437526493901, "blue_line_key": 360856488, "length_metre": 363.75991869714301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.543772, 54.62894450000001 ], [ -126.5433813, 54.6270617 ], [ -126.5432822, 54.6257003 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17098770, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 27164.496374749298, "blue_line_key": 360880905, "length_metre": 62.429228222720802, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4252701, 54.2984226 ], [ -126.4254489, 54.2985166 ], [ -126.4255389, 54.2985721 ], [ -126.4255812, 54.2986177 ], [ -126.4256229, 54.2986718 ], [ -126.4256359, 54.2987174 ], [ -126.4256636, 54.2987629 ], [ -126.4256914, 54.2988356 ], [ -126.4256873, 54.2988812 ], [ -126.4256861, 54.298898199999989 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17075872, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 211299.01850896, "blue_line_key": 360873822, "length_metre": 642.30503705988895, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.404318, 54.5184301 ], [ -126.4038824, 54.5185598 ], [ -126.4037072, 54.518562599999989 ], [ -126.4033715, 54.5184914 ], [ -126.4032659, 54.5184216 ], [ -126.403226, 54.5182065 ], [ -126.4035203, 54.5174161 ], [ -126.403538199999986, 54.5168194 ], [ -126.4034909, 54.5167026 ], [ -126.403260499999973, 54.5164989 ], [ -126.402831600000013, 54.5162668 ], [ -126.4025158, 54.5162226 ], [ -126.4019278, 54.5164021 ], [ -126.401757499999988, 54.516412 ], [ -126.4012856, 54.5163095 ], [ -126.4007707, 54.5160987 ], [ -126.400567599999988, 54.5160831 ], [ -126.4004677, 54.51613 ], [ -126.400314, 54.5163095 ], [ -126.400283800000011, 54.5165075 ], [ -126.4004217, 54.5168137 ], [ -126.4007736, 54.5172794 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17072501, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 3973.1250076095998, "blue_line_key": 360856488, "length_metre": 760.15739298771598, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4293729, 54.5348271 ], [ -126.4294934, 54.5348826 ], [ -126.429567299999988, 54.5349382 ], [ -126.4295568, 54.5350735 ], [ -126.4295037, 54.5351974 ], [ -126.4294386, 54.5352501 ], [ -126.4293585, 54.5352757 ], [ -126.4292634, 54.5353369 ], [ -126.429244, 54.5353996 ], [ -126.42925120000001, 54.5355335 ], [ -126.4293056, 54.5356517 ], [ -126.4293323, 54.5357158 ], [ -126.429422499999987, 54.5357528 ], [ -126.429543, 54.5358012 ], [ -126.4298035, 54.5358425 ], [ -126.4299812, 54.5359451 ], [ -126.430039799999989, 54.5360092 ], [ -126.430001, 54.5361345 ], [ -126.4299359, 54.5361872 ], [ -126.4298577, 54.5362214 ], [ -126.4297487, 54.53621 ], [ -126.4295202, 54.5361687 ], [ -126.429425299999977, 54.5361943 ], [ -126.429360199999977, 54.536247 ], [ -126.429303499999975, 54.5364165 ], [ -126.429309100000012, 54.536568900000013 ], [ -126.429362, 54.5367056 ], [ -126.4295411, 54.5368252 ], [ -126.429736699999978, 54.5368836 ], [ -126.4298309, 54.536895 ], [ -126.4301702, 54.5368936 ], [ -126.4302918, 54.5369321 ], [ -126.430394599999985, 54.536996099999989 ], [ -126.430459899999988, 54.5371955 ], [ -126.4304325, 54.5373935 ], [ -126.430382099999974, 54.5374462 ], [ -126.430303399999985, 54.5374889 ], [ -126.430081199999989, 54.5375559 ], [ -126.4299872, 54.5376 ], [ -126.4298399, 54.5377125 ], [ -126.429707099999987, 54.537853500000011 ], [ -126.4296709, 54.5379432 ], [ -126.429721099999981, 54.5381156 ], [ -126.429748300000014, 54.5381782 ], [ -126.4298808, 54.5382979 ], [ -126.430168, 54.5384033 ], [ -126.4302875, 54.5384688 ], [ -126.4304358, 54.5385713 ], [ -126.430520300000012, 54.538681 ], [ -126.430695199999988, 54.5388547 ], [ -126.430747399999987, 54.539035600000012 ], [ -126.430752599999977, 54.5391894 ], [ -126.4307258, 54.5393504 ], [ -126.430706399999977, 54.539413 ], [ -126.4306197, 54.5395911 ], [ -126.430544099999977, 54.5397862 ], [ -126.4305172, 54.5399756 ], [ -126.430509699999988, 54.5401095 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17103671, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 31536.6330516698, "blue_line_key": 360881038, "length_metre": 413.63773211310399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0636253, 54.2261098 ], [ -126.0635699, 54.2260086 ], [ -126.063425599999988, 54.2258975 ], [ -126.0633647, 54.2258776 ], [ -126.0633043, 54.225876199999988 ], [ -126.063256, 54.2259018 ], [ -126.0632227, 54.225946 ], [ -126.0632596, 54.2260642 ], [ -126.0632563, 54.2260998 ], [ -126.06320909999998, 54.2261354 ], [ -126.0631456, 54.2261425 ], [ -126.063025, 54.2261126 ], [ -126.0629231, 54.2260385 ], [ -126.0628701, 54.2259374 ], [ -126.062799399999989, 54.2258648 ], [ -126.0627531, 54.2258448 ], [ -126.0626313, 54.2258249 ], [ -126.0625444, 54.2257765 ], [ -126.0625173, 54.2257309 ], [ -126.062518900000015, 54.2256868 ], [ -126.062625399999988, 54.2254831 ], [ -126.0626293, 54.2254461 ], [ -126.0626985, 54.2253307 ], [ -126.062714199999988, 54.2251157 ], [ -126.0626727, 54.225043 ], [ -126.0626284, 54.2250245 ], [ -126.0625668, 54.2250131 ], [ -126.062333899999985, 54.2250701 ], [ -126.0622711, 54.2250687 ], [ -126.062213299999982, 54.2250402 ], [ -126.062168500000013, 54.2250031 ], [ -126.0621176, 54.2248764 ], [ -126.0621231, 54.2247952 ], [ -126.0620499, 54.2247226 ], [ -126.0619313, 54.2246741 ], [ -126.0618148, 54.2246001 ], [ -126.0618272, 54.2244206 ], [ -126.061874899999978, 54.2244035 ], [ -126.0619381, 54.224350900000012 ], [ -126.0619427, 54.2243053 ], [ -126.0619144, 54.2242697 ], [ -126.061597, 54.2241985 ], [ -126.061501599999986, 54.2242326 ], [ -126.0614669, 54.2242939 ], [ -126.0614351, 54.2243209 ], [ -126.061325599999975, 54.2243537 ], [ -126.0612798, 54.2243523 ], [ -126.0612348, 54.2243423 ], [ -126.0611899, 54.2243053 ], [ -126.0611628, 54.2242597 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17097014, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 14497.9685293738, "blue_line_key": 360886524, "length_metre": 327.93614416422798, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.26670750000001, 54.3310284 ], [ -126.266559399999977, 54.3309444 ], [ -126.2664131, 54.3308418 ], [ -126.26634030000001, 54.3307863 ], [ -126.2661346, 54.3306382 ], [ -126.2660507, 54.3305185 ], [ -126.2659913, 54.330473 ], [ -126.265923299999983, 54.3303633 ], [ -126.265911, 54.3302821 ], [ -126.2658136, 54.3301454 ], [ -126.265756, 54.3300813 ], [ -126.265491, 54.3298947 ], [ -126.2654089, 54.3297495 ], [ -126.2654062, 54.32956 ], [ -126.2653486, 54.329496 ], [ -126.265292399999979, 54.3294418 ], [ -126.265133699999978, 54.3292581 ], [ -126.2649269, 54.3291271 ], [ -126.264783, 54.3289975 ], [ -126.264759, 54.3288807 ], [ -126.2647729, 54.3286656 ], [ -126.2647153, 54.3286016 ], [ -126.264586699999981, 54.3284634 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17098083, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 14616.6054282881, "blue_line_key": 360886221, "length_metre": 289.76448390934303, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.639038700000015, 54.3134693 ], [ -126.639028099999976, 54.3133881 ], [ -126.6390097, 54.3131902 ], [ -126.6389986, 54.3131176 ], [ -126.639025299999986, 54.3129025 ], [ -126.6391445, 54.3127159 ], [ -126.6393836, 54.3125493 ], [ -126.6396549, 54.3124026 ], [ -126.639735, 54.3123414 ], [ -126.639812899999981, 54.312307200000014 ], [ -126.6401603, 54.3121519 ], [ -126.6403501, 54.3120565 ], [ -126.6404815, 54.3119326 ], [ -126.6406764, 54.3117389 ], [ -126.6407407, 54.3116948 ], [ -126.6409764, 54.3116008 ], [ -126.6410548, 54.311558 ], [ -126.641158, 54.3113615 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102233, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 28681.088378651901, "blue_line_key": 360881038, "length_metre": 15.4757056913599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.067213099999989, 54.2427858 ], [ -126.0671727, 54.2427032 ], [ -126.0671767, 54.2426591 ], [ -126.0671774, 54.2426505 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17097290, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 14825.904673538, "blue_line_key": 360886524, "length_metre": 469.12830979947398, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.264586699999981, 54.3284634 ], [ -126.2644986, 54.3284164 ], [ -126.264168799999979, 54.328274 ], [ -126.2640709, 54.3281458 ], [ -126.264028, 54.3280817 ], [ -126.264006400000014, 54.3279379 ], [ -126.263960299999979, 54.32772 ], [ -126.2639187, 54.3276388 ], [ -126.2638836, 54.3274579 ], [ -126.263830899999988, 54.3273397 ], [ -126.2637365, 54.3271403 ], [ -126.263636100000014, 54.3270392 ], [ -126.2635627, 54.3269922 ], [ -126.2634874, 54.3269367 ], [ -126.263486, 54.3267301 ], [ -126.263521399999973, 54.3266589 ], [ -126.2636381, 54.326545 ], [ -126.2636923, 54.3264282 ], [ -126.2636567, 54.3262488 ], [ -126.263585100000014, 54.3261832 ], [ -126.2632553, 54.3260408 ], [ -126.2631814, 54.3259953 ], [ -126.2631403, 54.3259397 ], [ -126.2631022, 54.3258215 ], [ -126.2630171, 54.3257118 ], [ -126.263025, 54.325595 ], [ -126.26311290000001, 54.3254184 ], [ -126.2631024, 54.3253458 ], [ -126.263029, 54.3252988 ], [ -126.2628252, 54.3251051 ], [ -126.262784700000012, 54.325041 ], [ -126.2627833, 54.3248345 ], [ -126.262867599999979, 54.3247021 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17098447, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 17793.173061957401, "blue_line_key": 360886524, "length_metre": 142.13192831193501, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2570818, 54.3062557 ], [ -126.256903900000012, 54.3061532 ], [ -126.256658899999977, 54.3059324 ], [ -126.256483499999987, 54.3057758 ], [ -126.2564626, 54.3056305 ], [ -126.2565831, 54.3054453 ], [ -126.2565873, 54.3053727 ], [ -126.256616, 54.3051847 ], [ -126.2566056, 54.3051121 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17080195, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 4934.1973306206701, "blue_line_key": 360875052, "length_metre": 98.856183853596804, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.371955599999978, 54.4940819 ], [ -126.3732929, 54.494512 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17055762, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 18795.565173679399, "blue_line_key": 360856488, "length_metre": 611.58207029212599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5094754, 54.6219517 ], [ -126.5095792, 54.6220072 ], [ -126.5096373, 54.6220813 ], [ -126.509781099999984, 54.6222636 ], [ -126.50980770000001, 54.6223362 ], [ -126.5097359, 54.6224872 ], [ -126.5096695, 54.6225584 ], [ -126.5094363, 54.6225712 ], [ -126.5092799, 54.6226039 ], [ -126.509229299999987, 54.6226652 ], [ -126.5092263, 54.622737799999989 ], [ -126.509464099999988, 54.6228688 ], [ -126.509445899999989, 54.6229215 ], [ -126.5092049, 54.6230782 ], [ -126.5091095, 54.6231124 ], [ -126.5090751, 54.6231836 ], [ -126.509100699999976, 54.6232377 ], [ -126.509355099999979, 54.6234058 ], [ -126.509361099999978, 54.6235667 ], [ -126.509463, 54.6236778 ], [ -126.5093893, 54.623855799999987 ], [ -126.5094067, 54.6240623 ], [ -126.5093875, 54.624125 ], [ -126.5092773, 54.6241592 ], [ -126.5090628, 54.6241179 ], [ -126.5089393, 54.6241335 ], [ -126.5088749, 54.6241777 ], [ -126.5088385, 54.624240400000012 ], [ -126.5088179, 54.624328699999985 ], [ -126.508877, 54.6243928 ], [ -126.5089828, 54.6244141 ], [ -126.5092298, 54.6244184 ], [ -126.5093223, 54.6244568 ], [ -126.509332699999987, 54.6245195 ], [ -126.5093283, 54.6245822 ], [ -126.509274699999978, 54.624716 ], [ -126.50933040000001, 54.6248257 ], [ -126.509326, 54.6248884 ], [ -126.5092906, 54.6249767 ], [ -126.5091756, 54.6250821 ], [ -126.509064900000013, 54.625124799999988 ], [ -126.508982300000014, 54.625186 ], [ -126.508948799999985, 54.6252402 ], [ -126.508990199999985, 54.6253128 ], [ -126.509097, 54.6253598 ], [ -126.5091885, 54.6253797 ], [ -126.509280600000011, 54.6253911 ], [ -126.509634399999982, 54.625442400000011 ], [ -126.5097367, 54.6255165 ], [ -126.5097949, 54.6255905 ], [ -126.5099297, 54.625656 ], [ -126.510051300000015, 54.625703 ], [ -126.510323899999975, 54.6257899 ], [ -126.5104612, 54.6258554 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17097589, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 15379.397705260901, "blue_line_key": 360881038, "length_metre": 908.345697910073, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1241385, 54.3225601 ], [ -126.1240932, 54.3225501 ], [ -126.1238487, 54.3225173 ], [ -126.1236297, 54.3225757 ], [ -126.123425399999988, 54.3226341 ], [ -126.1232222, 54.3226825 ], [ -126.1228662, 54.3227011 ], [ -126.1225758, 54.3226939 ], [ -126.1222836, 54.3226783 ], [ -126.121993100000012, 54.3226712 ], [ -126.121686200000013, 54.3226555 ], [ -126.1214123, 54.3226298 ], [ -126.1211354, 54.3226056 ], [ -126.120894, 54.3225643 ], [ -126.1206813, 54.3225045 ], [ -126.120503599999978, 54.322429 ], [ -126.1203559, 54.3223179 ], [ -126.120194, 54.322232499999984 ], [ -126.1199502, 54.3221912 ], [ -126.119675699999988, 54.322167 ], [ -126.1193993, 54.3221413 ], [ -126.1191402, 54.3221086 ], [ -126.118913499999977, 54.322067300000015 ], [ -126.1186849, 54.3220174 ], [ -126.1184429, 54.3219576 ], [ -126.1182175, 54.3218793 ], [ -126.118039799999977, 54.3218038 ], [ -126.117876099999989, 54.3217098 ], [ -126.1177494, 54.3215546 ], [ -126.117804100000015, 54.3214107 ], [ -126.1181269, 54.3212213 ], [ -126.1183302, 54.3211458 ], [ -126.118551, 54.321096 ], [ -126.118829299999987, 54.321076 ], [ -126.119135, 54.3210746 ], [ -126.1193999, 54.3210447 ], [ -126.1196323, 54.3209963 ], [ -126.1198661, 54.3209578 ], [ -126.120115, 54.3209179 ], [ -126.120423199999976, 54.3209165 ], [ -126.120746, 54.3209151 ], [ -126.1209938, 54.3208852 ], [ -126.1210115, 54.3208766 ], [ -126.1210651, 54.3207428 ], [ -126.12101530000001, 54.3205975 ], [ -126.120656200000013, 54.3204366 ], [ -126.12040780000001, 54.320475 ], [ -126.120233399999989, 54.3205519 ], [ -126.1199984, 54.3206003 ], [ -126.119704299999981, 54.3206303 ], [ -126.1193534, 54.3205947 ], [ -126.119175099999978, 54.3205277 ], [ -126.11907570000001, 54.3203981 ], [ -126.1189286, 54.3203055 ], [ -126.118714, 54.3202913 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17062812, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 714.05749964968504, "blue_line_key": 360851751, "length_metre": 541.21563986998603, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.214575, 54.585603 ], [ -126.2143847, 54.5856614 ], [ -126.2140644, 54.5858237 ], [ -126.2137728, 54.586016 ], [ -126.213516199999987, 54.5861442 ], [ -126.2132451, 54.5862368 ], [ -126.2131525, 54.5862624 ], [ -126.2130276, 54.5862681 ], [ -126.2126586, 54.586241 ], [ -126.2125045, 54.5862111 ], [ -126.2122146, 54.5861413 ], [ -126.2119271, 54.5860715 ], [ -126.2115459, 54.5859818 ], [ -126.2114391, 54.5859434 ], [ -126.2111513, 54.5858465 ], [ -126.2108213, 54.5856956 ], [ -126.2107306, 54.5856671 ], [ -126.210500699999983, 54.5856429 ], [ -126.2102236, 54.585627200000012 ], [ -126.2099282, 54.5856215 ], [ -126.20965, 54.5856229 ], [ -126.209340399999988, 54.5856158 ], [ -126.2089682, 54.5856258 ], [ -126.2086595, 54.5856372 ], [ -126.2083014, 54.5856557 ], [ -126.2081777, 54.5856443 ], [ -126.208026499999988, 54.585613 ], [ -126.2078443, 54.5855375 ], [ -126.2075462, 54.5853865 ], [ -126.2072787, 54.5852184 ], [ -126.207172499999984, 54.5851714 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102321, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 28948.052754276301, "blue_line_key": 360881038, "length_metre": 60.8004504117905, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.06701, 54.2411081 ], [ -126.0669158, 54.241132300000011 ], [ -126.066808400000014, 54.2411394 ], [ -126.0667473, 54.2411466 ], [ -126.066425, 54.241148 ], [ -126.066088399999984, 54.2411223 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17093516, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 171869.24922033501, "blue_line_key": 360873822, "length_metre": 164.8210270097, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6925296, 54.3936666 ], [ -126.6921744, 54.3937947 ], [ -126.691530700000015, 54.3938802 ], [ -126.691207299999988, 54.3938816 ], [ -126.6908185, 54.3938531 ], [ -126.6901996, 54.3936067 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17077682, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 217488.92367203301, "blue_line_key": 360873822, "length_metre": 193.91966605024101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3467573, 54.5068186 ], [ -126.346363700000012, 54.5068357 ], [ -126.3445335, 54.5074908 ], [ -126.344089, 54.5075478 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101219, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 25706.0377644006, "blue_line_key": 360881038, "length_metre": 33.692656254369702, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0717065, 54.2595559 ], [ -126.0717211, 54.2595559 ], [ -126.071797499999988, 54.2595402 ], [ -126.071949300000014, 54.2593722 ], [ -126.0719228, 54.259318 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17100900, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 24350.333403404202, "blue_line_key": 360881038, "length_metre": 227.34435694801101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.070776, 54.265737 ], [ -126.0707448, 54.265529 ], [ -126.0707271, 54.2653311 ], [ -126.0707406, 54.2651345 ], [ -126.0707578, 54.2651075 ], [ -126.0708062, 54.2650818 ], [ -126.0708856, 54.2650647 ], [ -126.0709314, 54.2650661 ], [ -126.071033, 54.2651416 ], [ -126.071086, 54.2652499 ], [ -126.071131, 54.2652869 ], [ -126.071188799999987, 54.2653154 ], [ -126.071234, 54.2653254 ], [ -126.071311, 54.2653282 ], [ -126.071437, 54.2652769 ], [ -126.071490099999977, 54.2651787 ], [ -126.0714443, 54.2649707 ], [ -126.07138470000001, 54.2649337 ], [ -126.071199599999986, 54.26474 ], [ -126.070932399999975, 54.2646175 ], [ -126.0709184, 54.264589 ], [ -126.0709198, 54.2645719 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092149, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 13995.0146348994, "blue_line_key": 360862508, "length_metre": 189.099348801888, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3852415, 54.413285 ], [ -126.3851293, 54.4130215 ], [ -126.3848096, 54.4127676 ], [ -126.384195600000012, 54.4123731 ], [ -126.3840208, 54.4118053 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104352, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 3100.2970801254201, "blue_line_key": 360882583, "length_metre": 426.16249997175697, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0158233, 54.2146477 ], [ -126.015535799999981, 54.214793 ], [ -126.0154735, 54.2148101 ], [ -126.015314300000014, 54.2148784 ], [ -126.0151909, 54.2149027 ], [ -126.014893, 54.2149838 ], [ -126.0146686, 54.2151234 ], [ -126.014573, 54.2151647 ], [ -126.0144795, 54.2151804 ], [ -126.014419099999984, 54.2151789 ], [ -126.014329099999983, 54.215159 ], [ -126.0141499, 54.2150835 ], [ -126.0140294, 54.2150536 ], [ -126.0139533, 54.2150422 ], [ -126.0136312, 54.2150436 ], [ -126.0133217, 54.2150707 ], [ -126.012966299999988, 54.2151163 ], [ -126.012607499999987, 54.2151975 ], [ -126.0125471, 54.215196 ], [ -126.0122086, 54.215196 ], [ -126.011899700000015, 54.2152345 ], [ -126.011627600000011, 54.2153712 ], [ -126.011461799999978, 54.2155564 ], [ -126.0114584, 54.215592 ], [ -126.011392, 54.2156532 ], [ -126.011096, 54.2157358 ], [ -126.010742799999989, 54.2157358 ], [ -126.0104208, 54.2157372 ], [ -126.0101133, 54.2157387 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092275, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 9396.61482615161, "blue_line_key": 360862508, "length_metre": 167.84129167169101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4454734, 54.4113923 ], [ -126.44551580000001, 54.4111957 ], [ -126.4455091, 54.411069 ], [ -126.4454665, 54.4110234 ], [ -126.4453931, 54.4109679 ], [ -126.4451355, 54.4108724 ], [ -126.4449729, 54.4107784 ], [ -126.4447918, 54.41073 ], [ -126.444469099999978, 54.4106873 ], [ -126.4443783, 54.4106674 ], [ -126.44423089999998, 54.4105648 ], [ -126.4441454, 54.4104466 ], [ -126.4440116, 54.410354 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17066687, "stream_order": 4, "gnis_name": "Johnny David Creek", "downstream_route_measure": 7699.1559903552197, "blue_line_key": 360866287, "length_metre": 208.52343862972799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4254965, 54.5646899 ], [ -126.4256769, 54.5647924 ], [ -126.4257646, 54.5648579 ], [ -126.4257919, 54.5649206 ], [ -126.4257469, 54.5651271 ], [ -126.4258135, 54.5653165 ], [ -126.425809399999977, 54.5653707 ], [ -126.425759500000012, 54.5654504 ], [ -126.4256263, 54.5656 ], [ -126.4254769, 54.565732399999987 ], [ -126.42545530000001, 54.5658577 ], [ -126.4255078, 54.566003 ], [ -126.4255162, 54.5661198 ], [ -126.4254922, 54.5662451 ], [ -126.4253768, 54.5663505 ], [ -126.425342699999987, 54.5664132 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17087334, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 235016.605237143, "blue_line_key": 360873822, "length_metre": 99.927459730385195, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2373295, 54.4547367 ], [ -126.2373045, 54.4546555 ], [ -126.2372306, 54.4546085 ], [ -126.237138399999978, 54.4545786 ], [ -126.2370311, 54.4545772 ], [ -126.2368312, 54.4545814 ], [ -126.2364895, 54.4545914 ], [ -126.2362435, 54.4545942 ], [ -126.236133200000012, 54.4546014 ], [ -126.235966100000013, 54.4545615 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100293, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 21057.582453547999, "blue_line_key": 360880905, "length_metre": 55.979167143295498, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3792223, 54.2722655 ], [ -126.379436, 54.2722613 ], [ -126.3795747, 54.2722826 ], [ -126.3796791, 54.2723111 ], [ -126.380043199999989, 54.2723909 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17098647, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 2174.7795385208301, "blue_line_key": 360877225, "length_metre": 1547.5886764173399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1319904, 54.3087395 ], [ -126.1320534, 54.3087139 ], [ -126.1323042, 54.3086754 ], [ -126.1325665, 54.3086455 ], [ -126.13275680000001, 54.3085786 ], [ -126.1328873, 54.3084547 ], [ -126.1329001, 54.3082852 ], [ -126.1328491, 54.30813 ], [ -126.1329199, 54.307989 ], [ -126.133109600000012, 54.3079035 ], [ -126.1333438, 54.3078636 ], [ -126.1336207, 54.3078608 ], [ -126.1339256, 54.307895 ], [ -126.1342337, 54.3078936 ], [ -126.1345094, 54.307900700000012 ], [ -126.134784399999987, 54.3079434 ], [ -126.1350581, 54.3079762 ], [ -126.1352897, 54.3079633 ], [ -126.1353216, 54.3079562 ], [ -126.1354673, 54.3078508 ], [ -126.1355386, 54.30770840000001 ], [ -126.1355508, 54.3075204 ], [ -126.13551769999998, 54.3073495 ], [ -126.1354962, 54.3071871 ], [ -126.13547890000001, 54.3070063 ], [ -126.135477, 54.3068169 ], [ -126.1355788, 54.3066844 ], [ -126.135736799999989, 54.3065989 ], [ -126.1359582, 54.3065406 ], [ -126.1362072, 54.3064936 ], [ -126.136440799999988, 54.3064352 ], [ -126.1366158, 54.3063497 ], [ -126.1367311, 54.3062272 ], [ -126.136775, 54.3060663 ], [ -126.1367814, 54.305968 ], [ -126.1368183, 54.30588680000001 ], [ -126.136889, 54.3057458 ], [ -126.1369902, 54.3056219 ], [ -126.1371354, 54.305518 ], [ -126.137293899999975, 54.3054311 ], [ -126.1376605, 54.3052687 ], [ -126.1380234, 54.3051163 ], [ -126.1382131, 54.305058 ], [ -126.138401499999986, 54.3049896 ], [ -126.1387509, 54.3048272 ], [ -126.1390559, 54.3046464 ], [ -126.1393748, 54.304474 ], [ -126.1396796, 54.3043003 ], [ -126.1400138, 54.3041194 ], [ -126.1403041, 54.3039385 ], [ -126.1406401, 54.3037662 ], [ -126.1409597, 54.3035853 ], [ -126.1412933, 54.303413 ], [ -126.1414982, 54.303346 ], [ -126.141717199999988, 54.3032877 ], [ -126.1419508, 54.3032492 ], [ -126.1421856, 54.3032008 ], [ -126.142418, 54.3031524 ], [ -126.14265349999998, 54.3030954 ], [ -126.142872499999982, 54.303037 ], [ -126.1430615, 54.3029601 ], [ -126.1434408, 54.3028162 ], [ -126.143691, 54.3027593 ], [ -126.1439386, 54.3027294 ], [ -126.144233899999989, 54.3027094 ], [ -126.1445395, 54.302708 ], [ -126.1447832, 54.3027493 ], [ -126.1450575, 54.3027735 ], [ -126.1453669, 54.302755 ], [ -126.145585200000014, 54.3027052 ], [ -126.145790100000013, 54.3026382 ], [ -126.146170099999978, 54.3024858 ], [ -126.1465488, 54.3023505 ], [ -126.1467537, 54.3022836 ], [ -126.1469854, 54.3022437 ], [ -126.14727950000001, 54.3022337 ], [ -126.147528299999976, 54.3021939 ], [ -126.1476385, 54.3021526 ], [ -126.147805199999979, 54.301976 ], [ -126.1479039, 54.3018521 ], [ -126.1479751, 54.3017096 ], [ -126.1480185, 54.3015501 ], [ -126.148015799999982, 54.3013692 ], [ -126.148028, 54.3011813 ], [ -126.148159, 54.3010759 ], [ -126.148189, 54.3010673 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076987, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 215728.488141743, "blue_line_key": 360873822, "length_metre": 432.98696546903102, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.363922300000013, 54.5119172 ], [ -126.3634868, 54.511893 ], [ -126.3633215, 54.5117421 ], [ -126.3633296, 54.5115797 ], [ -126.3634659, 54.5113248 ], [ -126.363712399999983, 54.5110983 ], [ -126.363834700000012, 54.510876100000011 ], [ -126.363799199999988, 54.5106355 ], [ -126.363509799999989, 54.5103634 ], [ -126.36314560000001, 54.5104432 ], [ -126.362932699999973, 54.5105671 ], [ -126.3625413, 54.5110171 ], [ -126.3624335, 54.5110656 ], [ -126.3619183, 54.5110656 ], [ -126.3609734, 54.5106696 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17075666, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 134.85301572859899, "blue_line_key": 360856488, "length_metre": 362.23611026933497, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.441177400000015, 54.5171242 ], [ -126.44111119999998, 54.5171939 ], [ -126.4410183, 54.5172281 ], [ -126.440814100000011, 54.5172509 ], [ -126.4404902, 54.5172438 ], [ -126.440152200000014, 54.5172281 ], [ -126.4397954, 54.5172381 ], [ -126.4396863, 54.5172623 ], [ -126.4393085, 54.5173535 ], [ -126.438964499999983, 54.517446 ], [ -126.438840399999975, 54.5174432 ], [ -126.4386424, 54.5173848 ], [ -126.4383992, 54.5173435 ], [ -126.438149900000013, 54.5173477 ], [ -126.437887300000014, 54.5173691 ], [ -126.4376499, 54.5174446 ], [ -126.437524, 54.5174959 ], [ -126.437173300000012, 54.5176497 ], [ -126.43704790000001, 54.5176924 ], [ -126.436732299999989, 54.5178021 ], [ -126.436384800000013, 54.5179117 ], [ -126.4362899, 54.5179374 ], [ -126.4360718, 54.5179858 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17093576, "stream_order": 5, "gnis_name": "Bulkley River", "downstream_route_measure": 263779.86369370599, "blue_line_key": 360873822, "length_metre": 2573.0932246561902, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0545756, 54.3949597 ], [ -126.054456, 54.395100700000015 ], [ -126.05445469999998, 54.3951178 ], [ -126.054506, 54.395273100000011 ], [ -126.0542669, 54.3953656 ], [ -126.054043799999988, 54.3954682 ], [ -126.0540969, 54.3956049 ], [ -126.054369400000013, 54.3956832 ], [ -126.0543881, 54.3958542 ], [ -126.0542231, 54.3959852 ], [ -126.0540447, 54.3961062 ], [ -126.0540009, 54.3962942 ], [ -126.0539175, 54.3963825 ], [ -126.053864100000013, 54.3964893 ], [ -126.0539791, 54.3966175 ], [ -126.05371, 54.3966916 ], [ -126.0534562, 54.3967842 ], [ -126.0535222, 54.3969394 ], [ -126.0534988, 54.3970647 ], [ -126.053494299999983, 54.3971174 ], [ -126.053271900000013, 54.3972114 ], [ -126.0529624, 54.3972484 ], [ -126.052871599999989, 54.3974179 ], [ -126.0526802, 54.3975205 ], [ -126.0524278, 54.397596 ], [ -126.0522365, 54.3976985 ], [ -126.0520586, 54.397811 ], [ -126.0518668, 54.397915 ], [ -126.0515898, 54.3979164 ], [ -126.0513308, 54.397848 ], [ -126.0511086, 54.3977526 ], [ -126.0508501, 54.3976828 ], [ -126.0505407, 54.3976928 ], [ -126.0501719, 54.3976843 ], [ -126.050126, 54.3976828 ], [ -126.0498332, 54.3976942 ], [ -126.049521899999988, 54.3977227 ], [ -126.049200899999988, 54.3976971 ], [ -126.0488609, 54.3976971 ], [ -126.0483289, 54.397828100000012 ], [ -126.048090499999986, 54.3979121 ], [ -126.047838500000012, 54.3979862 ], [ -126.047585399999974, 54.3980702 ], [ -126.047459800000013, 54.3981129 ], [ -126.0473501, 54.3981457 ], [ -126.0471123, 54.3982212 ], [ -126.046861600000014, 54.3983052 ], [ -126.046609699999976, 54.3983793 ], [ -126.046326600000015, 54.3984448 ], [ -126.046, 54.3984818 ], [ -126.045644599999989, 54.3984904 ], [ -126.0452758, 54.3984818 ], [ -126.044956700000014, 54.3984377 ], [ -126.0446351, 54.3983935 ], [ -126.044281, 54.398385 ], [ -126.0439091, 54.398412 ], [ -126.043613099999988, 54.398459 ], [ -126.0432737, 54.3984775 ], [ -126.0429183, 54.3984861 ], [ -126.042607, 54.3985416 ], [ -126.042354499999988, 54.3986171 ], [ -126.0420873, 54.3986727 ], [ -126.041746, 54.3987097 ], [ -126.0413919, 54.3987011 ], [ -126.0410518, 54.3987282 ], [ -126.0407411, 54.3987752 ], [ -126.0403871, 54.3987667 ], [ -126.040146400000012, 54.3986883 ], [ -126.0398868, 54.3986285 ], [ -126.0396201, 54.3987026 ], [ -126.0393548, 54.3987595 ], [ -126.039116299999975, 54.3988436 ], [ -126.0388943, 54.3989361 ], [ -126.038770500000012, 54.3989603 ], [ -126.0385546, 54.3991711 ], [ -126.0383461, 54.3992737 ], [ -126.0381682, 54.3993862 ], [ -126.0380503, 54.3995357 ], [ -126.037961799999977, 54.3997052 ], [ -126.0379053, 54.3998476 ], [ -126.037887399999974, 54.3998832 ], [ -126.037772099999984, 54.3999787 ], [ -126.0377561, 54.3999957 ], [ -126.0377549, 54.4000057 ], [ -126.0375017, 54.4000897 ], [ -126.0371323, 54.4000897 ], [ -126.036851, 54.4001367 ], [ -126.0366718, 54.4002663 ], [ -126.036583399999984, 54.4004358 ], [ -126.0364049, 54.4005569 ], [ -126.036214099999981, 54.4006509 ], [ -126.0360356, 54.4007719 ], [ -126.0358706, 54.400903 ], [ -126.0357234, 54.4010254 ], [ -126.0355455, 54.401138 ], [ -126.0353976, 54.401269 ], [ -126.0352486, 54.40141 ], [ -126.035237199999983, 54.4015894 ], [ -126.0353325, 54.4017447 ], [ -126.0353594, 54.4017988 ], [ -126.0352423, 54.4021549 ], [ -126.035219499999982, 54.4022446 ], [ -126.0351999, 54.4022987 ], [ -126.0351961, 54.4023428 ], [ -126.0352107, 54.4023699 ], [ -126.035226399999985, 54.4025693 ], [ -126.0352411, 54.4025964 ], [ -126.035238600000014, 54.4026234 ], [ -126.0352832, 54.4026419 ], [ -126.0353707, 54.4027245 ], [ -126.0356702, 54.4028499 ], [ -126.0358215, 54.4028712 ], [ -126.0361749, 54.4028883 ], [ -126.0365094, 54.402951 ], [ -126.0367941, 54.4030564 ], [ -126.0370348, 54.4031618 ], [ -126.037395499999988, 54.40326 ], [ -126.037717799999982, 54.4032956 ], [ -126.038040599999988, 54.4033028 ], [ -126.038412600000015, 54.4032757 ], [ -126.038816499999982, 54.403214500000011 ], [ -126.0388771, 54.4032429 ], [ -126.038899, 54.4033512 ], [ -126.0389177, 54.4035221 ], [ -126.038963400000014, 54.4037671 ], [ -126.0390727, 54.4039579 ], [ -126.039146799999983, 54.4039964 ], [ -126.0392693, 54.4040163 ], [ -126.0393913, 54.4040106 ], [ -126.0395035, 54.4039778 ], [ -126.0398211, 54.403824 ], [ -126.040143, 54.4036517 ], [ -126.0405046, 54.403552 ], [ -126.0408287, 54.403542 ], [ -126.0409788, 54.4036004 ], [ -126.0411851, 54.40374 ], [ -126.0414367, 54.4038625 ], [ -126.0417241, 54.4039337 ], [ -126.0420629, 54.4039508 ], [ -126.042540099999982, 54.4039437 ], [ -126.0429555, 54.4039721 ], [ -126.0430144, 54.4039921 ], [ -126.043437499999982, 54.4041274 ], [ -126.043772, 54.40419 ], [ -126.0439258, 54.4041843 ], [ -126.0442193, 54.4041644 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17084984, "stream_order": 4, "gnis_name": "Raspberry Creek", "downstream_route_measure": 5488.0559711133501, "blue_line_key": 360817924, "length_metre": 16.328615042861799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6398703, 54.4696026 ], [ -126.6401157, 54.4696372 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080441, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 226577.46882931201, "blue_line_key": 360873822, "length_metre": 34.3883239332499, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2762851, 54.4933498 ], [ -126.2760487, 54.4933043 ], [ -126.2758966, 54.4931661 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17100055, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 21841.8361665255, "blue_line_key": 360881038, "length_metre": 473.51725917450699, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.084454, 54.2819415 ], [ -126.0822113, 54.2779048 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104922, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 0.0, "blue_line_key": 360882583, "length_metre": 1096.31460934243, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.053757300000015, 54.2058803 ], [ -126.0536938, 54.2058874 ], [ -126.053649299999989, 54.205896 ], [ -126.053335899999979, 54.20596 ], [ -126.0532901, 54.2059586 ], [ -126.0532456, 54.2059672 ], [ -126.0528865, 54.2060298 ], [ -126.052701, 54.2060441 ], [ -126.0526553, 54.2060426 ], [ -126.052608799999987, 54.2060498 ], [ -126.0525631, 54.2060483 ], [ -126.052331699999982, 54.2060882 ], [ -126.052283300000013, 54.2061139 ], [ -126.052266, 54.2061409 ], [ -126.0522322, 54.206166499999988 ], [ -126.052060399999988, 54.2062164 ], [ -126.051806899999988, 54.206336 ], [ -126.051759899999979, 54.2063446 ], [ -126.0516198, 54.2063944 ], [ -126.0513368, 54.2064685 ], [ -126.0510266, 54.206524 ], [ -126.0509789, 54.2065411 ], [ -126.0509178, 54.2065482 ], [ -126.0506373, 54.2066223 ], [ -126.0503363, 54.206732 ], [ -126.050305, 54.2067576 ], [ -126.050063400000013, 54.2069043 ], [ -126.0497953, 54.2070239 ], [ -126.0497476, 54.207041 ], [ -126.0497018, 54.2070396 ], [ -126.049639500000012, 54.2070567 ], [ -126.049576800000011, 54.2070553 ], [ -126.0494366, 54.2071051 ], [ -126.0490967, 54.2071421 ], [ -126.048785699999982, 54.2072062 ], [ -126.0485025, 54.2073073 ], [ -126.048260199999987, 54.2074626 ], [ -126.04816529999998, 54.2075153 ], [ -126.048053900000014, 54.2075665 ], [ -126.047878700000012, 54.207652 ], [ -126.047815, 54.2076862 ], [ -126.0475622, 54.2077973 ], [ -126.0472512, 54.2078614 ], [ -126.0472055, 54.20785990000001 ], [ -126.04715659999998, 54.2078671 ], [ -126.047018799999989, 54.2078642 ], [ -126.046684399999975, 54.2078201 ], [ -126.0465644, 54.2078087 ], [ -126.046380199999973, 54.2078129 ], [ -126.046083900000014, 54.207877 ], [ -126.045972399999982, 54.2079283 ], [ -126.0456739, 54.208038 ], [ -126.045626899999988, 54.2080465 ], [ -126.0454996, 54.2080878 ], [ -126.04521840000001, 54.2081704 ], [ -126.0451553, 54.208196 ], [ -126.0450313, 54.2082288 ], [ -126.0449215, 54.2082359 ], [ -126.0447073, 54.2082487 ], [ -126.0445557, 54.2082174 ], [ -126.0444954, 54.208216 ], [ -126.0444503, 54.208206 ], [ -126.0442503, 54.2082003 ], [ -126.044142299999976, 54.208216 ], [ -126.0438466, 54.2082715 ], [ -126.0435378, 54.20831 ], [ -126.0432117, 54.2083556 ], [ -126.0430282, 54.2083513 ], [ -126.042844, 54.2083556 ], [ -126.0427068, 54.2083513 ], [ -126.042383799999982, 54.2083356 ], [ -126.0420484, 54.2083271 ], [ -126.0420034, 54.2083171 ], [ -126.0418187, 54.2083029 ], [ -126.0415001, 54.2082687 ], [ -126.0411961, 54.2082345 ], [ -126.0408457, 54.2082074 ], [ -126.040529299999989, 54.2081277 ], [ -126.040483799999976, 54.2080992 ], [ -126.0403786, 54.2080608 ], [ -126.0400781, 54.207991 ], [ -126.0397573, 54.2079824 ], [ -126.0394246, 54.2078941 ], [ -126.039121899999984, 54.20785 ], [ -126.0390284, 54.2078656 ], [ -126.038730099999981, 54.2079482 ], [ -126.0386848, 54.2079653 ], [ -126.0386384, 54.2079724 ], [ -126.0385921, 54.2079724 ], [ -126.0384822, 54.2079867 ], [ -126.0383909, 54.2079767 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093542, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 15923.9670062533, "blue_line_key": 360846413, "length_metre": 544.48284468949805, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2688108, 54.397895 ], [ -126.2667538, 54.3972409 ], [ -126.2620846, 54.3949988 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17065511, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 2455.6281319375798, "blue_line_key": 360881574, "length_metre": 41.709008232455602, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6148707, 54.569706 ], [ -126.6149745, 54.5697971 ], [ -126.615080699999979, 54.569817 ], [ -126.6151554, 54.569864 ], [ -126.615214400000013, 54.5699281 ], [ -126.615195299999982, 54.5699908 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100069, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 22595.902411663399, "blue_line_key": 360880905, "length_metre": 151.815210658854, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.387899199999978, 54.2771563 ], [ -126.3879767, 54.2771306 ], [ -126.3880725, 54.2770879 ], [ -126.3881776, 54.2771078 ], [ -126.388237499999988, 54.2771449 ], [ -126.388289699999987, 54.2772716 ], [ -126.3884629, 54.2774553 ], [ -126.38846, 54.277518 ], [ -126.3884458, 54.2777345 ], [ -126.388486299999983, 54.2777986 ], [ -126.3885938, 54.2778185 ], [ -126.388689, 54.2777843 ], [ -126.3889949, 54.2777815 ], [ -126.389103100000014, 54.2777929 ], [ -126.389208799999977, 54.2778043 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17053940, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 22872.317021585801, "blue_line_key": 360856488, "length_metre": 238.78557367379099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.544355200000012, 54.6359516 ], [ -126.545066699999978, 54.6348336 ], [ -126.5459363, 54.634029 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17106429, "stream_order": 4, "gnis_name": "Buck Creek", "downstream_route_measure": 60093.679738331703, "blue_line_key": 360886221, "length_metre": 121.46259186432199, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.414287, 54.1813027 ], [ -126.414087699999982, 54.1812885 ], [ -126.4139355, 54.1812585 ], [ -126.413802, 54.1812101 ], [ -126.413712499999988, 54.1811546 ], [ -126.4135957, 54.1810805 ], [ -126.4134739, 54.1810606 ], [ -126.4133069, 54.1810378 ], [ -126.4131247, 54.1810164 ], [ -126.4129243, 54.1810122 ], [ -126.4126355, 54.1809965 ], [ -126.412574, 54.180978 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17069954, "stream_order": 4, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 17738.2538725345, "blue_line_key": 360875378, "length_metre": 31.362019306961599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6473475, 54.5463489 ], [ -126.6474374, 54.5463945 ], [ -126.64772330000001, 54.546526899999989 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17084645, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 199804.59920034499, "blue_line_key": 360873822, "length_metre": 714.66053227923805, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4903864, 54.4718329 ], [ -126.490006, 54.4721006 ], [ -126.4898436, 54.472817 ], [ -126.4892691, 54.4734921 ], [ -126.488744299999979, 54.4738082 ], [ -126.4879256, 54.4741586 ], [ -126.486111, 54.4747354 ], [ -126.485735299999988, 54.4749405 ], [ -126.4853328, 54.4752852 ], [ -126.485215, 54.4754888 ], [ -126.4852282, 54.4756754 ], [ -126.485711, 54.4761169 ], [ -126.4858141, 54.4763476 ], [ -126.485824799999975, 54.4766111 ], [ -126.485728599999987, 54.4768162 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17076571, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 9799.4183593825292, "blue_line_key": 360869846, "length_metre": 98.307492655206403, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6001096, 54.5115469 ], [ -126.60027479999998, 54.5116224 ], [ -126.600428900000011, 54.5116167 ], [ -126.6006757, 54.5116481 ], [ -126.6007511, 54.5116851 ], [ -126.6010943, 54.511863100000014 ], [ -126.6012266, 54.5119913 ], [ -126.601285, 54.5120283 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17075719, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 211941.32354601999, "blue_line_key": 360873822, "length_metre": 180.68435140078799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4007736, 54.5172794 ], [ -126.400747699999982, 54.5174304 ], [ -126.4006262, 54.5175457 ], [ -126.40047460000001, 54.5176212 ], [ -126.4002099, 54.5176625 ], [ -126.3998606, 54.5175671 ], [ -126.3992388, 54.5170942 ], [ -126.398861599999989, 54.5169945 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080016, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 203564.847008596, "blue_line_key": 360873822, "length_metre": 75.805937716206202, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4798642, 54.4945618 ], [ -126.4804591, 54.4951472 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17093670, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 172182.16550398199, "blue_line_key": 360873822, "length_metre": 183.205053368112, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.690401200000011, 54.3923363 ], [ -126.690084899999988, 54.3920358 ], [ -126.689779699999988, 54.391998799999982 ], [ -126.689356800000013, 54.3920544 ], [ -126.689064, 54.3922495 ], [ -126.6886108, 54.3927864 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102153, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 28298.025713999901, "blue_line_key": 360881038, "length_metre": 95.886037466760399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.069254500000014, 54.2447413 ], [ -126.0693719, 54.2446273 ], [ -126.0693735, 54.2445832 ], [ -126.069274600000014, 54.2444806 ], [ -126.0692483, 54.2443995 ], [ -126.069300700000014, 54.2443297 ], [ -126.0693956, 54.244277 ], [ -126.0694574, 54.2442613 ], [ -126.069525, 54.2441901 ], [ -126.0695158, 54.2441089 ], [ -126.069660499999983, 54.2440135 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17076066, "stream_order": 4, "gnis_name": "Johnny David Creek", "downstream_route_measure": 0.0, "blue_line_key": 360866287, "length_metre": 15.3063604257749, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3719943, 54.5148112 ], [ -126.372012500000011, 54.514948 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17082248, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 228382.88059808599, "blue_line_key": 360873822, "length_metre": 1.4698209857335101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.263619499999976, 54.4852645 ], [ -126.2636045, 54.4852546 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17094094, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 256676.60673933601, "blue_line_key": 360873822, "length_metre": 101.953347050852, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1453157, 54.388266 ], [ -126.1451692, 54.3881634 ], [ -126.1450853, 54.3880367 ], [ -126.145081, 54.3878658 ], [ -126.14532819999998, 54.387655 ], [ -126.145355099999989, 54.3874855 ], [ -126.1453276, 54.3874399 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17070144, "stream_order": 4, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 17642.709956733299, "blue_line_key": 360875378, "length_metre": 95.543915801166705, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6467727, 54.5455642 ], [ -126.646816, 54.5456454 ], [ -126.6468986, 54.5457906 ], [ -126.6469433, 54.5458462 ], [ -126.6471483, 54.546057 ], [ -126.6472167, 54.5461937 ], [ -126.6473475, 54.5463489 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17104938, "stream_order": 4, "gnis_name": "Maxan Creek", "downstream_route_measure": 34649.119613333198, "blue_line_key": 360881038, "length_metre": 31.615575016650599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.053757300000015, 54.2058803 ], [ -126.053783, 54.2057379 ], [ -126.053743, 54.2056282 ], [ -126.0537311, 54.2056011 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101187, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 17396.557170431301, "blue_line_key": 360880905, "length_metre": 1415.61589886552, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.384080900000015, 54.2591016 ], [ -126.383986299999975, 54.2591343 ], [ -126.3838106, 54.2592297 ], [ -126.3837759, 54.2592924 ], [ -126.3837406, 54.2593636 ], [ -126.3837299, 54.2595431 ], [ -126.3837404, 54.2596157 ], [ -126.383835299999987, 54.2598336 ], [ -126.383947799999987, 54.2599618 ], [ -126.384149499999978, 54.2601811 ], [ -126.3841777, 54.2602452 ], [ -126.3841723, 54.2603079 ], [ -126.384137, 54.2603791 ], [ -126.3839913, 54.260493 ], [ -126.3837851, 54.2606055 ], [ -126.383644100000012, 54.2606383 ], [ -126.3832748, 54.26067530000001 ], [ -126.3831369, 54.2606725 ], [ -126.382875599999977, 54.2606668 ], [ -126.3827686, 54.2606454 ], [ -126.382578, 54.2605243 ], [ -126.3823849, 54.2604033 ], [ -126.382292799999988, 54.2604019 ], [ -126.3821536, 54.2604161 ], [ -126.381965, 54.260493 ], [ -126.381930399999987, 54.2605557 ], [ -126.3818492, 54.2606255 ], [ -126.3815143, 54.260824899999989 ], [ -126.3814803, 54.260879 ], [ -126.381374400000013, 54.2610926 ], [ -126.381348300000013, 54.2612535 ], [ -126.381322899999986, 54.2614059 ], [ -126.3812639, 54.261611 ], [ -126.38109, 54.2616879 ], [ -126.380965, 54.2617307 ], [ -126.380841, 54.2617364 ], [ -126.38049, 54.2617292 ], [ -126.3801682, 54.261695 ], [ -126.3798037, 54.2616509 ], [ -126.379493599999989, 54.2616723 ], [ -126.3793667, 54.2617677 ], [ -126.3793314, 54.2618118 ], [ -126.3792602, 54.2619899 ], [ -126.3792306, 54.2621878 ], [ -126.379213, 54.2622505 ], [ -126.379154, 54.2624285 ], [ -126.3791357, 54.2624997 ], [ -126.3791055, 54.2627062 ], [ -126.3790349, 54.2628757 ], [ -126.378905, 54.2629797 ], [ -126.3786126, 54.26299250000001 ], [ -126.378520900000012, 54.2629626 ], [ -126.378343199999989, 54.2628871 ], [ -126.3780944, 54.2626834 ], [ -126.377928900000015, 54.262608 ], [ -126.3778409, 54.262561 ], [ -126.3776437, 54.2625396 ], [ -126.377568, 54.2624926 ], [ -126.3774623, 54.2624812 ], [ -126.3773536, 54.2625054 ], [ -126.3769853, 54.2627233 ], [ -126.3768377, 54.26289 ], [ -126.376624299999975, 54.2631107 ], [ -126.376498599999977, 54.2631349 ], [ -126.376175099999983, 54.2631463 ], [ -126.3760847, 54.2631264 ], [ -126.3759203, 54.263068 ], [ -126.3757707, 54.2630025 ], [ -126.375474399999987, 54.262843 ], [ -126.375368099999974, 54.2628131 ], [ -126.375054100000014, 54.2626621 ], [ -126.3747665, 54.2625937 ], [ -126.37439209999998, 54.2624684 ], [ -126.374085600000015, 54.262452700000011 ], [ -126.373992199999975, 54.2624684 ], [ -126.373877, 54.2625923 ], [ -126.3738257, 54.2626535 ], [ -126.3737375, 54.2628586 ], [ -126.3736162, 54.2630537 ], [ -126.3735809, 54.263125 ], [ -126.3735097, 54.263303 ], [ -126.373364599999988, 54.26340840000001 ], [ -126.3732541, 54.2634511 ], [ -126.3728917, 54.2636049 ], [ -126.3727976, 54.2636291 ], [ -126.3726902, 54.2636362 ], [ -126.372366, 54.2636562 ], [ -126.372041900000013, 54.2636761 ], [ -126.3719345, 54.2636832 ], [ -126.371811099999988, 54.2636804 ], [ -126.371595, 54.2636847 ], [ -126.3714881, 54.2636904 ], [ -126.3711476, 54.2637288 ], [ -126.3710517, 54.2637715 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099807, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 23683.083441779301, "blue_line_key": 360880905, "length_metre": 115.364602995268, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3944648, 54.2819017 ], [ -126.39453, 54.281849 ], [ -126.3946392, 54.2818234 ], [ -126.3949623, 54.2818134 ], [ -126.3952983, 54.2818562 ], [ -126.39532530000001, 54.2819103 ], [ -126.3953336, 54.282037 ], [ -126.3953036, 54.2822435 ], [ -126.3953594, 54.2823603 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17071372, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 4733.2824005973198, "blue_line_key": 360856488, "length_metre": 569.96327377147304, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.430509699999988, 54.5401095 ], [ -126.4305056, 54.5401636 ], [ -126.4305076, 54.5403616 ], [ -126.4304682, 54.5404954 ], [ -126.430396199999976, 54.5406734 ], [ -126.4302959, 54.5408059 ], [ -126.4301611, 54.540974 ], [ -126.4299942, 54.5411776 ], [ -126.429848, 54.541273 ], [ -126.42984, 54.5414083 ], [ -126.429846799999979, 54.5415436 ], [ -126.4300223, 54.5417089 ], [ -126.430214599999985, 54.541847 ], [ -126.4302681, 54.5419752 ], [ -126.4302439, 54.5421005 ], [ -126.430196099999989, 54.5421532 ], [ -126.42999829999998, 54.5423469 ], [ -126.429929199999989, 54.5424252 ], [ -126.4298912, 54.5425691 ], [ -126.429897399999987, 54.5427129 ], [ -126.4299646, 54.5428582 ], [ -126.4300369, 54.5429322 ], [ -126.430257, 54.5431245 ], [ -126.4305379, 54.5433467 ], [ -126.4306249, 54.5434208 ], [ -126.430832900000013, 54.5435774 ], [ -126.431051, 54.5437896 ], [ -126.431291099999981, 54.5439107 ], [ -126.4314526, 54.5440317 ], [ -126.4315118, 54.5440873 ], [ -126.4317603, 54.5442895 ], [ -126.432026499999978, 54.5445117 ], [ -126.432146, 54.5445772 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17082647, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 4114.3721692075196, "blue_line_key": 360869846, "length_metre": 271.30279230333298, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.559815, 54.4825301 ], [ -126.5600605, 54.4825714 ], [ -126.560151599999983, 54.4825913 ], [ -126.560454799999988, 54.4826782 ], [ -126.560544900000011, 54.4827152 ], [ -126.5607831, 54.4828548 ], [ -126.5610491, 54.483077 ], [ -126.5611376, 54.4831325 ], [ -126.5613947, 54.483218 ], [ -126.5616219, 54.483312 ], [ -126.5617247, 54.483369 ], [ -126.5620115, 54.48351 ], [ -126.562266499999978, 54.4836225 ], [ -126.562522099999981, 54.4837264 ], [ -126.5628415, 54.4838233 ], [ -126.5631111, 54.4839714 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17107372, "stream_order": 4, "gnis_name": "Buck Creek", "downstream_route_measure": 67279.075509498798, "blue_line_key": 360886221, "length_metre": 545.69363228655004, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.32041, 54.1634787 ], [ -126.3203564, 54.163352 ], [ -126.320377400000012, 54.1632808 ], [ -126.320571699999988, 54.1631141 ], [ -126.3207534, 54.1629019 ], [ -126.3207732, 54.1628407 ], [ -126.320746, 54.162768 ], [ -126.320689, 54.1627039 ], [ -126.3206637, 54.1626399 ], [ -126.3208078, 54.1625444 ], [ -126.3208123, 54.1624718 ], [ -126.320815599999989, 54.1624091 ], [ -126.3207586, 54.162345 ], [ -126.3205045, 54.1622411 ], [ -126.320373899999979, 54.162138499999983 ], [ -126.3204222, 54.1620858 ], [ -126.320596099999989, 54.1620089 ], [ -126.3207871, 54.161905 ], [ -126.3208209, 54.1618523 ], [ -126.320794299999989, 54.1617982 ], [ -126.320703, 54.1617682 ], [ -126.320476, 54.1617369 ], [ -126.3201697, 54.1617298 ], [ -126.3200364, 54.1616814 ], [ -126.3200075, 54.1616272 ], [ -126.3200132, 54.1615646 ], [ -126.320081299999984, 54.1614307 ], [ -126.32023310000001, 54.161227 ], [ -126.320239, 54.1611373 ], [ -126.3202277, 54.1610747 ], [ -126.320184599999976, 54.1610191 ], [ -126.3199906, 54.1609707 ], [ -126.319668400000012, 54.1609536 ], [ -126.3193329, 54.1609465 ], [ -126.3191299, 54.1609963 ], [ -126.319040499999986, 54.1609678 ], [ -126.3186722, 54.1609507 ], [ -126.318478, 54.1609094 ], [ -126.318434400000015, 54.1608553 ], [ -126.31832919999998, 54.1608169 ], [ -126.3181916, 54.160814 ], [ -126.3178859, 54.1607984 ], [ -126.3177938, 54.1608041 ], [ -126.317471699999984, 54.1608069 ], [ -126.317396300000013, 54.160787 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17101682, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 12077.709994712801, "blue_line_key": 360877225, "length_metre": 920.32808853346296, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2048814, 54.2582513 ], [ -126.2045304, 54.2581972 ], [ -126.2044408, 54.2581687 ], [ -126.2043976, 54.2581132 ], [ -126.2043581, 54.2580405 ], [ -126.204355799999988, 54.2578255 ], [ -126.2043698, 54.257646 ], [ -126.204380699999987, 54.2574751 ], [ -126.204394099999973, 54.25727710000001 ], [ -126.2044322, 54.2571789 ], [ -126.2045805, 54.2570122 ], [ -126.2046365, 54.2568784 ], [ -126.204737599999973, 54.2567274 ], [ -126.204887700000015, 54.2565693 ], [ -126.205068399999988, 54.2563941 ], [ -126.205137099999988, 54.2562788 ], [ -126.2051924, 54.2561264 ], [ -126.205193200000011, 54.2559028 ], [ -126.205204, 54.2557589 ], [ -126.204998800000013, 54.2555923 ], [ -126.204886300000013, 54.2554456 ], [ -126.204839299999975, 54.2552462 ], [ -126.204847699999974, 54.2551024 ], [ -126.204858, 54.25496 ], [ -126.204894799999977, 54.2548788 ], [ -126.20501440000001, 54.2546837 ], [ -126.205145500000015, 54.2545711 ], [ -126.2053687, 54.2544401 ], [ -126.20546539999998, 54.2543618 ], [ -126.2056466, 54.2542051 ], [ -126.2057452, 54.2541083 ], [ -126.2058139, 54.2539929 ], [ -126.2058242, 54.2538306 ], [ -126.2057766, 54.2536326 ], [ -126.205694, 54.2535044 ], [ -126.2056362, 54.2534489 ], [ -126.2054214, 54.2532281 ], [ -126.205325599999981, 54.2530558 ], [ -126.2053085, 54.2528479 ], [ -126.2053441, 54.2527766 ], [ -126.205377899999988, 54.252724 ], [ -126.205613199999988, 54.2526399 ], [ -126.205838199999988, 54.2525103 ], [ -126.206095099999985, 54.2523266 ], [ -126.206130800000011, 54.2522554 ], [ -126.2061354, 54.2521756 ], [ -126.206148700000014, 54.2520047 ], [ -126.206145100000015, 54.2518068 ], [ -126.206171200000014, 54.2516544 ], [ -126.206214499999987, 54.2514749 ], [ -126.206211400000015, 54.2512955 ], [ -126.2061601, 54.2511417 ], [ -126.2060781, 54.2510049 ], [ -126.2059905, 54.2509309 ], [ -126.2058736, 54.2508298 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104290, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 5883.2866492019502, "blue_line_key": 360882583, "length_metre": 149.94640554058299, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.9818744, 54.2161075 ], [ -125.981811299999976, 54.216100399999988 ], [ -125.9816697, 54.2160221 ], [ -125.9815888, 54.2159708 ], [ -125.9815416, 54.2159537 ], [ -125.9814931, 54.2159466 ], [ -125.981448, 54.2159566 ], [ -125.981359900000015, 54.2160036 ], [ -125.9812985, 54.216005 ], [ -125.9812047, 54.2159623 ], [ -125.981171599999982, 54.2159267 ], [ -125.9811075, 54.2159024 ], [ -125.98097, 54.2159053 ], [ -125.980860400000012, 54.2158725 ], [ -125.9808266, 54.2158455 ], [ -125.9808092, 54.2158198 ], [ -125.9807442, 54.2157586 ], [ -125.980696900000012, 54.2157415 ], [ -125.980542699999987, 54.2157173 ], [ -125.9804786, 54.2156931 ], [ -125.9804124, 54.2156219 ], [ -125.9803946, 54.2155777 ], [ -125.9803199, 54.2153911 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17091820, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 179934.936577538, "blue_line_key": 360873822, "length_metre": 138.830648788357, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6171092, 54.4139274 ], [ -126.6170785, 54.4140997 ], [ -126.616591, 54.4145996 ], [ -126.615966199999988, 54.4149385 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092313, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 12811.1750074997, "blue_line_key": 360862508, "length_metre": 375.12795801251002, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.400699099999983, 54.4100834 ], [ -126.396126399999986, 54.4121471 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092240, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 11552.1391765914, "blue_line_key": 360862508, "length_metre": 40.402430911351303, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.418572, 54.411007700000013 ], [ -126.4182978, 54.4109664 ], [ -126.4180096, 54.410861 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17095491, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 7444.6039452738896, "blue_line_key": 360886221, "length_metre": 128.86348476465099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.618346, 54.3572495 ], [ -126.618423799999988, 54.356818 ], [ -126.618017, 54.3561372 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100633, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 2292.3753013075798, "blue_line_key": 360874778, "length_metre": 48.187978786050301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.341310299999989, 54.267973 ], [ -126.341229700000014, 54.2680071 ], [ -126.3411216, 54.2680228 ], [ -126.341016599999989, 54.2680029 ], [ -126.34088770000001, 54.2678391 ], [ -126.3408767, 54.267775 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17070994, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 7270.1484278764101, "blue_line_key": 360875378, "length_metre": 117.323954488285, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5262919, 54.5419097 ], [ -126.5264111, 54.5419481 ], [ -126.5266986, 54.5420535 ], [ -126.5269846, 54.5421845 ], [ -126.5272255, 54.542297 ], [ -126.5274978, 54.542411 ], [ -126.527602699999989, 54.5424765 ], [ -126.5277371, 54.542542 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17082372, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 228384.35041907101, "blue_line_key": 360873822, "length_metre": 157.375602639806, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2636045, 54.4852546 ], [ -126.2630072, 54.4849897 ], [ -126.262657499999989, 54.4847732 ], [ -126.2623503, 54.4847476 ], [ -126.261855, 54.4848444 ], [ -126.2615176, 54.4848487 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17103188, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 30655.199977181299, "blue_line_key": 360881038, "length_metre": 138.87210237147599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0678151, 54.2319205 ], [ -126.0678211, 54.231857899999987 ], [ -126.067806699999977, 54.2318308 ], [ -126.067742700000011, 54.23164 ], [ -126.067730799999978, 54.2316129 ], [ -126.0677348, 54.2315688 ], [ -126.067547, 54.2313836 ], [ -126.067554500000014, 54.2312768 ], [ -126.0676057, 54.231197 ], [ -126.0675943, 54.2311685 ], [ -126.067582699999988, 54.2310874 ], [ -126.0673668, 54.2309122 ], [ -126.0672047, 54.2308096 ], [ -126.0671889, 54.2307997 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17069411, "stream_order": 4, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 18073.200192218199, "blue_line_key": 360875378, "length_metre": 97.639331246788899, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6484135, 54.5490478 ], [ -126.648612, 54.5491062 ], [ -126.648882199999989, 54.5492273 ], [ -126.6492419, 54.5494238 ], [ -126.6493328, 54.5494523 ], [ -126.6494699, 54.5494822 ], [ -126.6495789, 54.5494936 ], [ -126.649671699999985, 54.549495 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17092338, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 178539.43898723001, "blue_line_key": 360873822, "length_metre": 207.31325463596099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6274606, 54.4086621 ], [ -126.6273943, 54.4088031 ], [ -126.6275243, 54.409048 ], [ -126.6282291, 54.4094411 ], [ -126.628535199999988, 54.4097074 ], [ -126.6284908, 54.4100948 ], [ -126.628299700000014, 54.4102358 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17097282, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 12215.744642173901, "blue_line_key": 360886221, "length_metre": 64.444615933764297, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.626183900000015, 54.3239145 ], [ -126.6265526, 54.3236709 ], [ -126.6266396, 54.3234231 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17076820, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 8590.9501932418807, "blue_line_key": 360869846, "length_metre": 9.32761345085685, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.583123199999989, 54.5103364 ], [ -126.58309509999998, 54.5103998 ], [ -126.583095300000011, 54.5104179 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17074052, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 2484.2582296534101, "blue_line_key": 360881632, "length_metre": 74.506985453825806, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.655349300000012, 54.5249103 ], [ -126.655398800000015, 54.5248662 ], [ -126.6555274, 54.5247707 ], [ -126.655799300000012, 54.5246226 ], [ -126.6559136, 54.5245258 ], [ -126.656074, 54.5243947 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17055139, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 26260.645490906001, "blue_line_key": 360856488, "length_metre": 21.5806138008404, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5708559, 54.6254553 ], [ -126.5711902, 54.6254684 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17086426, "stream_order": 4, "gnis_name": "Raspberry Creek", "downstream_route_measure": 3722.3259226804498, "blue_line_key": 360817924, "length_metre": 173.50150342728401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.621668199999988, 54.4601031 ], [ -126.6220298, 54.4602897 ], [ -126.6223435, 54.4604306 ], [ -126.6226586, 54.460588699999988 ], [ -126.622993099999988, 54.460677 ], [ -126.6233458, 54.4607198 ], [ -126.623621, 54.4607881 ], [ -126.623938200000012, 54.4608835 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17090379, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 275597.02622649103, "blue_line_key": 360873822, "length_metre": 116.94260703463399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1424812, 54.429677100000013 ], [ -126.1417212, 54.4306276 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17073049, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 4566.70473851724, "blue_line_key": 360875378, "length_metre": 1130.13510983023, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.50111840000001, 54.5310629 ], [ -126.5013496, 54.5310757 ], [ -126.501574100000013, 54.5311711 ], [ -126.5016333, 54.5312267 ], [ -126.5018542, 54.5314104 ], [ -126.501925500000013, 54.5315015 ], [ -126.502039, 54.5316482 ], [ -126.5021119, 54.5317209 ], [ -126.5024898, 54.5318904 ], [ -126.5027656, 54.5319231 ], [ -126.5031248, 54.5321111 ], [ -126.5034488, 54.5321182 ], [ -126.503708800000013, 54.5321681 ], [ -126.5039081, 54.5321809 ], [ -126.5040627, 54.5322023 ], [ -126.504338499999989, 54.532235 ], [ -126.504628499999981, 54.5322763 ], [ -126.5048413, 54.5323347 ], [ -126.5050967, 54.5324757 ], [ -126.505294299999974, 54.5325426 ], [ -126.505627899999979, 54.532621 ], [ -126.505887300000012, 54.532707900000013 ], [ -126.506126099999989, 54.5328118 ], [ -126.5063484, 54.532977 ], [ -126.5064345, 54.533096699999987 ], [ -126.5065028, 54.533232 ], [ -126.5066445, 54.5334598 ], [ -126.506718499999977, 54.5335154 ], [ -126.5068092, 54.5335439 ], [ -126.50704039999998, 54.5335496 ], [ -126.5071489, 54.5335339 ], [ -126.507404, 54.5334214 ], [ -126.507512599999984, 54.53340570000001 ], [ -126.5078543, 54.5334043 ], [ -126.5081473, 54.5334014 ], [ -126.5082427, 54.5333673 ], [ -126.5086053, 54.5332491 ], [ -126.5087281, 54.5332419 ], [ -126.508930799999987, 54.5332377 ], [ -126.50927, 54.5332362 ], [ -126.5095062, 54.5334114 ], [ -126.509651, 54.5335666 ], [ -126.5097904, 54.53359660000001 ], [ -126.510021599999988, 54.5336023 ], [ -126.510133099999976, 54.5335496 ], [ -126.510246399999986, 54.5334356 ], [ -126.5103422, 54.5333929 ], [ -126.5104518, 54.5333673 ], [ -126.510669299999989, 54.533363 ], [ -126.5107753, 54.5333829 ], [ -126.5109567, 54.5334684 ], [ -126.5111209, 54.533561 ], [ -126.5112337, 54.5337518 ], [ -126.5112868, 54.5338885 ], [ -126.511267499999974, 54.5339512 ], [ -126.511270900000014, 54.5341392 ], [ -126.5113093, 54.5342759 ], [ -126.5113696, 54.5343215 ], [ -126.511565299999987, 54.5343799 ], [ -126.5117838, 54.5343656 ], [ -126.5118781, 54.5343414 ], [ -126.511943, 54.5342887 ], [ -126.511962399999987, 54.5342261 ], [ -126.5120827, 54.534021 ], [ -126.5121796, 54.5339612 ], [ -126.512272, 54.5339355 ], [ -126.5125822, 54.5339327 ], [ -126.512965, 54.5340039 ], [ -126.5130577, 54.534005300000011 ], [ -126.5134289, 54.5340039 ], [ -126.5138, 54.5340025 ], [ -126.513937399999975, 54.5340238 ], [ -126.514028200000013, 54.534052300000013 ], [ -126.5142395, 54.534129199999988 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17076792, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 8666.6949617674909, "blue_line_key": 360869846, "length_metre": 6.1322717233786399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5840145, 54.5104261 ], [ -126.5840606, 54.5104275 ], [ -126.584106199999979, 54.5104375 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17091080, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 245062.97583175899, "blue_line_key": 360873822, "length_metre": 97.857173610370197, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.213467599999987, 54.4237188 ], [ -126.213503499999987, 54.423639 ], [ -126.213482199999987, 54.4235208 ], [ -126.213422599999987, 54.4234753 ], [ -126.2131949, 54.4234069 ], [ -126.2128895, 54.4233642 ], [ -126.212712700000012, 54.4232702 ], [ -126.2125651, 54.4231491 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17069783, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 8938.6291191706805, "blue_line_key": 360875378, "length_metre": 106.26666931096401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5454708, 54.547964 ], [ -126.54559, 54.548038 ], [ -126.5458432, 54.5482146 ], [ -126.546037500000011, 54.5482987 ], [ -126.5463693, 54.5484682 ], [ -126.5466844, 54.5486006 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076297, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 213595.05529967599, "blue_line_key": 360873822, "length_metre": 812.37090590640696, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.38894470000001, 54.5143726 ], [ -126.388375200000013, 54.5142686 ], [ -126.3879251, 54.5139225 ], [ -126.3868508, 54.5136562 ], [ -126.3863343, 54.513632 ], [ -126.3855828, 54.513669 ], [ -126.3846317, 54.513988 ], [ -126.3833287, 54.5146802 ], [ -126.3820749, 54.5150576 ], [ -126.381767, 54.5152356 ], [ -126.3816731, 54.5153353 ], [ -126.3816947, 54.5154835 ], [ -126.382239, 54.5158267 ], [ -126.3822762, 54.5159164 ], [ -126.3821931, 54.5160902 ], [ -126.381864, 54.516286699999988 ], [ -126.3815466, 54.5163522 ], [ -126.3807287, 54.5160332 ], [ -126.3804658, 54.5160133 ], [ -126.380191199999985, 54.5160546 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17098355, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 28288.444888395901, "blue_line_key": 360880905, "length_metre": 58.8095877405718, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.427061599999988, 54.3064252 ], [ -126.426937599999988, 54.3064238 ], [ -126.4268719, 54.306485 ], [ -126.4268458, 54.3066815 ], [ -126.4269572, 54.306855299999988 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100635, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1944.4753130980801, "blue_line_key": 360874778, "length_metre": 347.89998820950501, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3442703, 54.2684971 ], [ -126.3441811, 54.26846 ], [ -126.3441847, 54.268396 ], [ -126.3442213, 54.2683347 ], [ -126.3444381, 54.2682948 ], [ -126.3445333, 54.2682607 ], [ -126.3445503, 54.2682065 ], [ -126.3444758, 54.2681695 ], [ -126.3443702, 54.2681581 ], [ -126.3441717, 54.2681538 ], [ -126.3437864, 54.2681538 ], [ -126.3436661, 54.2681154 ], [ -126.343654500000014, 54.2680527 ], [ -126.3437045, 54.2680086 ], [ -126.343906, 54.2679772 ], [ -126.3439988, 54.2679431 ], [ -126.3439883, 54.2678704 ], [ -126.343781299999989, 54.2677679 ], [ -126.3436909, 54.2677479 ], [ -126.343582199999986, 54.2677451 ], [ -126.343274399999984, 54.2677465 ], [ -126.3430443, 54.2677693 ], [ -126.3428002, 54.267953 ], [ -126.342693299999979, 54.2679587 ], [ -126.3425131, 54.2678832 ], [ -126.3423929, 54.2678718 ], [ -126.3421883, 54.2679117 ], [ -126.3421102, 54.2679459 ], [ -126.341924, 54.2679958 ], [ -126.3417231, 54.2679915 ], [ -126.341542300000015, 54.2679516 ], [ -126.341433599999988, 54.2679487 ], [ -126.341310299999989, 54.267973 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17097613, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 13327.6399328476, "blue_line_key": 360886221, "length_metre": 69.477326395945994, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.629525300000012, 54.3182362 ], [ -126.6295197, 54.318558 ], [ -126.6295874, 54.3186364 ], [ -126.629944, 54.3186848 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17055261, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 27061.4382271139, "blue_line_key": 360856488, "length_metre": 46.796404055163499, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5805102, 54.6247403 ], [ -126.5807476, 54.624664800000012 ], [ -126.581127099999989, 54.6245195 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17106047, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 10075.1018853648, "blue_line_key": 360882583, "length_metre": 167.628452220463, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.958094500000016, 54.1890903 ], [ -125.9581066, 54.1890447 ], [ -125.958239, 54.1889436 ], [ -125.958417799999978, 54.1888752 ], [ -125.9586268, 54.1888168 ], [ -125.9588209, 54.1887399 ], [ -125.9589054, 54.1886303 ], [ -125.9587641, 54.1883554 ], [ -125.958759799999982, 54.1883013 ], [ -125.958938, 54.1882343 ], [ -125.959317899999974, 54.1881617 ], [ -125.959448899999984, 54.1880777 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17079800, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 6187.2418102768997, "blue_line_key": 360875052, "length_metre": 451.39412547360303, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3869173, 54.4980896 ], [ -126.386995899999988, 54.4980825 ], [ -126.387057200000015, 54.4980754 ], [ -126.38736990000001, 54.4980369 ], [ -126.3876172, 54.4980241 ], [ -126.387956699999989, 54.4980141 ], [ -126.3881138, 54.4979999 ], [ -126.3884396, 54.4979799 ], [ -126.388671300000013, 54.4979486 ], [ -126.3890165, 54.4979016 ], [ -126.3893876, 54.4978646 ], [ -126.389669, 54.4978176 ], [ -126.390051899999975, 54.4976282 ], [ -126.390168499999987, 54.4975128 ], [ -126.3902522, 54.4974074 ], [ -126.3903197, 54.497292 ], [ -126.3903924, 54.4971411 ], [ -126.3904414, 54.4970784 ], [ -126.390609500000011, 54.4968933 ], [ -126.3906953, 54.4967608 ], [ -126.390714599999981, 54.4966711 ], [ -126.3907259, 54.4965272 ], [ -126.390735899999981, 54.4963663 ], [ -126.390865299999973, 54.4962424 ], [ -126.3910117, 54.496147 ], [ -126.3912199, 54.496043 ], [ -126.3915356, 54.4959333 ], [ -126.3916293, 54.4959177 ], [ -126.391770799999989, 54.4958849 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17083410, "stream_order": 5, "gnis_name": "Ailport Creek", "downstream_route_measure": 0.0, "blue_line_key": 360878058, "length_metre": 8.7175448345120099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.25636, 54.4795549 ], [ -126.2562704, 54.4794965 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17094388, "stream_order": 5, "gnis_name": "Bulkley River", "downstream_route_measure": 260533.94874073399, "blue_line_key": 360873822, "length_metre": 1482.94617528602, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.094459399999977, 54.3813255 ], [ -126.091554699999989, 54.3810566 ], [ -126.0878685, 54.3826788 ], [ -126.0812812, 54.3830605 ], [ -126.0742122, 54.3860043 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17092745, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 0.0, "blue_line_key": 360886221, "length_metre": 17.423133198362301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.659128, 54.4033227 ], [ -126.658997199999988, 54.4031863 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092387, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 13190.1412734187, "blue_line_key": 360846413, "length_metre": 559.81811098236199, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2813288, 54.4136411 ], [ -126.2812607, 54.4134958 ], [ -126.2810605, 54.4132751 ], [ -126.2810173, 54.413211 ], [ -126.2809964, 54.41305 ], [ -126.2809806, 54.4128336 ], [ -126.2808559, 54.4126413 ], [ -126.280801399999987, 54.412506 ], [ -126.2807214, 54.4123322 ], [ -126.28059540000001, 54.4121229 ], [ -126.2805411, 54.4120146 ], [ -126.2804186, 54.4117953 ], [ -126.28036130000001, 54.4117227 ], [ -126.2801683, 54.4115917 ], [ -126.2801281, 54.411519 ], [ -126.2800017, 54.4113453 ], [ -126.2797497, 54.4111872 ], [ -126.2796441, 54.4111402 ], [ -126.2793297, 54.4110063 ], [ -126.2793002, 54.4109792 ], [ -126.279256600000011, 54.4109508 ], [ -126.279197, 54.4109052 ], [ -126.2791545, 54.4108596 ], [ -126.2790688, 54.41075 ], [ -126.2789802, 54.410675899999987 ], [ -126.278807199999989, 54.4105093 ], [ -126.278801699999988, 54.410374 ], [ -126.2788659, 54.4103312 ], [ -126.2790225, 54.4102899 ], [ -126.2792569, 54.410223 ], [ -126.2794659, 54.4101105 ], [ -126.279581799999988, 54.4100051 ], [ -126.279575, 54.4098527 ], [ -126.2793725, 54.409659 ], [ -126.2791813, 54.4095023 ], [ -126.2791257, 54.4094112 ], [ -126.2790513, 54.4093727 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17067685, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 19354.317266919799, "blue_line_key": 360875378, "length_metre": 46.083189582504097, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.657268299999984, 54.5580303 ], [ -126.657623500000014, 54.5583885 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17095495, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 7573.4674300385404, "blue_line_key": 360886221, "length_metre": 6.6769066168020297, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.618017, 54.3561372 ], [ -126.618016, 54.3560774 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17088897, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 186589.79279438101, "blue_line_key": 360873822, "length_metre": 116.64954024015, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.582773199999977, 54.440835 ], [ -126.582758399999989, 54.4411583 ], [ -126.582550700000013, 54.4412836 ], [ -126.5821521, 54.4413662 ], [ -126.581635499999976, 54.4413235 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17059635, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 14770.301751749201, "blue_line_key": 360856488, "length_metre": 868.77031787846795, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.487993699999976, 54.6012451 ], [ -126.4880954, 54.6013277 ], [ -126.4882875, 54.601475799999989 ], [ -126.4885716, 54.6016424 ], [ -126.488749, 54.6017905 ], [ -126.488913700000012, 54.6018831 ], [ -126.4891191, 54.6020498 ], [ -126.4893153, 54.6021438 ], [ -126.489469699999987, 54.6021737 ], [ -126.489713, 54.6022235 ], [ -126.489879699999989, 54.6022819 ], [ -126.4902145, 54.6023873 ], [ -126.490394399999985, 54.6024713 ], [ -126.4904666, 54.6025539 ], [ -126.4904931, 54.6026266 ], [ -126.4904439, 54.6026978 ], [ -126.490347500000013, 54.602749 ], [ -126.4900282, 54.6029043 ], [ -126.489963800000012, 54.6029484 ], [ -126.489958799999982, 54.60301960000001 ], [ -126.4899996, 54.6030937 ], [ -126.4901136, 54.6032475 ], [ -126.490276199999983, 54.6033956 ], [ -126.4904242, 54.6035153 ], [ -126.4906439, 54.603690400000012 ], [ -126.490899, 54.6038485 ], [ -126.4911409, 54.6039169 ], [ -126.491496, 54.6039425 ], [ -126.4916036, 54.6039796 ], [ -126.4919502, 54.604122 ], [ -126.492267799999979, 54.6042274 ], [ -126.49260169999998, 54.6043427 ], [ -126.4926921, 54.6043798 ], [ -126.4929965, 54.6044951 ], [ -126.4933461, 54.6046005 ], [ -126.4936312, 54.6047501 ], [ -126.493719200000015, 54.604815599999988 ], [ -126.4940166, 54.6050007 ], [ -126.4941258, 54.6050121 ], [ -126.494265, 54.605015 ], [ -126.4944853, 54.6049395 ], [ -126.494863099999989, 54.6048569 ], [ -126.495019, 54.6048327 ], [ -126.4951429, 54.6048441 ], [ -126.495247599999985, 54.6048825 ], [ -126.495439800000014, 54.6050306 ], [ -126.495530800000012, 54.6050591 ], [ -126.4956419, 54.6050434 ], [ -126.4957211, 54.6049922 ], [ -126.495823, 54.6048683 ], [ -126.495956799999988, 54.6047088 ], [ -126.4959918, 54.604629 ], [ -126.4960986, 54.6044054 ], [ -126.496248199999982, 54.6042288 ], [ -126.4963122, 54.6041861 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17082292, "stream_order": 4, "gnis_name": "Ailport Creek", "downstream_route_measure": 12246.963984349801, "blue_line_key": 360878058, "length_metre": 118.430148666785, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1345512, 54.4858143 ], [ -126.13453650000001, 54.4858143 ], [ -126.134282399999989, 54.4856819 ], [ -126.134029500000011, 54.4855323 ], [ -126.1337602, 54.4854355 ], [ -126.133365, 54.485327200000015 ], [ -126.1330131, 54.4852831 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17065712, "stream_order": 4, "gnis_name": "Redtop Creek", "downstream_route_measure": 1245.3070393469, "blue_line_key": 360883143, "length_metre": 133.49954643715699, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3048107, 54.5695678 ], [ -126.304605400000014, 54.5696348 ], [ -126.3044653, 54.569649 ], [ -126.304308, 54.5696632 ], [ -126.3040277, 54.5696846 ], [ -126.303889, 54.5697088 ], [ -126.3038077, 54.5697515 ], [ -126.303660600000015, 54.5698555 ], [ -126.3035954, 54.5699082 ], [ -126.303414, 54.5700748 ], [ -126.303219899999988, 54.5702144 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091687, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 6909.5154015353801, "blue_line_key": 360862508, "length_metre": 33.991068733497499, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4738797, 54.416367 ], [ -126.4737778, 54.4162047 ], [ -126.4736352, 54.4161021 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17095085, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 6994.3061023210303, "blue_line_key": 360886524, "length_metre": 1224.6652169940701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.216891100000012, 54.3686574 ], [ -126.2170147, 54.3686603 ], [ -126.2173697, 54.3686589 ], [ -126.2175393, 54.3686361 ], [ -126.2178232, 54.3685264 ], [ -126.218042900000015, 54.3684865 ], [ -126.218259499999988, 54.3684823 ], [ -126.2183808, 54.3685122 ], [ -126.218659500000015, 54.3686888 ], [ -126.218729499999981, 54.368807 ], [ -126.2188166, 54.368891 ], [ -126.218906, 54.368928 ], [ -126.2190285, 54.3689409 ], [ -126.219235200000014, 54.3688554 ], [ -126.219298200000011, 54.3688027 ], [ -126.219424299999986, 54.3687785 ], [ -126.219578500000011, 54.3687643 ], [ -126.219669799999977, 54.3687757 ], [ -126.2197911, 54.3688326 ], [ -126.219847399999978, 54.3688867 ], [ -126.2198886, 54.3689693 ], [ -126.2201904, 54.3690477 ], [ -126.2205473, 54.3690206 ], [ -126.2208105, 54.3689822 ], [ -126.220921199999978, 54.3689394 ], [ -126.2210326, 54.3689152 ], [ -126.221312900000015, 54.3688497 ], [ -126.2214059, 54.3688426 ], [ -126.2215902, 54.3688469 ], [ -126.2219593, 54.3688469 ], [ -126.2223389, 54.3689266 ], [ -126.222513299999989, 54.3688768 ], [ -126.222626299999988, 54.3687799 ], [ -126.222594199999989, 54.3685905 ], [ -126.2223601, 54.3684054 ], [ -126.222351300000014, 54.36828 ], [ -126.2225641, 54.3681234 ], [ -126.2228185, 54.3679938 ], [ -126.2229251, 54.3679966 ], [ -126.2230175, 54.3680251 ], [ -126.2233759, 54.3681775 ], [ -126.2236214, 54.3682017 ], [ -126.2238803, 54.368243 ], [ -126.224184099999988, 54.3682957 ], [ -126.22455380000001, 54.3682943 ], [ -126.224662099999989, 54.3682786 ], [ -126.2247888, 54.3682458 ], [ -126.224913599999979, 54.3682045 ], [ -126.2251245, 54.3680465 ], [ -126.225204, 54.3679952 ], [ -126.225538499999985, 54.36784 ], [ -126.225614399999984, 54.3678599 ], [ -126.225801699999977, 54.3678286 ], [ -126.2259083, 54.3678314 ], [ -126.226264500000013, 54.3678129 ], [ -126.226422899999989, 54.367726 ], [ -126.2266131, 54.3676591 ], [ -126.2268669, 54.367538 ], [ -126.227158, 54.3673472 ], [ -126.227289399999989, 54.3672332 ], [ -126.2274384, 54.3670566 ], [ -126.227757700000012, 54.3669028 ], [ -126.227867800000013, 54.3668686 ], [ -126.22800740000001, 54.3668544 ], [ -126.2280992, 54.3668572 ], [ -126.2284542, 54.3668558 ], [ -126.2286697, 54.3668345 ], [ -126.2287209, 54.3667803 ], [ -126.2288419, 54.3665866 ], [ -126.2288973, 54.3664528 ], [ -126.2289467, 54.3663901 ], [ -126.2291363, 54.3663047 ], [ -126.2292831, 54.3662092 ], [ -126.229360700000015, 54.3661836 ], [ -126.2296629, 54.3660298 ], [ -126.2300239, 54.3659301 ], [ -126.2301211, 54.3658774 ], [ -126.2302159, 54.3658446 ], [ -126.230375599999974, 54.3657677 ], [ -126.230715199999977, 54.3657478 ], [ -126.2308589, 54.3656609 ], [ -126.2309525, 54.3656452 ], [ -126.2311068, 54.365631 ], [ -126.2312144, 54.3656239 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101132, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 25308.075676574801, "blue_line_key": 360881038, "length_metre": 164.91484593560099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0705166, 54.2607138 ], [ -126.0705802, 54.2607066 ], [ -126.0708794, 54.2607949 ], [ -126.071149100000014, 54.2609174 ], [ -126.0712222, 54.2609374 ], [ -126.071285100000011, 54.2609388 ], [ -126.0713469, 54.2609231 ], [ -126.071378799999977, 54.2608961 ], [ -126.0713974, 54.2608519 ], [ -126.071396099999987, 54.260662499999988 ], [ -126.071384099999989, 54.2606354 ], [ -126.071227099999987, 54.2604517 ], [ -126.0709054, 54.2604446 ], [ -126.070793900000012, 54.2604959 ], [ -126.0707328, 54.260503 ], [ -126.070670600000014, 54.260493 ], [ -126.070566500000012, 54.2604446 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101563, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 22932.809554003099, "blue_line_key": 360886221, "length_metre": 1382.4257228705301, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.632433100000014, 54.2603705 ], [ -126.6324337, 54.260362 ], [ -126.632253100000014, 54.2602865 ], [ -126.632071900000014, 54.260219600000013 ], [ -126.6319966, 54.2601911 ], [ -126.631876, 54.2601526 ], [ -126.6316639, 54.2601042 ], [ -126.631481299999976, 54.2600828 ], [ -126.6312981, 54.26007 ], [ -126.631176900000014, 54.2600401 ], [ -126.631135699999987, 54.2599775 ], [ -126.631137699999982, 54.2599233 ], [ -126.63117339999998, 54.2598151 ], [ -126.6313247, 54.2596214 ], [ -126.6313415, 54.2595943 ], [ -126.6313573, 54.2595772 ], [ -126.6313632, 54.2594776 ], [ -126.631292799999983, 54.2593593 ], [ -126.631250400000013, 54.2593138 ], [ -126.631222899999983, 54.2592326 ], [ -126.631212600000012, 54.2591514 ], [ -126.631354800000011, 54.2590731 ], [ -126.6314492, 54.2590474 ], [ -126.631590300000013, 54.2589791 ], [ -126.631715899999975, 54.2589549 ], [ -126.6318255, 54.2589207 ], [ -126.6319186, 54.258878 ], [ -126.631997599999977, 54.2588338 ], [ -126.632108500000015, 54.2588096 ], [ -126.63223330000001, 54.2587669 ], [ -126.632280599999987, 54.2587227 ], [ -126.6323487, 54.2585988 ], [ -126.632409700000011, 54.2583567 ], [ -126.632416799999973, 54.2582399 ], [ -126.632418799999982, 54.2581858 ], [ -126.632409599999988, 54.2580875 ], [ -126.6324015, 54.2579793 ], [ -126.6323485, 54.2578255 ], [ -126.6323205, 54.2577528 ], [ -126.6322671, 54.257634599999989 ], [ -126.63218089999998, 54.2575335 ], [ -126.6321219, 54.2574794 ], [ -126.6320795, 54.2574338 ], [ -126.631962699999988, 54.2573227 ], [ -126.63186, 54.2572131 ], [ -126.6317881, 54.257140400000011 ], [ -126.6316893, 54.2569852 ], [ -126.6316188, 54.256867 ], [ -126.6315823, 54.2567217 ], [ -126.631569699999986, 54.2566676 ], [ -126.6315746, 54.2565779 ], [ -126.6315837, 54.256407 ], [ -126.63164110000001, 54.2562375 ], [ -126.6316771, 54.2561492 ], [ -126.631695400000012, 54.2560765 ], [ -126.631718299999974, 54.2559427 ], [ -126.6316948, 54.2558159 ], [ -126.631682399999988, 54.2557889 ], [ -126.6316676, 54.2557618 ], [ -126.6316249, 54.2556892 ], [ -126.6315569, 54.255571 ], [ -126.63147, 54.2554442 ], [ -126.631402899999983, 54.255289 ], [ -126.631347299999987, 54.2551978 ], [ -126.6312629, 54.255071 ], [ -126.63117720000001, 54.2549614 ], [ -126.631089399999979, 54.2548788 ], [ -126.6310321, 54.2548061 ], [ -126.6310212, 54.2547335 ], [ -126.6310108, 54.2546523 ], [ -126.6310155, 54.2545355 ], [ -126.6310506, 54.2544914 ], [ -126.6311453, 54.2544302 ], [ -126.6312555, 54.2543874 ], [ -126.6314567, 54.2543561 ], [ -126.6315334, 54.254339 ], [ -126.6316438, 54.2543233 ], [ -126.631754499999985, 54.2542721 ], [ -126.631912, 54.2541852 ], [ -126.632005600000014, 54.254141 ], [ -126.6321321, 54.2540727 ], [ -126.6322456, 54.2539929 ], [ -126.632421, 54.2538619 ], [ -126.6325194, 54.2537836 ], [ -126.632663099999974, 54.2536597 ], [ -126.632776400000012, 54.2535457 ], [ -126.632843, 54.2534745 ], [ -126.6328762, 54.253421800000012 ], [ -126.6329297, 54.253305 ], [ -126.6330278, 54.2531996 ], [ -126.6331408, 54.2531213 ], [ -126.63328079999998, 54.25307 ], [ -126.633451, 54.2530643 ], [ -126.633633, 54.2530942 ], [ -126.6338134, 54.2531427 ], [ -126.633965099999983, 54.2531826 ], [ -126.6341494, 54.2531854 ], [ -126.6343048, 54.2531526 ], [ -126.6343402, 54.2530729 ], [ -126.634376199999977, 54.2529917 ], [ -126.6343952, 54.2529034 ], [ -126.634399500000015, 54.2528222 ], [ -126.6343788, 54.2526599 ], [ -126.6343667, 54.2525972 ], [ -126.634312200000011, 54.2524961 ], [ -126.634239599999987, 54.2524049 ], [ -126.6341801, 54.252359399999982 ], [ -126.6340663, 54.2522397 ], [ -126.6339608, 54.252165699999985 ], [ -126.6338431, 54.2520916 ], [ -126.633709700000011, 54.2520346 ], [ -126.6335881, 54.2520062 ], [ -126.6334501, 54.2520033 ], [ -126.6333692, 54.252046 ], [ -126.633287599999989, 54.2521528 ], [ -126.6332173, 54.2523038 ], [ -126.633167199999988, 54.2523836 ], [ -126.633116399999977, 54.2524377 ], [ -126.633040099999988, 54.2524534 ], [ -126.632932, 54.252442 ], [ -126.632842700000012, 54.2524049 ], [ -126.632753899999983, 54.2523665 ], [ -126.632679199999984, 54.2523294 ], [ -126.6326049, 54.2522568 ], [ -126.632550400000014, 54.2521557 ], [ -126.6325089, 54.252066 ], [ -126.632495800000015, 54.2520204 ], [ -126.6325155, 54.2519577 ], [ -126.6325656, 54.251878 ], [ -126.6326159, 54.2518253 ], [ -126.6326654, 54.2517541 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17082595, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 228541.72602171099, "blue_line_key": 360873822, "length_metre": 347.74647033016402, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2615176, 54.4848487 ], [ -126.2613014, 54.484843 ], [ -126.2610887, 54.4847932 ], [ -126.2609352, 54.4847903 ], [ -126.2607049, 54.4847761 ], [ -126.2604244, 54.4847789 ], [ -126.2601328, 54.4847718 ], [ -126.2600265, 54.4847604 ], [ -126.2596595, 54.4846892 ], [ -126.2592807, 54.4845824 ], [ -126.259037099999986, 54.4845226 ], [ -126.2588546, 54.4844912 ], [ -126.2584723, 54.4844286 ], [ -126.258259599999988, 54.4843787 ], [ -126.257924499999987, 54.4843075 ], [ -126.257622500000011, 54.4842121 ], [ -126.2573643, 54.4841523 ], [ -126.257046699999989, 54.4840455 ], [ -126.256867, 54.4839785 ], [ -126.256643299999979, 54.483856 ], [ -126.256584100000012, 54.4838019 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092484, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 18112.8703682337, "blue_line_key": 360862508, "length_metre": 8.4622591498400794, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3459106, 54.4079856 ], [ -126.345859499999975, 54.4079158 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17089080, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 2077.9992113641301, "blue_line_key": 360862508, "length_metre": 630.99783975135904, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5072305, 54.4446874 ], [ -126.5071611, 54.4445778 ], [ -126.507087700000014, 54.4444866 ], [ -126.5068788, 54.4443841 ], [ -126.5067802, 54.444245900000013 ], [ -126.5067426, 54.4440665 ], [ -126.506662600000013, 54.4438756 ], [ -126.506651799999986, 54.4437945 ], [ -126.5066346, 54.443578 ], [ -126.5066286, 54.4434341 ], [ -126.5065271, 54.4432974 ], [ -126.5064383, 54.4432504 ], [ -126.5061731, 54.4430567 ], [ -126.50604, 54.4429542 ], [ -126.5059994, 54.4428815 ], [ -126.5059166, 54.4427192 ], [ -126.5058973, 54.4425298 ], [ -126.505892100000011, 54.4423489 ], [ -126.505838499999982, 54.4422221 ], [ -126.50575689999998, 54.4420498 ], [ -126.50567310000001, 54.4419045 ], [ -126.5055992, 54.4418219 ], [ -126.5053952, 54.4416282 ], [ -126.5053574, 54.4414844 ], [ -126.505394599999988, 54.4414132 ], [ -126.5055054, 54.4413349 ], [ -126.5058416, 54.441144 ], [ -126.5059732, 54.4410201 ], [ -126.5060612, 54.440825 ], [ -126.506084699999988, 54.4406811 ], [ -126.5062037, 54.4405302 ], [ -126.5062395, 54.4404419 ], [ -126.506274300000015, 54.4403707 ], [ -126.50627, 54.4402083 ], [ -126.506267, 54.4399932 ], [ -126.5062584, 54.439885 ], [ -126.5062061, 54.4397127 ], [ -126.5062631, 54.4395432 ], [ -126.5062973, 54.4394805 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17094720, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 22285.337252951598, "blue_line_key": 360862508, "length_metre": 598.36735671544204, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.33157079999998, 54.3779561 ], [ -126.3315883, 54.3778934 ], [ -126.3315855, 54.3776955 ], [ -126.331598099999979, 54.377516 ], [ -126.3315919, 54.377362200000015 ], [ -126.3315511, 54.3772981 ], [ -126.3314503, 54.377197 ], [ -126.3312291, 54.3770218 ], [ -126.330995, 54.3768281 ], [ -126.3309248, 54.376737 ], [ -126.330842599999983, 54.3765903 ], [ -126.330681, 54.3764607 ], [ -126.3306079, 54.3764051 ], [ -126.3303714, 54.3762385 ], [ -126.330212899999978, 54.3761004 ], [ -126.3299582, 54.3759779 ], [ -126.3297467, 54.3758924 ], [ -126.329674200000014, 54.3758283 ], [ -126.3294105, 54.3756147 ], [ -126.3291896, 54.3754936 ], [ -126.3288494, 54.3752615 ], [ -126.3286907, 54.3750963 ], [ -126.328518500000015, 54.3749211 ], [ -126.3284511, 54.3747673 ], [ -126.3284449, 54.3746135 ], [ -126.3285805, 54.3744184 ], [ -126.328710500000014, 54.3743144 ], [ -126.3287628, 54.3742432 ], [ -126.328912, 54.374058 ], [ -126.3289006, 54.373994 ], [ -126.3288197, 54.3738302 ], [ -126.3286849, 54.3737832 ], [ -126.3285158, 54.3737704 ], [ -126.3281755, 54.3737718 ], [ -126.32791469999998, 54.3737832 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17094403, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 845.38752292007996, "blue_line_key": 360886524, "length_metre": 359.57191834555698, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.151979, 54.382589099999983 ], [ -126.152010800000014, 54.382589099999983 ], [ -126.1520997, 54.3826275 ], [ -126.152254, 54.3826403 ], [ -126.1524125, 54.3825535 ], [ -126.152485399999989, 54.382412500000015 ], [ -126.1524964, 54.382233 ], [ -126.1525973, 54.3821091 ], [ -126.152976900000013, 54.3819653 ], [ -126.153272, 54.3819539 ], [ -126.1535647, 54.3819425 ], [ -126.1537527, 54.3818755 ], [ -126.15379369999998, 54.3817417 ], [ -126.153780799999979, 54.3817231 ], [ -126.1536002, 54.3816477 ], [ -126.153241899999983, 54.3814953 ], [ -126.153175, 54.3813486 ], [ -126.1531946, 54.3812603 ], [ -126.1532766, 54.3812161 ], [ -126.1534805, 54.3811592 ], [ -126.1538405, 54.3810766 ], [ -126.1539183, 54.3810438 ], [ -126.15402109999998, 54.3809014 ], [ -126.154155100000011, 54.3807604 ], [ -126.1541918, 54.3806721 ], [ -126.1541177, 54.3806336 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093241, "stream_order": 4, "gnis_name": "McKilligan Creek", "downstream_route_measure": 6467.8750208724896, "blue_line_key": 360770255, "length_metre": 527.16478917699203, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.553688099999988, 54.3981528 ], [ -126.5534377, 54.3982112 ], [ -126.5533163, 54.3982084 ], [ -126.5531611, 54.3982326 ], [ -126.5530654, 54.3982753 ], [ -126.552925799999983, 54.3982895 ], [ -126.552556400000014, 54.3982824 ], [ -126.552389399999981, 54.3982426 ], [ -126.552067600000015, 54.3982183 ], [ -126.5517156, 54.3981756 ], [ -126.5515787, 54.3981542 ], [ -126.5512393, 54.3981386 ], [ -126.5509343, 54.3980873 ], [ -126.550813800000014, 54.3980403 ], [ -126.5504503, 54.3979605 ], [ -126.550341300000014, 54.3979506 ], [ -126.5501887, 54.3979463 ], [ -126.5498693, 54.3978594 ], [ -126.549567599999989, 54.397764 ], [ -126.549385899999976, 54.3977241 ], [ -126.5492925, 54.3977042 ], [ -126.5490486, 54.3976814 ], [ -126.548894600000011, 54.39766 ], [ -126.5486522, 54.3976187 ], [ -126.548314300000015, 54.3975846 ], [ -126.548192, 54.3975917 ], [ -126.5479145, 54.3975945 ], [ -126.547834599999987, 54.3976202 ], [ -126.547711699999979, 54.3976358 ], [ -126.5473238, 54.3976814 ], [ -126.547121499999989, 54.3977142 ], [ -126.546902, 54.397754 ], [ -126.5467337, 54.3977597 ], [ -126.546373599999981, 54.3978238 ], [ -126.5462653, 54.397839500000011 ], [ -126.5459852, 54.3978708 ], [ -126.5458786, 54.397868 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080044, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 223034.44221264101, "blue_line_key": 360873822, "length_metre": 251.18866707706499, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3014733, 54.4964005 ], [ -126.3013087, 54.496325 ], [ -126.301172099999988, 54.4962951 ], [ -126.3008058, 54.4962424 ], [ -126.3005748, 54.4962367 ], [ -126.3003958, 54.4961256 ], [ -126.3003392, 54.496043 ], [ -126.3002871, 54.4959063 ], [ -126.300299099999989, 54.4957268 ], [ -126.3004154, 54.4956129 ], [ -126.3007011, 54.4954847 ], [ -126.3007261, 54.4953238 ], [ -126.300715099999977, 54.4952511 ], [ -126.300674, 54.4951871 ], [ -126.3005253, 54.4950945 ], [ -126.3004217, 54.4950475 ], [ -126.3001597, 54.4950048 ], [ -126.3000381, 54.4950019 ], [ -126.2999443, 54.4950176 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17079736, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 221917.07258215101, "blue_line_key": 360873822, "length_metre": 1117.36963049064, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.305679200000014, 54.5011716 ], [ -126.305760799999987, 54.5009337 ], [ -126.3061521, 54.5006318 ], [ -126.3061753, 54.5004068 ], [ -126.305991800000015, 54.5001903 ], [ -126.3057499, 54.5002017 ], [ -126.304999, 54.5005079 ], [ -126.304586, 54.5005108 ], [ -126.303304299999979, 54.5000849 ], [ -126.3030779, 54.4999482 ], [ -126.302804399999985, 54.4996676 ], [ -126.302688800000013, 54.4994397 ], [ -126.302798, 54.4992418 ], [ -126.3029704, 54.4991706 ], [ -126.303460800000011, 54.4991777 ], [ -126.3037007, 54.4991236 ], [ -126.3039549, 54.4989455 ], [ -126.304040699999987, 54.498786 ], [ -126.3038936, 54.498474099999989 ], [ -126.303305499999979, 54.4978902 ], [ -126.302998899999977, 54.4974188 ], [ -126.3027858, 54.4972308 ], [ -126.302493, 54.4971297 ], [ -126.302242100000015, 54.4971596 ], [ -126.3019004, 54.497453 ], [ -126.3010641, 54.4979799 ], [ -126.3008056, 54.4979828 ], [ -126.3005276, 54.4978674 ], [ -126.300467, 54.4976367 ], [ -126.300557599999976, 54.497124 ], [ -126.300753899999989, 54.4970058 ], [ -126.3012161, 54.4968918 ], [ -126.301440899999974, 54.4967622 ], [ -126.301518699999988, 54.4965771 ], [ -126.3014733, 54.4964005 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092148, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 14184.1139837013, "blue_line_key": 360862508, "length_metre": 269.25633328063202, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3840208, 54.4118053 ], [ -126.3812873, 54.4119999 ], [ -126.3798829, 54.4119904 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17076490, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 207064.587614788, "blue_line_key": 360873822, "length_metre": 214.75042804824699, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4512032, 54.512546699999987 ], [ -126.450406199999989, 54.5128615 ], [ -126.449164399999987, 54.5137117 ], [ -126.4489993, 54.5139453 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17091011, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 241864.444598478, "blue_line_key": 360873822, "length_metre": 3198.5312332813801, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.206451199999989, 54.434399 ], [ -126.206571, 54.4344474 ], [ -126.2067997, 54.4344787 ], [ -126.2070627, 54.4344759 ], [ -126.2073699, 54.4344659 ], [ -126.2076188, 54.4344616 ], [ -126.207712500000014, 54.4344459 ], [ -126.2078999, 54.4343876 ], [ -126.2080591, 54.4343192 ], [ -126.2081263, 54.4342409 ], [ -126.208261599999986, 54.4340543 ], [ -126.2083277, 54.4340201 ], [ -126.2085276, 54.4340158 ], [ -126.2088519, 54.4340059 ], [ -126.2090888, 54.4339119 ], [ -126.2091248, 54.4338592 ], [ -126.2091163, 54.4337324 ], [ -126.2090898, 54.4336698 ], [ -126.2088714, 54.4334932 ], [ -126.208758, 54.4333379 ], [ -126.2087395, 54.433157 ], [ -126.2088131, 54.4330061 ], [ -126.208878399999989, 54.4329263 ], [ -126.2090457, 54.4327326 ], [ -126.209174800000014, 54.4326728 ], [ -126.209473, 54.4325717 ], [ -126.209572, 54.4324934 ], [ -126.209622, 54.4324221 ], [ -126.2096161, 54.4322883 ], [ -126.2095747, 54.4322327 ], [ -126.2094662, 54.4322213 ], [ -126.209111899999982, 54.4322399 ], [ -126.208817, 54.4322427 ], [ -126.208479699999984, 54.4322341 ], [ -126.2083082, 54.4322484 ], [ -126.2080741, 54.4322797 ], [ -126.207827, 54.4322997 ], [ -126.207673199999988, 54.432305400000011 ], [ -126.207426099999978, 54.4322911 ], [ -126.2072899, 54.4322612 ], [ -126.2071424, 54.4321672 ], [ -126.207076699999988, 54.4319949 ], [ -126.2070655, 54.4319237 ], [ -126.2071008, 54.431852500000012 ], [ -126.2072399, 54.4318468 ], [ -126.2075176, 54.4318439 ], [ -126.2077771, 54.4318852 ], [ -126.2081321, 54.4318852 ], [ -126.20833660000001, 54.4318268 ], [ -126.2084834, 54.4317314 ], [ -126.2085016, 54.4316602 ], [ -126.2084815, 54.4315249 ], [ -126.2083209, 54.4313853 ], [ -126.208187599999974, 54.4313198 ], [ -126.2080955, 54.4312899 ], [ -126.207763500000013, 54.4311845 ], [ -126.2075712, 54.431072 ], [ -126.207438899999985, 54.4309695 ], [ -126.207221099999984, 54.4307572 ], [ -126.2071662, 54.4306576 ], [ -126.2070689, 54.4305123 ], [ -126.206988, 54.4303485 ], [ -126.2069766, 54.4302844 ], [ -126.2069447, 54.4300864 ], [ -126.207011799999989, 54.4300152 ], [ -126.207104300000012, 54.4299825 ], [ -126.2073532, 54.4299782 ], [ -126.2075059, 54.429982499999987 ], [ -126.2077023, 54.4300494 ], [ -126.20791, 54.4301804 ], [ -126.2079961, 54.4302545 ], [ -126.208077, 54.4304183 ], [ -126.208114200000011, 54.4305536 ], [ -126.208172100000013, 54.4306177 ], [ -126.208392300000014, 54.4308028 ], [ -126.2085562, 54.4308783 ], [ -126.208736699999989, 54.4309282 ], [ -126.208875400000011, 54.4309581 ], [ -126.2090439, 54.4309524 ], [ -126.209295, 54.4308869 ], [ -126.2094288, 54.4307458 ], [ -126.209449399999983, 54.4306746 ], [ -126.209445, 54.4304952 ], [ -126.209398799999974, 54.4302687 ], [ -126.209330200000011, 54.430132 ], [ -126.209237, 54.4299412 ], [ -126.209230299999987, 54.4297888 ], [ -126.209239699999983, 54.4296805 ], [ -126.2092903, 54.4296008 ], [ -126.2093846, 54.4295766 ], [ -126.209476, 54.429588 ], [ -126.2095662, 54.4296165 ], [ -126.2097286, 54.4297375 ], [ -126.2098418, 54.4298657 ], [ -126.210151499999981, 54.4300879 ], [ -126.2102578, 54.4301263 ], [ -126.210488899999987, 54.4301235 ], [ -126.2105526, 54.4300893 ], [ -126.2106013, 54.4300352 ], [ -126.2105965, 54.4298913 ], [ -126.2106848, 54.4297404 ], [ -126.210762699999975, 54.4297076 ], [ -126.210902300000015, 54.4297005 ], [ -126.2110115, 54.4297033 ], [ -126.211379400000013, 54.4297218 ], [ -126.2117043, 54.4297104 ], [ -126.211966499999988, 54.4296891 ], [ -126.2121423, 54.4296221 ], [ -126.2122383, 54.4295524 ], [ -126.212298199999978, 54.4293644 ], [ -126.2123494, 54.4292761 ], [ -126.212431900000013, 54.4292234 ], [ -126.212637699999988, 54.4291479 ], [ -126.2127774, 54.4291336 ], [ -126.212916, 54.429136500000013 ], [ -126.2129431, 54.4291906 ], [ -126.212916100000015, 54.4293345 ], [ -126.212763599999988, 54.4295552 ], [ -126.212757700000012, 54.4296264 ], [ -126.2127315, 54.429788800000011 ], [ -126.212736299999989, 54.4299326 ], [ -126.212755300000012, 54.430112099999981 ], [ -126.2127779, 54.4302474 ], [ -126.2128317, 54.430357 ], [ -126.2129385, 54.430387 ], [ -126.213046299999988, 54.4303798 ], [ -126.2131446, 54.430283 ], [ -126.213273699999988, 54.4301961 ], [ -126.2136487, 54.4301334 ], [ -126.2138402, 54.4300565 ], [ -126.2139716, 54.4299426 ], [ -126.214023399999988, 54.4298458 ], [ -126.21404339999998, 54.4297831 ], [ -126.2140868, 54.4295865 ], [ -126.2141533, 54.4295239 ], [ -126.2141892, 54.4294441 ], [ -126.2142687, 54.4293929 ], [ -126.214396, 54.4293587 ], [ -126.2144927, 54.4293074 ], [ -126.214621, 54.429202 ], [ -126.2146009, 54.4290667 ], [ -126.2145284, 54.4290026 ], [ -126.2143461, 54.4289442 ], [ -126.2141928, 54.4289414 ], [ -126.2139652, 54.4289001 ], [ -126.2138755, 54.4288431 ], [ -126.2138165, 54.428789 ], [ -126.213615800000014, 54.4285768 ], [ -126.2133156, 54.4284714 ], [ -126.213211199999975, 54.4284144 ], [ -126.2131215, 54.4283503 ], [ -126.2131108, 54.4282777 ], [ -126.2131331, 54.428188 ], [ -126.2132292, 54.4281452 ], [ -126.2134615, 54.4281324 ], [ -126.2137798, 54.4281937 ], [ -126.2139043, 54.428188 ], [ -126.214014, 54.4281552 ], [ -126.214192499999982, 54.4280327 ], [ -126.2143421, 54.4278746 ], [ -126.214531299999976, 54.427824799999989 ], [ -126.214796499999977, 54.4277678 ], [ -126.2148755, 54.4277251 ], [ -126.21507459999998, 54.4275314 ], [ -126.2151151, 54.4273975 ], [ -126.21516339999998, 54.4273448 ], [ -126.2152741, 54.4273021 ], [ -126.215655, 54.4271682 ], [ -126.215960200000012, 54.4269859 ], [ -126.21628840000001, 54.4269033 ], [ -126.2163863, 54.4268421 ], [ -126.2164357, 54.426772299999989 ], [ -126.2164097, 54.4267082 ], [ -126.216278800000012, 54.4266156 ], [ -126.2161856, 54.4265957 ], [ -126.2158472, 54.4265971 ], [ -126.2156661, 54.426555799999988 ], [ -126.215575199999989, 54.4265088 ], [ -126.215501, 54.4264633 ], [ -126.2154896, 54.4263992 ], [ -126.2155031, 54.4262112 ], [ -126.2154983, 54.4260673 ], [ -126.215432, 54.4259035 ], [ -126.215343499999989, 54.4258295 ], [ -126.2151956, 54.425764 ], [ -126.2150882, 54.4257426 ], [ -126.2149956, 54.4257412 ], [ -126.2148559, 54.4257554 ], [ -126.2147605, 54.4258167 ], [ -126.214724499999974, 54.4258694 ], [ -126.214737, 54.4259235 ], [ -126.2147855, 54.4260958 ], [ -126.2148063, 54.4262496 ], [ -126.2147857, 54.4263208 ], [ -126.214722099999975, 54.4263821 ], [ -126.2146407, 54.4264248 ], [ -126.2145317, 54.426449 ], [ -126.2144245, 54.4264476 ], [ -126.2141514, 54.4263693 ], [ -126.213848899999988, 54.426298 ], [ -126.213587699999977, 54.4262753 ], [ -126.2133713, 54.4262781 ], [ -126.2131998, 54.4263194 ], [ -126.2129229, 54.4265117 ], [ -126.2125827, 54.4265387 ], [ -126.21249250000001, 54.4265102 ], [ -126.21245, 54.4264376 ], [ -126.2124405, 54.4263479 ], [ -126.2124397, 54.4261585 ], [ -126.212402399999988, 54.425996099999985 ], [ -126.212353900000011, 54.4258238 ], [ -126.2123001, 54.4256871 ], [ -126.212284099999977, 54.4254991 ], [ -126.212304, 54.4254093 ], [ -126.212404699999979, 54.4252854 ], [ -126.2125025, 54.4252242 ], [ -126.2128397, 54.4250348 ], [ -126.212951499999988, 54.4249479 ], [ -126.213243799999987, 54.4247471 ], [ -126.2133003, 54.4245961 ], [ -126.213308399999974, 54.4244708 ], [ -126.213272299999986, 54.4243255 ], [ -126.2131538, 54.42426 ], [ -126.213096, 54.4241959 ], [ -126.2130445, 54.4240321 ], [ -126.213130399999983, 54.4239082 ], [ -126.2134175, 54.423763 ], [ -126.213467599999987, 54.4237188 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099433, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 24874.136656868599, "blue_line_key": 360880905, "length_metre": 193.867763194421, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4041392, 54.2876214 ], [ -126.404121, 54.2876655 ], [ -126.404164, 54.2877296 ], [ -126.4042521, 54.2877766 ], [ -126.404342, 54.2878051 ], [ -126.404433, 54.2878165 ], [ -126.4044636, 54.2878264 ], [ -126.40452470000001, 54.2878535 ], [ -126.4046117, 54.2879105 ], [ -126.404704, 54.287939 ], [ -126.4048075, 54.2880045 ], [ -126.4048821, 54.2880415 ], [ -126.404939, 54.2880871 ], [ -126.404920300000015, 54.2881597 ], [ -126.404932100000011, 54.2882224 ], [ -126.4050361, 54.2882523 ], [ -126.4051454, 54.2882537 ], [ -126.405282299999982, 54.2882665 ], [ -126.405435, 54.2882694 ], [ -126.405572399999983, 54.2882808 ], [ -126.40565, 54.2882822 ], [ -126.4057264, 54.2882936 ], [ -126.4058774, 54.288314899999989 ], [ -126.4059985, 54.2883449 ], [ -126.4061053, 54.2883463 ], [ -126.4062158, 54.2883306 ], [ -126.4063087, 54.2883235 ], [ -126.40639560000001, 54.2883805 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102090, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 28175.9308078619, "blue_line_key": 360881038, "length_metre": 85.914365904807198, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0693676, 54.245536 ], [ -126.0694672, 54.2454306 ], [ -126.0697245, 54.2452739 ], [ -126.069752, 54.2450859 ], [ -126.069723, 54.2450589 ], [ -126.0696791, 54.2450389 ], [ -126.0693736, 54.2450147 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17097972, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 29278.626799287402, "blue_line_key": 360880905, "length_metre": 131.27890329736701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4277397, 54.3140191 ], [ -126.4277499, 54.3141003 ], [ -126.427757199999974, 54.3142441 ], [ -126.4276841, 54.3144221 ], [ -126.4276109, 54.3146002 ], [ -126.4275361, 54.3148238 ], [ -126.427445399999982, 54.3150374 ], [ -126.427345100000011, 54.3151613 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104033, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 5021.5487178241501, "blue_line_key": 360882583, "length_metre": 206.06265556973, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.9907493, 54.2193846 ], [ -125.990459, 54.2194188 ], [ -125.990162900000016, 54.2193633 ], [ -125.9897926, 54.2193106 ], [ -125.9897007, 54.219322 ], [ -125.9895952, 54.2193505 ], [ -125.9895359, 54.2193789 ], [ -125.9894908, 54.2193889 ], [ -125.9894316, 54.2194174 ], [ -125.9893865, 54.2194274 ], [ -125.989268, 54.2194843 ], [ -125.9891924, 54.2195043 ], [ -125.988905500000016, 54.2195755 ], [ -125.988601499999973, 54.2196268 ], [ -125.9884238, 54.2197122 ], [ -125.9882549, 54.2197079 ], [ -125.988208300000011, 54.2196823 ], [ -125.9879604, 54.2196609 ], [ -125.9878664, 54.21964530000001 ], [ -125.9878361, 54.2196282 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17055556, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 24498.331978034701, "blue_line_key": 360856488, "length_metre": 170.30304795817401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5460266, 54.6230547 ], [ -126.5486704, 54.6230621 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17093784, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 173379.73166306899, "blue_line_key": 360873822, "length_metre": 79.125426877646206, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.678332900000015, 54.3908637 ], [ -126.6776621, 54.3909848 ], [ -126.677262599999978, 54.391177 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099995, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 8561.5518988754102, "blue_line_key": 360877225, "length_metre": 121.284702420039, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.195030800000012, 54.2795817 ], [ -126.1952114, 54.2794336 ], [ -126.195256699999987, 54.2794165 ], [ -126.1954042, 54.2793125 ], [ -126.195448700000014, 54.279304 ], [ -126.19549640000001, 54.2792869 ], [ -126.1955429, 54.2792798 ], [ -126.195865399999988, 54.2792783 ], [ -126.195913, 54.2792883 ], [ -126.1959735, 54.2792897 ], [ -126.196280699999988, 54.2792968 ], [ -126.196465800000013, 54.2792641 ], [ -126.19659369999998, 54.2791872 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17088516, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 188661.10183764901, "blue_line_key": 360873822, "length_metre": 106.64438567592499, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5586791, 54.4440708 ], [ -126.5581144, 54.4441519 ], [ -126.5579748, 54.4445237 ], [ -126.5580373, 54.4447586 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17067529, "stream_order": 4, "gnis_name": "Redtop Creek", "downstream_route_measure": 125.024323135548, "blue_line_key": 360883143, "length_metre": 547.60483137764004, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.306507899999986, 54.560263500000012 ], [ -126.3065313, 54.5603717 ], [ -126.3065648, 54.5605625 ], [ -126.306644499999976, 54.560761899999989 ], [ -126.306655299999974, 54.5608431 ], [ -126.306688, 54.5610226 ], [ -126.306708399999977, 54.5611949 ], [ -126.306703599999977, 54.5612576 ], [ -126.3067098, 54.5614285 ], [ -126.3067347, 54.5615182 ], [ -126.306768800000015, 54.5617076 ], [ -126.30679, 54.5618429 ], [ -126.3067905, 54.5620508 ], [ -126.3067967, 54.5622217 ], [ -126.306798300000011, 54.5624197 ], [ -126.3067777, 54.5624995 ], [ -126.3067661, 54.5626789 ], [ -126.30669180000001, 54.5628484 ], [ -126.3063539, 54.5630478 ], [ -126.306283400000012, 54.5631717 ], [ -126.306285299999985, 54.5633967 ], [ -126.3063508, 54.5635876 ], [ -126.3063145, 54.5636488 ], [ -126.306184699999989, 54.5637456 ], [ -126.3060097, 54.5638311 ], [ -126.3057985, 54.5639707 ], [ -126.3057105, 54.5641302 ], [ -126.305589199999986, 54.5643424 ], [ -126.305538199999987, 54.5643965 ], [ -126.3054658, 54.5645745 ], [ -126.305376099999989, 54.5647526 ], [ -126.3053082, 54.5648409 ], [ -126.3052588, 54.5648836 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17069358, "stream_order": 4, "gnis_name": "Johnny David Creek", "downstream_route_measure": 5530.2175329330603, "blue_line_key": 360866287, "length_metre": 190.70436860383299, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.407747599999979, 54.5503937 ], [ -126.4079412, 54.5504791 ], [ -126.4082404, 54.5506557 ], [ -126.408388199999976, 54.5507668 ], [ -126.4086991, 54.5509805 ], [ -126.408893600000013, 54.5510844 ], [ -126.4092364, 54.5512981 ], [ -126.409533200000013, 54.5514747 ], [ -126.409622699999986, 54.5515487 ], [ -126.409707200000014, 54.5516584 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17085811, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 196882.39722895899, "blue_line_key": 360873822, "length_metre": 90.4927950816882, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.517305600000014, 54.4649055 ], [ -126.517243799999989, 54.4650123 ], [ -126.5170643, 54.4651191 ], [ -126.516201, 54.4653456 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17087298, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 234814.17083683901, "blue_line_key": 360873822, "length_metre": 202.43440030307099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.238924, 54.4555826 ], [ -126.238896, 54.45551 ], [ -126.238854, 54.455463 ], [ -126.2387796, 54.4554174 ], [ -126.2385847, 54.455332 ], [ -126.2382447, 54.4553234 ], [ -126.237936300000015, 54.4553434 ], [ -126.237703899999985, 54.4553562 ], [ -126.2375793, 54.4553619 ], [ -126.237441300000015, 54.4553505 ], [ -126.2372311, 54.4552736 ], [ -126.2371425, 54.4552266 ], [ -126.2369941, 54.455107 ], [ -126.2369851, 54.4550429 ], [ -126.237018, 54.4549987 ], [ -126.2372891, 54.4548705 ], [ -126.237338400000013, 54.4548079 ], [ -126.2373295, 54.4547367 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17100035, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 22747.717622322201, "blue_line_key": 360880905, "length_metre": 195.65763082007501, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.389208799999977, 54.2778043 ], [ -126.389422599999989, 54.2778271 ], [ -126.389746099999982, 54.2780407 ], [ -126.3897837, 54.2781945 ], [ -126.3897491, 54.2782572 ], [ -126.389426599999979, 54.2782586 ], [ -126.3893937, 54.2783028 ], [ -126.38942059999998, 54.2783569 ], [ -126.3895528, 54.2784509 ], [ -126.389658, 54.2784979 ], [ -126.3899599, 54.2785677 ], [ -126.3901818, 54.2786973 ], [ -126.390225899999976, 54.2787443 ], [ -126.3903503, 54.2789351 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17065736, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 2293.1555101878498, "blue_line_key": 360881574, "length_metre": 21.7051498462022, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6145966, 54.5683245 ], [ -126.6146276, 54.568398500000015 ], [ -126.6147778, 54.5684789 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104267, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 3584.4777188142498, "blue_line_key": 360882583, "length_metre": 281.05321466803099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.009247599999981, 54.2156361 ], [ -126.0091536, 54.2156333 ], [ -126.0088419, 54.2157059 ], [ -126.008543199999977, 54.2158156 ], [ -126.0082282, 54.2159167 ], [ -126.0079315, 54.2160078 ], [ -126.0076211, 54.2160634 ], [ -126.0072645, 54.216099 ], [ -126.007064199999988, 54.2161203 ], [ -126.006752899999981, 54.2161588 ], [ -126.0064126, 54.216203 ], [ -126.0063661, 54.21623 ], [ -126.0062395, 54.2162628 ], [ -126.006096699999986, 54.2163397 ], [ -126.005857599999985, 54.2164593 ], [ -126.005575, 54.2165519 ], [ -126.005496900000011, 54.216559 ], [ -126.0054212, 54.2165661 ], [ -126.0053297, 54.2165633 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17083539, "stream_order": 5, "gnis_name": "Ailport Creek", "downstream_route_measure": 8.7175448345120099, "blue_line_key": 360878058, "length_metre": 81.482729209495503, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2562704, 54.4794965 ], [ -126.2562425, 54.479451 ], [ -126.2561844, 54.4793869 ], [ -126.2559379, 54.4791562 ], [ -126.255871299999981, 54.4790194 ], [ -126.255894900000015, 54.478877 ], [ -126.255944899999989, 54.4788329 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17065810, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 20807.4190942116, "blue_line_key": 360875378, "length_metre": 212.314458521364, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6688343, 54.5677269 ], [ -126.669760599999989, 54.5695521 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093652, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 19504.634680721301, "blue_line_key": 360862508, "length_metre": 526.43626799744402, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3382758, 54.3975774 ], [ -126.3382645, 54.3975404 ], [ -126.338235, 54.3975134 ], [ -126.3381645, 54.3973951 ], [ -126.338123200000013, 54.3973396 ], [ -126.338062900000011, 54.39730260000001 ], [ -126.3377555, 54.3970804 ], [ -126.3376867, 54.3969437 ], [ -126.3375731, 54.3967884 ], [ -126.337347799999975, 54.396693 ], [ -126.337078800000015, 54.396562 ], [ -126.3367838, 54.3963669 ], [ -126.3364993, 54.3962244 ], [ -126.336143600000014, 54.3960279 ], [ -126.336084, 54.3959823 ], [ -126.335984700000012, 54.3958627 ], [ -126.33592680000001, 54.3957986 ], [ -126.3358705, 54.395716 ], [ -126.3358468, 54.3956177 ], [ -126.335850599999986, 54.395545100000014 ], [ -126.336069599999988, 54.3954867 ], [ -126.3361655, 54.395444 ], [ -126.336198899999985, 54.3953913 ], [ -126.336205799999988, 54.3953101 ], [ -126.3361853, 54.3951477 ], [ -126.336158700000013, 54.3950851 ], [ -126.336084199999988, 54.3950196 ], [ -126.3358799, 54.3948444 ], [ -126.3357042, 54.3947333 ], [ -126.3356304, 54.3946863 ], [ -126.3353331, 54.3945182 ], [ -126.3352167, 54.3943986 ], [ -126.335164499999976, 54.3942633 ], [ -126.3351719, 54.3941465 ], [ -126.335180900000012, 54.3940112 ], [ -126.3351286, 54.3938489 ], [ -126.335031, 54.3937107 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17099832, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 21620.796770509402, "blue_line_key": 360881038, "length_metre": 221.03939601606601, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.084127900000013, 54.2839127 ], [ -126.084454, 54.2819415 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17076102, "stream_order": 4, "gnis_name": "Cesford Creek", "downstream_route_measure": 1895.7391749394701, "blue_line_key": 360765936, "length_metre": 405.43904876569798, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2917089, 54.514891 ], [ -126.291482300000013, 54.5150391 ], [ -126.2914012, 54.5151089 ], [ -126.2911727, 54.5153111 ], [ -126.290834299999986, 54.5155191 ], [ -126.2907827, 54.5155817 ], [ -126.2906138, 54.5158025 ], [ -126.290562200000011, 54.5158723 ], [ -126.2904253, 54.5160859 ], [ -126.2903223, 54.5162454 ], [ -126.290299300000015, 54.5163522 ], [ -126.290273199999987, 54.5165231 ], [ -126.2902602, 54.51671970000001 ], [ -126.2902505, 54.5168721 ], [ -126.290214400000011, 54.5169532 ], [ -126.290154, 54.5171313 ], [ -126.2900807, 54.5173178 ], [ -126.2900918, 54.5173905 ], [ -126.290089599999988, 54.5174175 ], [ -126.290072099999989, 54.5174531 ], [ -126.2900705, 54.5174717 ], [ -126.2900688, 54.5174973 ], [ -126.290053, 54.5177223 ], [ -126.290042, 54.5179203 ], [ -126.290037, 54.5179829 ], [ -126.2899626, 54.5181795 ], [ -126.289879099999979, 54.5182493 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17107037, "stream_order": 4, "gnis_name": "Buck Creek", "downstream_route_measure": 65619.664969159494, "blue_line_key": 360886221, "length_metre": 350.34821020292901, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.336116300000015, 54.16892630000001 ], [ -126.3359058, 54.1688494 ], [ -126.3358004, 54.168838 ], [ -126.335693299999988, 54.1688181 ], [ -126.3354218, 54.1687483 ], [ -126.3353026, 54.1687013 ], [ -126.3352588, 54.168654300000014 ], [ -126.3352652, 54.1685831 ], [ -126.3353001, 54.1685204 ], [ -126.3354773, 54.1683538 ], [ -126.335483, 54.1682911 ], [ -126.335288299999988, 54.1682242 ], [ -126.334965599999975, 54.1682085 ], [ -126.334752400000013, 54.1682128 ], [ -126.3345063, 54.1682071 ], [ -126.3342627, 54.1682014 ], [ -126.3341726, 54.1681815 ], [ -126.3341612, 54.1681188 ], [ -126.3342438, 54.168012 ], [ -126.334218400000012, 54.1679479 ], [ -126.3341101, 54.1679379 ], [ -126.3338664, 54.1679322 ], [ -126.333728099999988, 54.1679379 ], [ -126.3336019, 54.1679707 ], [ -126.3335677, 54.1680248 ], [ -126.333579699999987, 54.1680789 ], [ -126.3335002, 54.1681302 ], [ -126.333164700000012, 54.168096 ], [ -126.3331076, 54.168059 ], [ -126.3330499, 54.1680034 ], [ -126.333053199999981, 54.1679408 ], [ -126.333073500000012, 54.1678781 ], [ -126.3332024, 54.1677642 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17094907, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 3886.01579698358, "blue_line_key": 360886524, "length_metre": 823.01909848727098, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1809466, 54.3736764 ], [ -126.181085599999989, 54.3736707 ], [ -126.1812618, 54.3736023 ], [ -126.1813254, 54.3735411 ], [ -126.181347299999985, 54.3734599 ], [ -126.1812799, 54.3733146 ], [ -126.181230199999987, 54.3731608 ], [ -126.1812411, 54.3729813 ], [ -126.1814161, 54.3728959 ], [ -126.18163770000001, 54.3728375 ], [ -126.181855599999977, 54.3727891 ], [ -126.1820747, 54.3727307 ], [ -126.182295, 54.3726552 ], [ -126.182631, 54.3724829 ], [ -126.182980399999977, 54.3723205 ], [ -126.1830979, 54.372198 ], [ -126.1830966, 54.3721881 ], [ -126.182949, 54.3720955 ], [ -126.1827237, 54.3720357 ], [ -126.1826556, 54.3718989 ], [ -126.1826984, 54.3717394 ], [ -126.182812200000015, 54.371634 ], [ -126.18303130000001, 54.3715757 ], [ -126.1830484, 54.3715756 ], [ -126.1832687, 54.3715002 ], [ -126.183368500000014, 54.3713862 ], [ -126.183484, 54.3712623 ], [ -126.183600899999973, 54.3711484 ], [ -126.1837159, 54.3710259 ], [ -126.183862099999985, 54.370912 ], [ -126.184053, 54.3708436 ], [ -126.1841302, 54.370846500000013 ], [ -126.184301499999989, 54.3708052 ], [ -126.1844919, 54.3707382 ], [ -126.184738599999989, 54.3706983 ], [ -126.185016499999989, 54.370714 ], [ -126.1852743, 54.3707653 ], [ -126.1855002, 54.3708237 ], [ -126.1857611, 54.3708664 ], [ -126.186099, 54.370865 ], [ -126.1863916, 54.3708536 ], [ -126.1866842, 54.3708692 ], [ -126.1868949, 54.3709291 ], [ -126.1871055, 54.370996 ], [ -126.187364500000015, 54.3710302 ], [ -126.187673600000011, 54.3710273 ], [ -126.1879167, 54.3710786 ], [ -126.1882087, 54.3710758 ], [ -126.188438300000016, 54.3711171 ], [ -126.1886178, 54.3712025 ], [ -126.1887642, 54.3713051 ], [ -126.188877600000012, 54.3714247 ], [ -126.188993399999987, 54.3715443 ], [ -126.1891398, 54.3716469 ], [ -126.1891716, 54.3716469 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17085167, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 231212.67879831899, "blue_line_key": 360873822, "length_metre": 839.22902772632597, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.257005299999989, 54.4731474 ], [ -126.256881299999989, 54.4731446 ], [ -126.256647699999988, 54.4731674 ], [ -126.256507199999987, 54.4731901 ], [ -126.2561925, 54.4732827 ], [ -126.2561135, 54.4733254 ], [ -126.255848, 54.4733553 ], [ -126.255724599999979, 54.473344 ], [ -126.255455, 54.47322 ], [ -126.2553663, 54.473173 ], [ -126.255085200000011, 54.4729779 ], [ -126.2549698, 54.4728683 ], [ -126.2549282, 54.4728127 ], [ -126.2548011, 54.472611899999983 ], [ -126.2546998, 54.4725108 ], [ -126.2546278, 54.4724652 ], [ -126.254355899999979, 54.4723684 ], [ -126.2542069, 54.4722843 ], [ -126.254149399999989, 54.4722117 ], [ -126.2540679, 54.4720479 ], [ -126.254060900000013, 54.4719297 ], [ -126.2540454, 54.4717047 ], [ -126.254070199999987, 54.4715523 ], [ -126.2541208, 54.4714996 ], [ -126.2541997, 54.4714569 ], [ -126.254400499999988, 54.4714711 ], [ -126.2545306, 54.4715808 ], [ -126.2545752, 54.4716278 ], [ -126.2547151, 54.4718201 ], [ -126.254896, 54.4719041 ], [ -126.2551109, 54.4719269 ], [ -126.2553263, 54.471914 ], [ -126.2554384, 54.4718813 ], [ -126.255586, 54.4717488 ], [ -126.255685299999982, 54.4716349 ], [ -126.2558228, 54.4714483 ], [ -126.25598, 54.471371399999988 ], [ -126.2563273, 54.4712632 ], [ -126.25643980000001, 54.4712019 ], [ -126.2565051, 54.4711492 ], [ -126.256541399999989, 54.4710609 ], [ -126.2565054, 54.4709071 ], [ -126.2564496, 54.470816 ], [ -126.2563227, 54.4706422 ], [ -126.256234599999985, 54.4705867 ], [ -126.2561459, 54.4705397 ], [ -126.2557858, 54.4703602 ], [ -126.2554373, 54.470271900000014 ], [ -126.255213099999978, 54.470158 ], [ -126.2551228, 54.4701295 ], [ -126.255016599999976, 54.4701181 ], [ -126.2549056, 54.4701338 ], [ -126.2547959, 54.4701665 ], [ -126.25448, 54.4702762 ], [ -126.25435490000001, 54.4702833 ], [ -126.2540536, 54.4701865 ], [ -126.2539063, 54.4700839 ], [ -126.253852799999976, 54.4699657 ], [ -126.2538743, 54.4698845 ], [ -126.2539224, 54.4698319 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17093807, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 172365.37055734999, "blue_line_key": 360873822, "length_metre": 889.59874108276802, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6886108, 54.3927864 ], [ -126.6883725, 54.393282 ], [ -126.688167, 54.3935427 ], [ -126.6879001, 54.3937549 ], [ -126.6875532, 54.3938802 ], [ -126.6862793, 54.3938503 ], [ -126.6857716, 54.3938118 ], [ -126.685317, 54.3937193 ], [ -126.6832588, 54.3929758 ], [ -126.68303920000001, 54.3928619 ], [ -126.6827511, 54.3925998 ], [ -126.682645, 54.3922153 ], [ -126.682979, 54.3917681 ], [ -126.6831398, 54.3913266 ], [ -126.68308780000001, 54.391145699999988 ], [ -126.6828815, 54.3909791 ], [ -126.682317900000015, 54.3907569 ], [ -126.6818041, 54.3906586 ], [ -126.6807261, 54.3906287 ], [ -126.68002, 54.3906615 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17054765, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 20171.982371312501, "blue_line_key": 360856488, "length_metre": 161.26182533421499, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.516019, 54.6284603 ], [ -126.5161726, 54.6284717 ], [ -126.5162956, 54.628493 ], [ -126.5163862, 54.6285301 ], [ -126.516487199999986, 54.6286583 ], [ -126.5165801, 54.6286597 ], [ -126.516689899999989, 54.6286269 ], [ -126.5167237, 54.6285643 ], [ -126.5168441, 54.6283862 ], [ -126.516989700000011, 54.628299399999989 ], [ -126.5170822, 54.6283022 ], [ -126.51721950000001, 54.6283321 ], [ -126.517293399999986, 54.6283962 ], [ -126.51735, 54.6284603 ], [ -126.5174777, 54.6286611 ], [ -126.5175048, 54.6287323 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17107259, "stream_order": 4, "gnis_name": "Buck Creek", "downstream_route_measure": 66661.527087683397, "blue_line_key": 360886221, "length_metre": 617.54842181543199, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3264386, 54.1642877 ], [ -126.326336500000011, 54.1642407 ], [ -126.326105700000014, 54.1642264 ], [ -126.32589, 54.1642578 ], [ -126.325710300000011, 54.1644244 ], [ -126.325617, 54.1644401 ], [ -126.3254191, 54.1644358 ], [ -126.325283399999989, 54.1643874 ], [ -126.3252879, 54.1643347 ], [ -126.3252314, 54.1642692 ], [ -126.324983499999973, 54.164282 ], [ -126.3247519, 54.1643304 ], [ -126.3244867, 54.1643973 ], [ -126.3243814, 54.1643859 ], [ -126.324323699999979, 54.1643304 ], [ -126.3242554, 54.1642036 ], [ -126.3241807, 54.1641481 ], [ -126.3241064, 54.1641182 ], [ -126.323982899999976, 54.1641168 ], [ -126.3236307, 54.1641353 ], [ -126.3235407, 54.1641153 ], [ -126.3234711, 54.1639786 ], [ -126.323396299999985, 54.1639501 ], [ -126.323287799999989, 54.1639743 ], [ -126.3231994, 54.1641709 ], [ -126.323104300000011, 54.1642051 ], [ -126.322997599999979, 54.1642108 ], [ -126.322688599999978, 54.1642578 ], [ -126.3225789, 54.1642919 ], [ -126.3224711, 54.1643076 ], [ -126.3223487, 54.1642962 ], [ -126.322034699999989, 54.1641894 ], [ -126.321958200000012, 54.1641524 ], [ -126.3220235, 54.1640997 ], [ -126.32227420000001, 54.1640057 ], [ -126.322340199999985, 54.1639444 ], [ -126.322342800000015, 54.1638903 ], [ -126.322302399999984, 54.1638276 ], [ -126.322212399999984, 54.1637807 ], [ -126.322018299999982, 54.1637123 ], [ -126.3219195, 54.1636026 ], [ -126.32171910000001, 54.1635984 ], [ -126.3216544, 54.1636425 ], [ -126.32162, 54.1637037 ], [ -126.3215717, 54.1637564 ], [ -126.321401, 54.1637977 ], [ -126.3212926, 54.1637949 ], [ -126.321203900000015, 54.1637579 ], [ -126.321191899999988, 54.1637037 ], [ -126.3212402, 54.163651 ], [ -126.321335300000015, 54.1636169 ], [ -126.3213557, 54.1635542 ], [ -126.321326699999986, 54.1635001 ], [ -126.3212378, 54.1634702 ], [ -126.3211452, 54.1634773 ], [ -126.3209295, 54.1635086 ], [ -126.320834399999981, 54.1635428 ], [ -126.3207277, 54.1635485 ], [ -126.3206187, 54.1635471 ], [ -126.32041, 54.1634787 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17093655, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 173592.65984922901, "blue_line_key": 360873822, "length_metre": 89.648419037865096, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.677137699999989, 54.3922537 ], [ -126.6769366, 54.3926069 ], [ -126.676358099999987, 54.3928776 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17100822, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 23712.5683409993, "blue_line_key": 360881038, "length_metre": 610.55147398868905, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0755739, 54.2684515 ], [ -126.075453699999983, 54.2684401 ], [ -126.075406699999988, 54.2684487 ], [ -126.075296400000013, 54.2684899 ], [ -126.07519689999998, 54.2685953 ], [ -126.0751359, 54.2688019 ], [ -126.0751192, 54.2688275 ], [ -126.0750696, 54.2688631 ], [ -126.0750224, 54.2688788 ], [ -126.0749608, 54.2688873 ], [ -126.0749156, 54.2688773 ], [ -126.074802800000015, 54.2687392 ], [ -126.0747299, 54.2686651 ], [ -126.0746862, 54.2686381 ], [ -126.0744566, 54.2686324 ], [ -126.0743803, 54.268621 ], [ -126.07432, 54.2685925 ], [ -126.0742909, 54.2685654 ], [ -126.07428, 54.2685284 ], [ -126.07443, 54.2683518 ], [ -126.0743041, 54.2681695 ], [ -126.0741145, 54.2680214 ], [ -126.0742498, 54.2678448 ], [ -126.074299499999981, 54.2678092 ], [ -126.074332700000014, 54.267765 ], [ -126.074339900000012, 54.2676853 ], [ -126.074325500000015, 54.2676582 ], [ -126.074328, 54.2676311 ], [ -126.0743141, 54.2676027 ], [ -126.074284299999988, 54.2673776 ], [ -126.07424180000001, 54.2673406 ], [ -126.07412, 54.267293599999988 ], [ -126.073998499999988, 54.2672723 ], [ -126.073952699999978, 54.2672708 ], [ -126.0738313, 54.2672495 ], [ -126.0735096, 54.2672423 ], [ -126.0731925, 54.2671626 ], [ -126.0731467, 54.2671612 ], [ -126.0731015, 54.2671512 ], [ -126.0728322, 54.2670543 ], [ -126.072629799999987, 54.2668877 ], [ -126.0725854, 54.2668692 ], [ -126.072452199999987, 54.2667667 ], [ -126.0724004, 54.2666485 ], [ -126.07241710000001, 54.2666228 ], [ -126.0725962, 54.2664733 ], [ -126.0726141, 54.2664377 ], [ -126.072497399999989, 54.2663636 ], [ -126.072362, 54.2663337 ], [ -126.072131, 54.2663451 ], [ -126.0718751, 54.2664647 ], [ -126.0717993, 54.2664718 ], [ -126.071679399999979, 54.2664063 ], [ -126.0716116, 54.2663052 ], [ -126.071408199999979, 54.2661215 ], [ -126.071260200000012, 54.266046 ], [ -126.0710784, 54.2660232 ], [ -126.070959699999975, 54.2659477 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080310, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 224095.65675221101, "blue_line_key": 360873822, "length_metre": 78.875943016417594, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.295362200000014, 54.493774199999983 ], [ -126.2951307, 54.4937771 ], [ -126.295019699999983, 54.4937928 ], [ -126.29491010000001, 54.4938184 ], [ -126.294845900000013, 54.4938611 ], [ -126.294682099999989, 54.4940192 ], [ -126.2944117, 54.4941388 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17094417, "stream_order": 5, "gnis_name": "Bulkley River", "downstream_route_measure": 258977.14163033801, "blue_line_key": 360873822, "length_metre": 905.33314997133698, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1183201, 54.3808186 ], [ -126.1043648, 54.3804263 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17062903, "stream_order": 5, "gnis_name": "Richfield Creek", "downstream_route_measure": 15330.4086498134, "blue_line_key": 360788426, "length_metre": 169.73609186499701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2352543, 54.584683 ], [ -126.235080199999985, 54.5847513 ], [ -126.234933, 54.5848553 ], [ -126.2347196, 54.585049 ], [ -126.2343999, 54.5852028 ], [ -126.234033, 54.5853651 ], [ -126.2338715, 54.5854606 ], [ -126.233664399999981, 54.585546 ], [ -126.2335562, 54.5855531 ], [ -126.2332433, 54.5855902 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17100616, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 23118.439697788501, "blue_line_key": 360881038, "length_metre": 594.12864321073198, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.078388799999985, 54.2714423 ], [ -126.0782541, 54.2714039 ], [ -126.078115399999987, 54.2714096 ], [ -126.0780682, 54.2714252 ], [ -126.07776770000001, 54.2715534 ], [ -126.0776895, 54.2715605 ], [ -126.077644299999989, 54.2715506 ], [ -126.0776011, 54.2715221 ], [ -126.0775594, 54.2714495 ], [ -126.077561399999979, 54.2714039 ], [ -126.0775494, 54.2713768 ], [ -126.0775892, 54.2712615 ], [ -126.0775042, 54.2711603 ], [ -126.07733660000001, 54.271111900000015 ], [ -126.0771222, 54.2711247 ], [ -126.077057200000013, 54.271149 ], [ -126.0767499, 54.2711689 ], [ -126.0765688, 54.2711105 ], [ -126.076539700000012, 54.2710834 ], [ -126.0764998, 54.2710193 ], [ -126.076500599999989, 54.2709837 ], [ -126.0766086, 54.2707886 ], [ -126.0765946, 54.2707601 ], [ -126.076489900000013, 54.2707131 ], [ -126.076429399999981, 54.2707117 ], [ -126.076384300000015, 54.2707018 ], [ -126.076338499999977, 54.2707003 ], [ -126.076290899999989, 54.2706904 ], [ -126.0761728, 54.270633399999987 ], [ -126.076340500000015, 54.2704482 ], [ -126.0766245, 54.2703386 ], [ -126.076655800000012, 54.2703129 ], [ -126.076866199999984, 54.2701648 ], [ -126.0769735, 54.2699782 ], [ -126.076944499999982, 54.2699241 ], [ -126.0767679, 54.2698202 ], [ -126.0766777, 54.2698002 ], [ -126.0766313, 54.2698002 ], [ -126.0765867, 54.2697888 ], [ -126.0763413, 54.2697931 ], [ -126.0760335, 54.2697945 ], [ -126.0758815, 54.2697632 ], [ -126.075628099999989, 54.2696493 ], [ -126.0756321, 54.2696051 ], [ -126.0757437, 54.2695268 ], [ -126.075807900000015, 54.2694912 ], [ -126.075842400000013, 54.269457 ], [ -126.0758444, 54.2694114 ], [ -126.075816, 54.2693758 ], [ -126.0756991, 54.2693089 ], [ -126.075494100000014, 54.2691693 ], [ -126.075482199999982, 54.2691152 ], [ -126.0755266, 54.2689272 ], [ -126.07556049999998, 54.2688745 ], [ -126.0755918, 54.2688488 ], [ -126.0756091, 54.2688218 ], [ -126.0757085, 54.2687435 ], [ -126.0757829, 54.2685469 ], [ -126.0757708, 54.2685199 ], [ -126.0757258, 54.2684828 ], [ -126.075668, 54.2684543 ], [ -126.0755739, 54.2684515 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17076477, "stream_order": 4, "gnis_name": "Barren Creek", "downstream_route_measure": 10109.7281298371, "blue_line_key": 360869846, "length_metre": 14.835318466425299, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6038536, 54.5119714 ], [ -126.6040819, 54.5119567 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093924, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 17109.1838404765, "blue_line_key": 360846413, "length_metre": 190.36149875462399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2661634, 54.3907224 ], [ -126.269097500000015, 54.3906291 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17105061, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 7992.1332454368703, "blue_line_key": 360882583, "length_metre": 51.623071630763903, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.9672962, 54.2040772 ], [ -125.9672356, 54.2038992 ], [ -125.967261799999989, 54.2038351 ], [ -125.967204299999977, 54.2036485 ], [ -125.9671717, 54.2036315 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17061401, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 13400.3310913109, "blue_line_key": 360856488, "length_metre": 1369.97066043834, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4855782, 54.5911887 ], [ -126.485558899999987, 54.5912514 ], [ -126.485426, 54.5914009 ], [ -126.485129, 54.5914494 ], [ -126.4849889, 54.5914636 ], [ -126.484896, 54.5914622 ], [ -126.484553799999986, 54.5914636 ], [ -126.4841999, 54.5914565 ], [ -126.483844, 54.5914408 ], [ -126.4835967, 54.5914166 ], [ -126.4832261, 54.5914009 ], [ -126.483193, 54.5914536 ], [ -126.4831885, 54.5915163 ], [ -126.4832474, 54.5915804 ], [ -126.4834822, 54.5917826 ], [ -126.4836478, 54.5918581 ], [ -126.4839474, 54.5920361 ], [ -126.484066299999981, 54.5921187 ], [ -126.4841379, 54.5922099 ], [ -126.4841792, 54.5922825 ], [ -126.4841599, 54.5923452 ], [ -126.4841097, 54.5923979 ], [ -126.4840752, 54.5924691 ], [ -126.4840692, 54.5925503 ], [ -126.484198799999987, 54.5927155 ], [ -126.484282099999973, 54.5928793 ], [ -126.484322799999987, 54.5929605 ], [ -126.484350799999973, 54.5930146 ], [ -126.4843463, 54.5930772 ], [ -126.484351499999988, 54.5932396 ], [ -126.4843907, 54.5933749 ], [ -126.4844634, 54.593449 ], [ -126.4846859, 54.5936156 ], [ -126.4849506, 54.5938449 ], [ -126.484976599999982, 54.5938905 ], [ -126.4851514, 54.5940742 ], [ -126.4853115, 54.594257899999988 ], [ -126.485367400000015, 54.5943661 ], [ -126.485464, 54.5945484 ], [ -126.4854753, 54.5946296 ], [ -126.4854643, 54.594782 ], [ -126.4854852, 54.5949629 ], [ -126.4855656, 54.5951708 ], [ -126.4856983, 54.5952634 ], [ -126.4859091, 54.5953574 ], [ -126.485996, 54.59544 ], [ -126.4860332, 54.5956024 ], [ -126.486030199999988, 54.595675 ], [ -126.485985199999988, 54.59589 ], [ -126.4860072, 54.596025300000015 ], [ -126.4861551, 54.596145 ], [ -126.486267, 54.5963187 ], [ -126.4862644, 54.5963899 ], [ -126.4862707, 54.5965423 ], [ -126.4862779, 54.596677600000014 ], [ -126.4862365, 54.5968115 ], [ -126.4862334, 54.5968841 ], [ -126.4862392, 54.5970451 ], [ -126.486281399999982, 54.5971006 ], [ -126.486468500000015, 54.59732 ], [ -126.4865859, 54.5974567 ], [ -126.4867735, 54.5976675 ], [ -126.486829, 54.5977771 ], [ -126.486897200000016, 54.5979139 ], [ -126.486995400000012, 54.5980776 ], [ -126.487063100000015, 54.5982229 ], [ -126.4871628, 54.5983682 ], [ -126.48732840000001, 54.5984437 ], [ -126.487373100000013, 54.5984992 ], [ -126.4874855, 54.5986715 ], [ -126.487496299999989, 54.5987613 ], [ -126.487502, 54.5989151 ], [ -126.4875043, 54.5991216 ], [ -126.4874191, 54.599254 ], [ -126.4872685, 54.5994406 ], [ -126.487090299999977, 54.5995716 ], [ -126.4870352, 54.5996955 ], [ -126.487086699999978, 54.5998593 ], [ -126.4872331, 54.5999975 ], [ -126.487305299999989, 54.6000801 ], [ -126.487405, 54.6002253 ], [ -126.487535099999988, 54.6003891 ], [ -126.487574400000014, 54.6004888 ], [ -126.4876411, 54.6006797 ], [ -126.487682299999989, 54.6007523 ], [ -126.4877943, 54.6009617 ], [ -126.4879195, 54.6011895 ], [ -126.487993699999976, 54.6012451 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17055559, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 24668.6350259928, "blue_line_key": 360856488, "length_metre": 421.54290714032101, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5486704, 54.6230621 ], [ -126.5528737, 54.6229871 ], [ -126.5537955, 54.6234684 ], [ -126.554019900000014, 54.6239065 ], [ -126.5543125, 54.6239541 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17064832, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 6793.8518671828997, "blue_line_key": 360851751, "length_metre": 261.02612894745499, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.150975699999989, 54.5749803 ], [ -126.1470836, 54.5756219 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17071851, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 6108.0210800490304, "blue_line_key": 360875378, "length_metre": 1162.1273478273799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5156957, 54.5374134 ], [ -126.515623199999979, 54.537573 ], [ -126.5155789, 54.5377709 ], [ -126.515591, 54.5378421 ], [ -126.5156498, 54.5379062 ], [ -126.515827699999988, 54.538008800000014 ], [ -126.5161126, 54.5381498 ], [ -126.5162028, 54.5382153 ], [ -126.516261, 54.5382879 ], [ -126.5163588, 54.5384517 ], [ -126.516487500000011, 54.5386254 ], [ -126.5165103, 54.5387508 ], [ -126.516528900000012, 54.5389587 ], [ -126.516556799999989, 54.5390128 ], [ -126.5166855, 54.539151 ], [ -126.5166814, 54.5392407 ], [ -126.5166854, 54.5394202 ], [ -126.516675600000013, 54.5395825 ], [ -126.5167541, 54.539809 ], [ -126.516796599999978, 54.5398987 ], [ -126.51692580000001, 54.5400639 ], [ -126.517080900000011, 54.5402818 ], [ -126.5171629, 54.5404911 ], [ -126.5172709, 54.5407176 ], [ -126.5173296, 54.5407817 ], [ -126.5174431, 54.540964 ], [ -126.517540899999986, 54.5411278 ], [ -126.5175936, 54.541273 ], [ -126.517665099999988, 54.5413642 ], [ -126.5179425, 54.5413784 ], [ -126.5180687, 54.5413542 ], [ -126.5182092, 54.541303 ], [ -126.5184582, 54.5413001 ], [ -126.5188441, 54.5412987 ], [ -126.519185900000011, 54.5412973 ], [ -126.5193259, 54.5412545 ], [ -126.5196226, 54.5412061 ], [ -126.5198259, 54.5411933 ], [ -126.5201515, 54.5411819 ], [ -126.5204482, 54.5410979 ], [ -126.5207636, 54.5410238 ], [ -126.520830600000011, 54.5409441 ], [ -126.52090170000001, 54.5407746 ], [ -126.5210021, 54.5406692 ], [ -126.521388, 54.5406678 ], [ -126.521461, 54.5407404 ], [ -126.5215588, 54.5409042 ], [ -126.5215943, 54.541085 ], [ -126.521615, 54.5412659 ], [ -126.521651, 54.5414098 ], [ -126.521752299999989, 54.5415565 ], [ -126.52184050000001, 54.5416205 ], [ -126.5219318, 54.5416405 ], [ -126.522164, 54.5416362 ], [ -126.522503300000011, 54.5416348 ], [ -126.522813199999987, 54.5416405 ], [ -126.522937899999988, 54.5416348 ], [ -126.5233086, 54.5416419 ], [ -126.523694499999976, 54.5416405 ], [ -126.524051, 54.5416391 ], [ -126.52435890000001, 54.5416362 ], [ -126.524730600000012, 54.5416262 ], [ -126.525070399999976, 54.5416234 ], [ -126.5253488, 54.5416206 ], [ -126.525675299999989, 54.5416277 ], [ -126.525992299999984, 54.5417331 ], [ -126.5262919, 54.5419097 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17085232, "stream_order": 4, "gnis_name": "Raspberry Creek", "downstream_route_measure": 5052.0736817898596, "blue_line_key": 360817924, "length_metre": 125.278349697127, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.634017199999988, 54.4680487 ], [ -126.634305099999978, 54.4681442 ], [ -126.634573800000013, 54.4683023 ], [ -126.6349165, 54.4685159 ], [ -126.6350217, 54.4685729 ], [ -126.635383, 54.4687324 ], [ -126.6354569, 54.4687879 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17069927, "stream_order": 4, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 17769.615891841499, "blue_line_key": 360875378, "length_metre": 269.71004088692098, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.64772330000001, 54.546526899999989 ], [ -126.647919899999977, 54.5466558 ], [ -126.6481546, 54.5469329 ], [ -126.648336199999989, 54.5478274 ], [ -126.64865970000001, 54.5484308 ], [ -126.6482742, 54.5487672 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17088618, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 187319.87282687999, "blue_line_key": 360873822, "length_metre": 162.702681376687, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5771024, 54.4437959 ], [ -126.5767544, 54.4438244 ], [ -126.5761458, 54.4437717 ], [ -126.5753777, 54.4435723 ], [ -126.574811699999984, 54.4433273 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099517, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 24631.266773576299, "blue_line_key": 360880905, "length_metre": 96.539313533326293, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4022084, 54.2865731 ], [ -126.402267599999988, 54.2865917 ], [ -126.402264699999975, 54.2866543 ], [ -126.402305899999988, 54.286709900000012 ], [ -126.4023822, 54.2867284 ], [ -126.4024739, 54.2867312 ], [ -126.402566099999987, 54.2867326 ], [ -126.4026712, 54.2867526 ], [ -126.402763, 54.2867825 ], [ -126.4028535, 54.2868024 ], [ -126.4029616, 54.2868138 ], [ -126.403037399999988, 54.2868067 ], [ -126.4031296, 54.2868081 ], [ -126.4032547, 54.2867925 ], [ -126.403364, 54.2867597 ], [ -126.403458, 54.2867426 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17097303, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 12280.189258107701, "blue_line_key": 360886221, "length_metre": 20.332027999738401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6266396, 54.3234231 ], [ -126.6267255, 54.323248 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17072600, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1099.98391526931, "blue_line_key": 360881632, "length_metre": 126.70139838003, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.645548, 54.5340965 ], [ -126.645759, 54.5339113 ], [ -126.6458767, 54.5337618 ], [ -126.646054899999982, 54.5336293 ], [ -126.646375299999988, 54.5334114 ], [ -126.6464573, 54.5333231 ], [ -126.6465269, 54.5331992 ], [ -126.6465917, 54.5331465 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17105027, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 38013.984820079801, "blue_line_key": 360886221, "length_metre": 525.94475161964601, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5729748, 54.2038892 ], [ -126.572929699999975, 54.2038793 ], [ -126.57284, 54.2038508 ], [ -126.572749699999974, 54.2038308 ], [ -126.5725509, 54.2038009 ], [ -126.5723545, 54.2037782 ], [ -126.5722471, 54.2037582 ], [ -126.5721569, 54.2037383 ], [ -126.5719744, 54.2036899 ], [ -126.571809, 54.2036414 ], [ -126.5716894, 54.2035944 ], [ -126.571584399999978, 54.2035474 ], [ -126.571478899999988, 54.203536 ], [ -126.5713234, 54.2035417 ], [ -126.571214, 54.203603 ], [ -126.571173699999989, 54.2037639 ], [ -126.5711703, 54.2038351 ], [ -126.57117980000001, 54.2039248 ], [ -126.5711576, 54.2040146 ], [ -126.571108599999988, 54.2041043 ], [ -126.5709797, 54.2041997 ], [ -126.5708718, 54.2042154 ], [ -126.5707634, 54.2042325 ], [ -126.5706257, 54.2042296 ], [ -126.570457300000015, 54.2042168 ], [ -126.570303599999974, 54.204204 ], [ -126.5701525, 54.204184 ], [ -126.5700146, 54.2041541 ], [ -126.5699107, 54.2040972 ], [ -126.569853099999989, 54.2040331 ], [ -126.5698133, 54.2039604 ], [ -126.5698021, 54.2038892 ], [ -126.569806, 54.2038166 ], [ -126.569824699999984, 54.2037368 ], [ -126.569859199999982, 54.2036742 ], [ -126.5699259, 54.203603 ], [ -126.5699903, 54.2035246 ], [ -126.570086299999986, 54.2034534 ], [ -126.570213, 54.2034121 ], [ -126.570336599999976, 54.2033865 ], [ -126.570445, 54.2033623 ], [ -126.57054, 54.2033281 ], [ -126.5706202, 54.2032669 ], [ -126.5706688, 54.2032056 ], [ -126.570720200000011, 54.2031159 ], [ -126.570633500000014, 54.2030518 ], [ -126.5705424, 54.2030133 ], [ -126.5704697, 54.2029578 ], [ -126.5703501, 54.2029108 ], [ -126.5701982, 54.2028724 ], [ -126.5700615, 54.202859499999988 ], [ -126.5699378, 54.2028581 ], [ -126.569814199999982, 54.2028909 ], [ -126.569719299999988, 54.2029521 ], [ -126.5696514, 54.2030404 ], [ -126.5695865, 54.203120200000015 ], [ -126.5695062, 54.2031814 ], [ -126.569410699999978, 54.2032241 ], [ -126.5693814, 54.2032241 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17097957, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 14558.633144687999, "blue_line_key": 360886221, "length_metre": 57.972283600078299, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.639164, 54.3139749 ], [ -126.639187600000014, 54.3138311 ], [ -126.6391347, 54.3136687 ], [ -126.639049300000011, 54.3135505 ], [ -126.639038700000015, 54.3134693 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104150, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 5614.3116460321398, "blue_line_key": 360882583, "length_metre": 88.616381652581595, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.9841987, 54.2179106 ], [ -125.984175600000015, 54.2177952 ], [ -125.9841961, 54.217687 ], [ -125.9841761, 54.2176158 ], [ -125.984078, 54.2175189 ], [ -125.9840732, 54.2174463 ], [ -125.9839603, 54.2173694 ], [ -125.9839131, 54.2173523 ], [ -125.9838792, 54.2173252 ], [ -125.9838619, 54.2172996 ], [ -125.9837201, 54.2172483 ], [ -125.983688699999988, 54.2172412 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104748, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 1975.41384046812, "blue_line_key": 360882583, "length_metre": 261.00791236351898, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0281388, 54.2091446 ], [ -126.0278147, 54.2091716 ], [ -126.0274423, 54.2092172 ], [ -126.027396599999989, 54.2092158 ], [ -126.027317, 54.20924 ], [ -126.027110400000012, 54.209371 ], [ -126.0269518, 54.209438 ], [ -126.0269048, 54.2094465 ], [ -126.026844399999973, 54.2094451 ], [ -126.026623699999988, 54.209502 ], [ -126.026590399999989, 54.2095462 ], [ -126.0265867, 54.2096089 ], [ -126.0266021, 54.2097983 ], [ -126.0265203, 54.2098681 ], [ -126.026301499999988, 54.2099265 ], [ -126.02598, 54.2099265 ], [ -126.0256554, 54.2099549 ], [ -126.0253719, 54.2100831 ], [ -126.0252473, 54.2102953 ], [ -126.025232, 54.2103039 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17100403, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 23094.194288904, "blue_line_key": 360881038, "length_metre": 24.245408884585299, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0787027, 54.2715577 ], [ -126.078688700000015, 54.2715492 ], [ -126.078643599999978, 54.2715392 ], [ -126.0785552, 54.2715007 ], [ -126.078388799999985, 54.2714423 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17088816, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 239072.49109572, "blue_line_key": 360873822, "length_metre": 445.59163326776002, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.21025490000001, 54.4448982 ], [ -126.210351, 54.4448555 ], [ -126.210428799999988, 54.444829899999988 ], [ -126.210788, 54.4447843 ], [ -126.2109489, 54.4446903 ], [ -126.2109433, 54.4445279 ], [ -126.2109253, 54.4443385 ], [ -126.210982899999976, 54.4441776 ], [ -126.2110618, 54.4441348 ], [ -126.211127199999979, 54.4440821 ], [ -126.211164899999986, 54.4440109 ], [ -126.2111524, 54.4439568 ], [ -126.211067899999989, 54.4438301 ], [ -126.2109617, 54.4437916 ], [ -126.2107004, 54.443803 ], [ -126.210525800000013, 54.4438528 ], [ -126.2104316, 54.4439041 ], [ -126.2103378, 54.4439198 ], [ -126.2100736, 54.4439326 ], [ -126.209843599999985, 54.4439184 ], [ -126.209736100000015, 54.443897 ], [ -126.2094477, 54.4438543 ], [ -126.209326099999984, 54.4438244 ], [ -126.2090859, 54.4437289 ], [ -126.2089968, 54.4436563 ], [ -126.2087306, 54.4434968 ], [ -126.2086721, 54.4434413 ], [ -126.208604099999988, 54.443323 ], [ -126.208507099999977, 54.4431493 ], [ -126.2084345, 54.4430852 ], [ -126.208255, 54.4429912 ], [ -126.2081636, 54.4429798 ], [ -126.2079488, 54.442957 ], [ -126.2078267, 54.4429357 ], [ -126.2077235, 54.4428887 ], [ -126.207681, 54.4428431 ], [ -126.2076548, 54.4427519 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17095956, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 11058.485368428999, "blue_line_key": 360886524, "length_metre": 1161.90061575142, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2657812, 54.3556516 ], [ -126.266146100000014, 54.3554792 ], [ -126.2663563, 54.3553226 ], [ -126.266593599999979, 54.3552471 ], [ -126.266951400000011, 54.355183 ], [ -126.267032699999987, 54.3551403 ], [ -126.2670104, 54.355005 ], [ -126.266926200000015, 54.3548853 ], [ -126.2668445, 54.3547045 ], [ -126.26683389999998, 54.3546318 ], [ -126.266761599999981, 54.3545677 ], [ -126.2665115, 54.354399699999988 ], [ -126.2664263, 54.35429 ], [ -126.26640759999998, 54.3541106 ], [ -126.2663858, 54.3539738 ], [ -126.26639, 54.3539212 ], [ -126.266452899999976, 54.3538685 ], [ -126.2665642, 54.3538442 ], [ -126.26670249999998, 54.3538471 ], [ -126.2670549, 54.3538457 ], [ -126.267165600000013, 54.35383 ], [ -126.267228499999973, 54.3537773 ], [ -126.267186900000013, 54.3537232 ], [ -126.2671646, 54.3535879 ], [ -126.2671993, 54.3535252 ], [ -126.267294600000014, 54.353491 ], [ -126.2676077, 54.3534084 ], [ -126.267826199999988, 54.3533785 ], [ -126.2680304, 54.3533201 ], [ -126.2682058, 54.3532333 ], [ -126.268335400000012, 54.3531378 ], [ -126.268347100000014, 54.3529484 ], [ -126.2683584, 54.3527604 ], [ -126.2683808, 54.3526707 ], [ -126.2684834, 54.3525211 ], [ -126.2684874, 54.3524485 ], [ -126.2684081, 54.3522676 ], [ -126.268339900000015, 54.3521309 ], [ -126.2683329, 54.3519871 ], [ -126.2683689, 54.3519073 ], [ -126.2684366, 54.3518276 ], [ -126.2685312, 54.3517749 ], [ -126.2688168, 54.3516737 ], [ -126.2690816, 54.3516168 ], [ -126.269254100000012, 54.3515584 ], [ -126.2694937, 54.3514558 ], [ -126.2695637, 54.351322 ], [ -126.2695438, 54.3511596 ], [ -126.269542799999982, 54.3509446 ], [ -126.269551100000015, 54.3507922 ], [ -126.2696406, 54.3506312 ], [ -126.269837799999976, 54.350429 ], [ -126.269942, 54.3502339 ], [ -126.2699863, 54.3500288 ], [ -126.269934599999985, 54.3499006 ], [ -126.2699246, 54.3498194 ], [ -126.2699236, 54.3496044 ], [ -126.269896499999987, 54.3495232 ], [ -126.2697849, 54.349385 ], [ -126.2697578, 54.3493039 ], [ -126.2698156, 54.349142900000011 ], [ -126.2698798, 54.3491002 ], [ -126.270086400000011, 54.3490148 ], [ -126.2701234, 54.348898 ], [ -126.2701288, 54.3488353 ], [ -126.270108900000011, 54.3486729 ], [ -126.2699966, 54.3485092 ], [ -126.269959700000015, 54.3483739 ], [ -126.269952699999976, 54.34823 ], [ -126.269975100000011, 54.3481403 ], [ -126.270065199999976, 54.3479437 ], [ -126.2701294, 54.347901 ], [ -126.2704178, 54.3477102 ], [ -126.2705508, 54.3475507 ], [ -126.2705868, 54.3474709 ], [ -126.2705816, 54.3473356 ], [ -126.270538, 54.3472801 ], [ -126.270448699999989, 54.347243 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17093035, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 13749.9593844011, "blue_line_key": 360846413, "length_metre": 1077.2970974524201, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2790513, 54.4093727 ], [ -126.2789788, 54.4093087 ], [ -126.2789408, 54.4091819 ], [ -126.2790143, 54.4090309 ], [ -126.279057499999979, 54.408834399999989 ], [ -126.2790614, 54.4087618 ], [ -126.2790594, 54.4085823 ], [ -126.2791445, 54.4084399 ], [ -126.2792509, 54.4082448 ], [ -126.2793878, 54.4080326 ], [ -126.279427, 54.4079158 ], [ -126.279501, 54.4077292 ], [ -126.2796504, 54.4075711 ], [ -126.2797224, 54.4073831 ], [ -126.2797834, 54.407178 ], [ -126.279757300000014, 54.4071139 ], [ -126.2796297, 54.4069231 ], [ -126.2794532, 54.4067935 ], [ -126.2793701, 54.4066838 ], [ -126.279350799999989, 54.4065115 ], [ -126.279355900000013, 54.4064218 ], [ -126.2794299, 54.4062352 ], [ -126.2794805, 54.4061825 ], [ -126.2795741, 54.4061398 ], [ -126.2796678, 54.4061241 ], [ -126.279966899999977, 54.4060401 ], [ -126.2801748, 54.4059375 ], [ -126.280421, 54.4059333 ], [ -126.2806845, 54.4059219 ], [ -126.280934199999976, 54.4058735 ], [ -126.2811986, 54.405825 ], [ -126.281279799999979, 54.4057552 ], [ -126.2814445, 54.4055886 ], [ -126.2815529, 54.405573 ], [ -126.2816717, 54.405432 ], [ -126.281759199999982, 54.4052625 ], [ -126.281749, 54.4051813 ], [ -126.2817754, 54.4050389 ], [ -126.28183270000001, 54.4048509 ], [ -126.2817947, 54.404724099999989 ], [ -126.281745, 54.4045618 ], [ -126.2816639, 54.4043709 ], [ -126.281427799999989, 54.4042029 ], [ -126.281089299999977, 54.4039793 ], [ -126.280893, 54.4039123 ], [ -126.2807903, 54.4038297 ], [ -126.2807637, 54.4037742 ], [ -126.28077, 54.4036674 ], [ -126.2807905, 54.4035961 ], [ -126.2808435, 54.4035164 ], [ -126.2809303, 54.4033555 ], [ -126.281034299999988, 54.4031874 ], [ -126.281083099999989, 54.4031262 ], [ -126.2813693, 54.4030236 ], [ -126.2813678, 54.4028086 ], [ -126.281359200000011, 54.4026818 ], [ -126.281461, 54.4025408 ], [ -126.2816722, 54.4023742 ], [ -126.2817116, 54.4022773 ], [ -126.281700300000011, 54.4022132 ], [ -126.2817184, 54.402142 ], [ -126.281746500000011, 54.4019811 ], [ -126.281718, 54.401917 ], [ -126.2816308, 54.4018529 ], [ -126.2815922, 54.4017347 ], [ -126.281476500000011, 54.4016065 ], [ -126.281374500000013, 54.4015496 ], [ -126.281176500000015, 54.4015011 ], [ -126.2809837, 54.4013972 ], [ -126.2809111, 54.401333099999988 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091095, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 273687.925499367, "blue_line_key": 360873822, "length_metre": 89.479964975600595, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1191179, 54.4231316 ], [ -126.120369599999989, 54.4234718 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101915, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 14198.636974630301, "blue_line_key": 360880905, "length_metre": 76.040331602320407, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.413501799999977, 54.2466198 ], [ -126.4135152, 54.2466369 ], [ -126.413540399999988, 54.2467095 ], [ -126.4135985, 54.2467921 ], [ -126.4136695, 54.2468662 ], [ -126.413742199999987, 54.2469217 ], [ -126.4138289, 54.2470129 ], [ -126.413887, 54.247068399999989 ], [ -126.413944500000014, 54.2471325 ], [ -126.413972, 54.2471781 ], [ -126.4139843, 54.2472322 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17097444, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 12300.5212861074, "blue_line_key": 360886221, "length_metre": 363.63399470561097, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6267255, 54.323248 ], [ -126.627020699999989, 54.3228591 ], [ -126.627465, 54.3225814 ], [ -126.6274327, 54.3223464 ], [ -126.6269861, 54.3220189 ], [ -126.6261528, 54.3217283 ], [ -126.6254708, 54.3214036 ], [ -126.6251829, 54.321076 ], [ -126.6251829, 54.3207214 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17087567, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 193237.05236750501, "blue_line_key": 360873822, "length_metre": 997.61983402390399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.527983800000015, 54.4517316 ], [ -126.527528199999978, 54.4517387 ], [ -126.5270314, 54.4518284 ], [ -126.526249600000014, 54.4521375 ], [ -126.5257911, 54.4523839 ], [ -126.525355, 54.452923600000013 ], [ -126.5250227, 54.4532156 ], [ -126.524277900000016, 54.453489 ], [ -126.5226007, 54.4539277 ], [ -126.522133599999989, 54.4542268 ], [ -126.5219473, 54.4544162 ], [ -126.5217617, 54.454758 ], [ -126.5216588, 54.4550172 ], [ -126.521682700000014, 54.4552921 ], [ -126.521952499999983, 54.4555015 ], [ -126.522466399999985, 54.4556083 ], [ -126.5234192, 54.4555599 ], [ -126.5238937, 54.455604 ], [ -126.5245382, 54.4558418 ], [ -126.524970799999977, 54.456111 ], [ -126.525260899999978, 54.4563816 ], [ -126.525304600000013, 54.4572589 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17053709, "stream_order": 4, "gnis_name": "Byman Creek", "downstream_route_measure": 21328.584957048901, "blue_line_key": 360856488, "length_metre": 580.64288557656403, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.525736, 54.635804899999989 ], [ -126.526007799999988, 54.6359374 ], [ -126.5262501, 54.6360414 ], [ -126.5264595, 54.6361624 ], [ -126.526547699999981, 54.6362351 ], [ -126.5267523, 54.6364558 ], [ -126.5267932, 54.636537 ], [ -126.5268575, 54.6367364 ], [ -126.5269024, 54.6367919 ], [ -126.526975299999989, 54.6368375 ], [ -126.527218100000013, 54.6369329 ], [ -126.527551499999987, 54.6370654 ], [ -126.527762700000011, 54.6371594 ], [ -126.527927299999988, 54.6372534 ], [ -126.528303600000015, 54.6374399 ], [ -126.528472, 54.6374798 ], [ -126.5286393, 54.637501199999988 ], [ -126.5288569, 54.6375054 ], [ -126.5291517, 54.6375211 ], [ -126.5293496, 54.637561 ], [ -126.529622, 54.6376564 ], [ -126.529802299999986, 54.637776 ], [ -126.529903300000015, 54.6378686 ], [ -126.530034, 54.6380324 ], [ -126.530254899999989, 54.6382346 ], [ -126.5305515, 54.6384383 ], [ -126.530641100000011, 54.6384853 ], [ -126.5308558, 54.6385266 ], [ -126.53117730000001, 54.6385864 ], [ -126.5314859, 54.6386192 ], [ -126.531765, 54.6386163 ], [ -126.532107599999989, 54.6386149 ], [ -126.5324162, 54.6386121 ], [ -126.532509199999978, 54.6386135 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17086888, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 234195.04318471599, "blue_line_key": 360873822, "length_metre": 168.60842816273799, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.244470299999989, 54.4591517 ], [ -126.244230399999978, 54.4590207 ], [ -126.243907100000015, 54.458807 ], [ -126.243580199999982, 54.4586105 ], [ -126.2434615, 54.458545 ], [ -126.243134, 54.458357 ], [ -126.2429727, 54.4582459 ], [ -126.242643499999986, 54.4580764 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17099802, "stream_order": 4, "gnis_name": "Klo Creek", "downstream_route_measure": 23554.960450962601, "blue_line_key": 360880905, "length_metre": 128.122990816699, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3928452, 54.28201 ], [ -126.392967399999989, 54.2820299 ], [ -126.393287500000014, 54.2820555 ], [ -126.3934761, 54.2820057 ], [ -126.3936177, 54.2819373 ], [ -126.393913799999979, 54.2818804 ], [ -126.3940212, 54.2818733 ], [ -126.394097, 54.2818932 ], [ -126.3942274, 54.2820128 ], [ -126.394319699999983, 54.2820413 ], [ -126.3944648, 54.2819017 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104960, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 37034.523660665, "blue_line_key": 360886221, "length_metre": 979.461159414853, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5774075, 54.207548 ], [ -126.5773618, 54.2075466 ], [ -126.577269799999982, 54.2075452 ], [ -126.5771923, 54.2075438 ], [ -126.577024699999981, 54.2075495 ], [ -126.5768886, 54.2075281 ], [ -126.5767836, 54.2074811 ], [ -126.5766798, 54.207417 ], [ -126.576577, 54.2073429 ], [ -126.5765194, 54.2072518 ], [ -126.576527399999989, 54.207126499999987 ], [ -126.576530799999986, 54.2070624 ], [ -126.5765258, 54.2068915 ], [ -126.5765362, 54.2067391 ], [ -126.576559299999985, 54.2065781 ], [ -126.576637, 54.2063189 ], [ -126.5766748, 54.2061851 ], [ -126.576694699999976, 54.2061224 ], [ -126.576696899999988, 54.2060683 ], [ -126.5766879, 54.2059429 ], [ -126.5766654, 54.2058076 ], [ -126.5766242, 54.205725 ], [ -126.5765978, 54.2056624 ], [ -126.576514299999985, 54.2055342 ], [ -126.5764461, 54.2053975 ], [ -126.5763598, 54.2052978 ], [ -126.5762723, 54.2052152 ], [ -126.5761683, 54.2051311 ], [ -126.5760639, 54.2050756 ], [ -126.575943599999988, 54.2050371 ], [ -126.5758235, 54.2050258 ], [ -126.57568569999998, 54.2050229 ], [ -126.575514, 54.2050471 ], [ -126.575390899999988, 54.2050713 ], [ -126.5752479, 54.2051311 ], [ -126.5752603, 54.2051853 ], [ -126.5753338, 54.2052593 ], [ -126.575423, 54.2053234 ], [ -126.575511, 54.2053704 ], [ -126.5756, 54.2054074 ], [ -126.5756758, 54.2054544 ], [ -126.575792, 54.2055385 ], [ -126.5758813, 54.2056026 ], [ -126.575891899999988, 54.2056752 ], [ -126.5759055, 54.2057193 ], [ -126.5759167, 54.2057834 ], [ -126.575913300000011, 54.2058546 ], [ -126.5758783, 54.2059259 ], [ -126.57572, 54.2059942 ], [ -126.575643899999989, 54.2060028 ], [ -126.5755207, 54.2059999 ], [ -126.57541350000001, 54.206007 ], [ -126.5752587, 54.2060042 ], [ -126.575152499999987, 54.2060013 ], [ -126.575075699999985, 54.2059914 ], [ -126.57498480000001, 54.20598 ], [ -126.5748928, 54.2059786 ], [ -126.57478709999998, 54.205940100000014 ], [ -126.574681499999983, 54.2059016 ], [ -126.5745789, 54.2058546 ], [ -126.5744416, 54.2058162 ], [ -126.5742158, 54.2057663 ], [ -126.5741231, 54.2057464 ], [ -126.573973, 54.2057165 ], [ -126.573821099999975, 54.205678 ], [ -126.573625799999974, 54.2056111 ], [ -126.573552400000011, 54.2055641 ], [ -126.5734029, 54.2054986 ], [ -126.5732849, 54.2054331 ], [ -126.573107, 54.2053035 ], [ -126.573034299999989, 54.2052479 ], [ -126.5729157, 54.2051568 ], [ -126.572767899999988, 54.2050728 ], [ -126.5725766, 54.2049602 ], [ -126.5725015, 54.2049318 ], [ -126.5723948, 54.2049033 ], [ -126.5723987, 54.2048306 ], [ -126.572479500000014, 54.2047609 ], [ -126.572574499999973, 54.2047267 ], [ -126.572666500000011, 54.204728100000011 ], [ -126.5727726, 54.2047309 ], [ -126.572909200000012, 54.2047509 ], [ -126.5729861, 54.2047537 ], [ -126.5731233, 54.2047651 ], [ -126.573229900000015, 54.2047665 ], [ -126.5733531, 54.2047694 ], [ -126.5734474, 54.2047438 ], [ -126.5735565, 54.204711 ], [ -126.5736355, 54.2046669 ], [ -126.573714099999989, 54.2046241 ], [ -126.5737637, 54.2045529 ], [ -126.5737988, 54.2044817 ], [ -126.5738497, 54.2043934 ], [ -126.5738567, 54.2043122 ], [ -126.5737832, 54.2042382 ], [ -126.573648299999974, 54.2041727 ], [ -126.57351460000001, 54.2041171 ], [ -126.573379099999983, 54.2040601 ], [ -126.5732459, 54.2040032 ], [ -126.573096400000011, 54.2039377 ], [ -126.5729748, 54.2038892 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17105146, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 3398.73166427044, "blue_line_key": 360880905, "length_metre": 2543.4131323752599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4101188, 54.2016205 ], [ -126.410146200000014, 54.201666 ], [ -126.4102011, 54.2017843 ], [ -126.410288199999982, 54.2018669 ], [ -126.410359, 54.2019409 ], [ -126.4104144, 54.2020235 ], [ -126.4104558, 54.2021318 ], [ -126.4104948, 54.2022129 ], [ -126.410535699999983, 54.2022955 ], [ -126.4105643, 54.2023582 ], [ -126.4105722, 54.2024579 ], [ -126.4105826, 54.2025305 ], [ -126.410594100000012, 54.2025932 ], [ -126.4106045, 54.2026658 ], [ -126.410770199999988, 54.202983400000015 ], [ -126.410779299999987, 54.2030732 ], [ -126.410805, 54.2031643 ], [ -126.4109019, 54.2033281 ], [ -126.410972, 54.2034378 ], [ -126.4110573, 54.2035389 ], [ -126.4110969, 54.2036386 ], [ -126.4111359, 54.2037468 ], [ -126.411145699999977, 54.2038551 ], [ -126.411153, 54.2039633 ], [ -126.4111011, 54.2040601 ], [ -126.411046200000015, 54.2041855 ], [ -126.411023700000015, 54.2043023 ], [ -126.4110596, 54.2044732 ], [ -126.4111162, 54.2045458 ], [ -126.411323, 54.2046683 ], [ -126.4114418, 54.2047238 ], [ -126.411562499999988, 54.2047808 ], [ -126.411696100000015, 54.2048292 ], [ -126.4118624, 54.2048677 ], [ -126.4120008, 54.204889 ], [ -126.412138, 54.2049004 ], [ -126.4122886, 54.2049218 ], [ -126.4124721, 54.2049531 ], [ -126.4126391, 54.204983 ], [ -126.4127897, 54.2050044 ], [ -126.4129433, 54.2050172 ], [ -126.4131262, 54.20503 ], [ -126.4132622, 54.2050514 ], [ -126.413416399999988, 54.2050628 ], [ -126.4135517, 54.2050927 ], [ -126.4137189, 54.2051155 ], [ -126.413854199999989, 54.2051454 ], [ -126.413990700000014, 54.2051924 ], [ -126.414125399999989, 54.2052308 ], [ -126.414293699999988, 54.2052437 ], [ -126.4144022, 54.2052195 ], [ -126.4144973, 54.2051853 ], [ -126.4145906, 54.2051425 ], [ -126.4147168, 54.2050827 ], [ -126.41481370000001, 54.20503 ], [ -126.414925900000014, 54.2049346 ], [ -126.4150058, 54.2048819 ], [ -126.4150862, 54.2048207 ], [ -126.4151838, 54.2047594 ], [ -126.415322800000013, 54.2047181 ], [ -126.4154331, 54.2046754 ], [ -126.415589200000014, 54.2046341 ], [ -126.41571110000001, 54.204627 ], [ -126.41588, 54.2046313 ], [ -126.416017799999977, 54.2046341 ], [ -126.4161726, 54.2046369 ], [ -126.4163104, 54.2046398 ], [ -126.4164481, 54.2046426 ], [ -126.416585900000015, 54.2046455 ], [ -126.4167548, 54.2046498 ], [ -126.4168615, 54.2046512 ], [ -126.417029699999986, 54.204664 ], [ -126.4171797, 54.2046939 ], [ -126.4173175, 54.2047238 ], [ -126.417439500000015, 54.2047366 ], [ -126.4175766, 54.204748 ], [ -126.4176967, 54.2047594 ], [ -126.417833799999983, 54.2047979 ], [ -126.4179545, 54.2048278 ], [ -126.4181051, 54.2048492 ], [ -126.418289800000011, 54.2048705 ], [ -126.4185167, 54.2049033 ], [ -126.418668400000016, 54.2049417 ], [ -126.4188336, 54.2049901 ], [ -126.418969600000011, 54.2050115 ], [ -126.4191525, 54.2050243 ], [ -126.4192916, 54.2050372 ], [ -126.4195963, 54.2050699 ], [ -126.4197323, 54.2050913 ], [ -126.4198841, 54.2051297 ], [ -126.4200048, 54.2051596 ], [ -126.4201103, 54.205171 ], [ -126.4202474, 54.2051824 ], [ -126.4204303, 54.2051952 ], [ -126.420552299999983, 54.2052081 ], [ -126.4206426, 54.205228 ], [ -126.420734599999989, 54.2052565 ], [ -126.4208998, 54.2053049 ], [ -126.4210205, 54.2053348 ], [ -126.4211095, 54.2053718 ], [ -126.421183299999981, 54.2054374 ], [ -126.4212241, 54.2055271 ], [ -126.4212339, 54.2056083 ], [ -126.4212419, 54.205708 ], [ -126.4212358, 54.2058333 ], [ -126.4212571, 54.2059501 ], [ -126.4212693, 54.2060313 ], [ -126.4212481, 54.2061039 ], [ -126.4212127, 54.2061751 ], [ -126.4211761, 54.2062634 ], [ -126.4210634, 54.2063602 ], [ -126.420920799999976, 54.2064386 ], [ -126.4208262, 54.2064713 ], [ -126.4204854, 54.2065183 ], [ -126.420362900000015, 54.206534 ], [ -126.4202215, 54.2066024 ], [ -126.4202319, 54.206675 ], [ -126.4202746, 54.2067391 ], [ -126.4202996, 54.2068117 ], [ -126.4203112, 54.2068744 ], [ -126.420366699999974, 54.206957 ], [ -126.4204404, 54.2070296 ], [ -126.420525200000014, 54.2071122 ], [ -126.4206119, 54.2071963 ], [ -126.4207435, 54.2072974 ], [ -126.420875799999976, 54.2073899 ], [ -126.4209643, 54.2074825 ], [ -126.4209899, 54.2075537 ], [ -126.4209399, 54.2076249 ], [ -126.4208442, 54.2076677 ], [ -126.4207022, 54.2077375 ], [ -126.420651599999985, 54.2077901 ], [ -126.4206187, 54.2078614 ], [ -126.4206583, 54.207934 ], [ -126.420748, 54.2079895 ], [ -126.4208358, 54.208036500000013 ], [ -126.420987, 54.2080764 ], [ -126.4211083, 54.2081049 ], [ -126.4212449, 54.2081177 ], [ -126.4213827, 54.2081206 ], [ -126.4215522, 54.2081234 ], [ -126.4216906, 54.2081177 ], [ -126.4218436, 54.208112 ], [ -126.4219991, 54.2081063 ], [ -126.4222131, 54.2080935 ], [ -126.4223825, 54.2080693 ], [ -126.422523399999989, 54.208036500000013 ], [ -126.4226496, 54.2080038 ], [ -126.423070799999977, 54.2078685 ], [ -126.423179299999987, 54.2078443 ], [ -126.4234074, 54.2078671 ], [ -126.4235604, 54.2078884 ], [ -126.4237427, 54.2079368 ], [ -126.423875, 54.2080024 ], [ -126.423995099999985, 54.2080679 ], [ -126.4240976, 54.2081419 ], [ -126.424197599999985, 54.208243 ], [ -126.4242696, 54.2083071 ], [ -126.424312899999975, 54.208362699999988 ], [ -126.424324500000012, 54.2084253 ], [ -126.424349499999977, 54.208525 ], [ -126.4243447, 54.2086062 ], [ -126.4243393, 54.2086959 ], [ -126.4243168, 54.2087857 ], [ -126.4242021, 54.2089082 ], [ -126.424077200000013, 54.2089509 ], [ -126.4239534, 54.2089836 ], [ -126.4238138, 54.2089993 ], [ -126.4236431, 54.2090406 ], [ -126.4235334, 54.2090748 ], [ -126.42343769999998, 54.2091175 ], [ -126.4233712, 54.2091873 ], [ -126.423303, 54.2093027 ], [ -126.423282899999975, 54.2093924 ], [ -126.4232927, 54.2094736 ], [ -126.4233361, 54.2095291 ], [ -126.4234537, 54.2095946 ], [ -126.423572600000014, 54.2096502 ], [ -126.4237086, 54.2096986 ], [ -126.4238434, 54.209737 ], [ -126.4240092, 54.2097769 ], [ -126.4241641, 54.2097798 ], [ -126.4242873, 54.2097826 ], [ -126.424376799999976, 54.209784 ], [ -126.424454900000015, 54.2097769 ], [ -126.4245482, 54.2097612 ], [ -126.4246707, 54.2097456 ], [ -126.4248275, 54.2097228 ], [ -126.4250566, 54.2097086 ], [ -126.4252121, 54.2097029 ], [ -126.425317599999985, 54.2097143 ], [ -126.42540790000001, 54.2097613 ], [ -126.425478699999985, 54.2098353 ], [ -126.425519, 54.2099265 ], [ -126.4255288, 54.2100076 ], [ -126.425525099999987, 54.2100789 ], [ -126.425519, 54.2101771 ], [ -126.425512399999974, 54.2102768 ], [ -126.425507, 54.2103936 ], [ -126.42549910000001, 54.2105104 ], [ -126.425412600000016, 54.2106428 ], [ -126.4253151, 54.2107311 ], [ -126.425218699999974, 54.2108095 ], [ -126.425182799999988, 54.2108892 ], [ -126.4252085, 54.2109804 ], [ -126.4252811, 54.211063 ], [ -126.4253506, 54.2111541 ], [ -126.4255281, 54.2112567 ], [ -126.4255872, 54.211302200000013 ], [ -126.4256739, 54.2113863 ], [ -126.4257483, 54.2114233 ], [ -126.4258209, 54.2114788 ], [ -126.425953299999989, 54.2115985 ], [ -126.4263699, 54.2120386 ], [ -126.4263822, 54.2120927 ], [ -126.426409, 54.2121468 ], [ -126.426389500000013, 54.2122009 ], [ -126.4263109, 54.2122437 ], [ -126.426216400000015, 54.2122693 ], [ -126.4261067, 54.2123035 ], [ -126.425970100000015, 54.2123177 ], [ -126.425831699999989, 54.2123234 ], [ -126.425692099999978, 54.2123391 ], [ -126.4256147, 54.2123377 ], [ -126.4254908, 54.2123433 ], [ -126.4253988, 54.2123419 ], [ -126.425325, 54.2123305 ], [ -126.425232900000012, 54.2123291 ], [ -126.4250945, 54.2123348 ], [ -126.4250018, 54.2123419 ], [ -126.424922, 54.2123676 ], [ -126.424843299999978, 54.2124103 ], [ -126.4248239, 54.2124644 ], [ -126.4248062, 54.2125271 ], [ -126.42483129999998, 54.2125997 ], [ -126.42490260000001, 54.2126723 ], [ -126.4249606, 54.2127279 ], [ -126.425035, 54.212792 ], [ -126.425138100000012, 54.2128575 ], [ -126.4252558, 54.212923 ], [ -126.4253455, 54.2129515 ], [ -126.4254333, 54.2130255 ], [ -126.4255517, 54.2131096 ], [ -126.425623, 54.2131822 ], [ -126.4256817, 54.2132563 ], [ -126.425690800000012, 54.2133189 ], [ -126.425703, 54.213373 ], [ -126.425714599999978, 54.2134357 ], [ -126.425697, 54.2134984 ], [ -126.425694600000014, 54.2135254 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091866, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 6943.5064702688796, "blue_line_key": 360862508, "length_metre": 470.696707888807, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4736352, 54.4161021 ], [ -126.473503799999989, 54.4160096 ], [ -126.4733968, 54.4159796 ], [ -126.473291799999984, 54.4159512 ], [ -126.4729871, 54.4158643 ], [ -126.472773, 54.415833 ], [ -126.4724873, 54.4157546 ], [ -126.472240700000015, 54.4157318 ], [ -126.472015499999983, 54.4156279 ], [ -126.4717736, 54.415578 ], [ -126.471637, 54.4155211 ], [ -126.4715496, 54.4154285 ], [ -126.471514899999988, 54.415249 ], [ -126.4714976, 54.4150411 ], [ -126.4713784, 54.4149485 ], [ -126.471108499999985, 54.4148531 ], [ -126.4710481, 54.4148161 ], [ -126.4709198, 54.4146523 ], [ -126.4708145, 54.4146039 ], [ -126.4705577, 54.414527 ], [ -126.47023990000001, 54.4144216 ], [ -126.4699196, 54.4143788 ], [ -126.469675899999984, 54.4143204 ], [ -126.469524299999989, 54.4142991 ], [ -126.469216499999987, 54.4142834 ], [ -126.4689072, 54.4142863 ], [ -126.468599399999988, 54.4142706 ], [ -126.4684949, 54.4142407 ], [ -126.4683897, 54.4141851 ], [ -126.468074099999981, 54.4140527 ], [ -126.4679685, 54.4140328 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17087053, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 234391.316368242, "blue_line_key": 360873822, "length_metre": 209.10851033800699, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2423315, 54.457907 ], [ -126.242212599999988, 54.4578144 ], [ -126.242036599999977, 54.4577033 ], [ -126.2416784, 54.4575053 ], [ -126.241503, 54.4573857 ], [ -126.241192500000011, 54.4571706 ], [ -126.240924299999989, 54.4570296 ], [ -126.2405793, 54.4568701 ], [ -126.2402161, 54.4567619 ], [ -126.240036599999982, 54.4566949 ], [ -126.2399616, 54.4566579 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17097482, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 15613.894707387, "blue_line_key": 360886524, "length_metre": 184.62863626483099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.260043700000011, 54.3230016 ], [ -126.2599617, 54.3228563 ], [ -126.259896699999985, 54.3226569 ], [ -126.2597963, 54.3225558 ], [ -126.2596732, 54.3223279 ], [ -126.2596553, 54.32212 ], [ -126.2596644, 54.3219861 ], [ -126.2596417, 54.3218864 ], [ -126.2594985, 54.3217212 ], [ -126.25934, 54.3215645 ], [ -126.2591908, 54.3214634 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104112, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 5480.2486004980301, "blue_line_key": 360882583, "length_metre": 134.06304553410399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.9850288, 54.2188078 ], [ -125.984995699999985, 54.2187722 ], [ -125.9849001, 54.218721 ], [ -125.9848541, 54.2187138 ], [ -125.984511700000013, 54.2186583 ], [ -125.9842741, 54.2185301 ], [ -125.9842556, 54.2184945 ], [ -125.984221699999978, 54.2184674 ], [ -125.9842068, 54.2184418 ], [ -125.984173, 54.218414800000012 ], [ -125.984100900000016, 54.2182738 ], [ -125.9840584, 54.2180858 ], [ -125.9841987, 54.2179106 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080137, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 223900.581829295, "blue_line_key": 360873822, "length_metre": 77.785882241165794, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2951969, 54.4951002 ], [ -126.2952309, 54.4950389 ], [ -126.2953225, 54.4948424 ], [ -126.2954358, 54.494737 ], [ -126.2955225, 54.494596 ], [ -126.2955878, 54.4945433 ], [ -126.2957163, 54.494492 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091021, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 274290.68963440898, "blue_line_key": 360873822, "length_metre": 344.00697052852098, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1279843, 54.4237373 ], [ -126.1332988, 54.4237444 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17063047, "stream_order": 4, "gnis_name": "Johnny David Creek", "downstream_route_measure": 10717.475654767301, "blue_line_key": 360866287, "length_metre": 761.89801709892095, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4406271, 54.5834496 ], [ -126.4404798, 54.583590600000015 ], [ -126.4404438, 54.5836518 ], [ -126.4404319, 54.5838412 ], [ -126.4404368, 54.5840392 ], [ -126.4404398, 54.5842001 ], [ -126.440402100000014, 54.584344 ], [ -126.4403406, 54.5845491 ], [ -126.440339, 54.5846032 ], [ -126.4403424, 54.5847912 ], [ -126.4403175, 54.5849265 ], [ -126.4402677, 54.5850062 ], [ -126.4401493, 54.5851558 ], [ -126.439999500000013, 54.5852968 ], [ -126.4399797, 54.585368 ], [ -126.4399704, 54.585521799999988 ], [ -126.4399606, 54.5856913 ], [ -126.43994880000001, 54.5858807 ], [ -126.4399375, 54.5860687 ], [ -126.439943, 54.5862225 ], [ -126.4399796, 54.5863578 ], [ -126.44009770000001, 54.5864774 ], [ -126.4402708, 54.5866512 ], [ -126.440371200000016, 54.5867794 ], [ -126.440528500000013, 54.5869987 ], [ -126.440779699999979, 54.5871739 ], [ -126.440972500000015, 54.5873405 ], [ -126.44107240000001, 54.5874772 ], [ -126.4410485, 54.5876026 ], [ -126.44097739999998, 54.587736399999983 ], [ -126.4409118, 54.5877977 ], [ -126.440792500000015, 54.5879572 ], [ -126.4406441, 54.5881153 ], [ -126.440610100000015, 54.588178 ], [ -126.440551199999987, 54.5883474 ], [ -126.440485099999975, 54.5884172 ], [ -126.4403352, 54.5885938 ], [ -126.4401716, 54.5887533 ], [ -126.439973599999973, 54.58892 ], [ -126.439813, 54.5890425 ], [ -126.439553, 54.5892248 ], [ -126.4394718, 54.589296 ], [ -126.4393062, 54.589454 ], [ -126.4390776, 54.5896378 ], [ -126.4390126, 54.5896905 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17060517, "stream_order": 4, "gnis_name": "Richfield Creek", "downstream_route_measure": 20053.5444776164, "blue_line_key": 360788426, "length_metre": 311.79562765202002, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.174532500000012, 54.5976105 ], [ -126.1742852, 54.5976148 ], [ -126.1739643, 54.597535 ], [ -126.173775, 54.5973684 ], [ -126.1736424, 54.5972843 ], [ -126.173355199999989, 54.597179 ], [ -126.1730141, 54.5971704 ], [ -126.1726577, 54.5971633 ], [ -126.1725571, 54.5970793 ], [ -126.1725602, 54.5970081 ], [ -126.1726502, 54.59683 ], [ -126.1727971, 54.5967346 ], [ -126.1727871, 54.5966449 ], [ -126.1724005, 54.5966534 ], [ -126.1720099, 54.5966805 ], [ -126.1716239, 54.5966805 ], [ -126.171298899999982, 54.5966819 ], [ -126.171128400000015, 54.596677600000014 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091019, "stream_order": 4, "gnis_name": "Bulkley River", "downstream_route_measure": 274216.859512511, "blue_line_key": 360873822, "length_metre": 73.830121897965398, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.126844800000015, 54.4237473 ], [ -126.127182499999989, 54.4237544 ], [ -126.127429, 54.423743 ], [ -126.1277379, 54.4237416 ], [ -126.1279843, 54.4237373 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17103826, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 32212.8560088044, "blue_line_key": 360886221, "length_metre": 383.36050224114399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6056309, 54.2207348 ], [ -126.605523600000012, 54.2207419 ], [ -126.60548, 54.2206864 ], [ -126.6054069, 54.2206038 ], [ -126.6053499, 54.2205311 ], [ -126.6052776, 54.220467 ], [ -126.605203, 54.22043 ], [ -126.605112699999978, 54.2204101 ], [ -126.6050194, 54.2204257 ], [ -126.604912199999987, 54.2204329 ], [ -126.6048347, 54.2204314 ], [ -126.6047416, 54.2204742 ], [ -126.6046596, 54.2205269 ], [ -126.6045496, 54.2205966 ], [ -126.604438799999983, 54.2206479 ], [ -126.604329899999982, 54.2206735 ], [ -126.6042383, 54.2206707 ], [ -126.6041485, 54.2206422 ], [ -126.6040417, 54.2206137 ], [ -126.6039354, 54.2205838 ], [ -126.6038158, 54.2205639 ], [ -126.6037372, 54.2205795 ], [ -126.602659, 54.2209271 ], [ -126.602602, 54.2208544 ], [ -126.6025437, 54.2207989 ], [ -126.602500699999979, 54.2207348 ], [ -126.602443, 54.2206707 ], [ -126.602401300000011, 54.2206166 ], [ -126.6022968, 54.220561 ], [ -126.602192800000012, 54.2205041 ], [ -126.602055399999983, 54.2204656 ], [ -126.6019046, 54.2204442 ], [ -126.601768, 54.2204243 ], [ -126.601599, 54.22042 ], [ -126.601412599999989, 54.2204442 ], [ -126.601304700000014, 54.2204599 ], [ -126.601026699999977, 54.2204813 ], [ -126.600859700000015, 54.2204784 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17091727, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 180073.76722632599, "blue_line_key": 360873822, "length_metre": 219.22078367869699, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.615966199999988, 54.4149385 ], [ -126.6153595, 54.4151835 ], [ -126.6149607, 54.4152604 ], [ -126.6135423, 54.4152148 ], [ -126.612738900000011, 54.4152519 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17104233, "stream_order": 5, "gnis_name": null, "downstream_route_measure": 5702.9280276847203, "blue_line_key": 360882583, "length_metre": 180.35862151723401, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.983688699999988, 54.2172412 ], [ -125.983435, 54.2171301 ], [ -125.9832908, 54.2170261 ], [ -125.9830055, 54.2169151 ], [ -125.982925299999977, 54.216855200000012 ], [ -125.9827434, 54.2166886 ], [ -125.9827273, 54.216653 ], [ -125.982604599999974, 54.2164579 ], [ -125.9825581, 54.2164322 ], [ -125.9824913, 54.2163625 ], [ -125.982280100000011, 54.216195799999987 ], [ -125.982216, 54.2161716 ], [ -125.9820157, 54.2161403 ], [ -125.981968400000014, 54.2161232 ], [ -125.9818744, 54.2161075 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17090687, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 182293.84256237801, "blue_line_key": 360873822, "length_metre": 25.797484952078399, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.6035819, 54.4253424 ], [ -126.603806699999978, 54.4255332 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17081212, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 3088.25366319963, "blue_line_key": 360875052, "length_metre": 871.05471199003898, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.345925099999988, 54.4890245 ], [ -126.3465955, 54.4903348 ], [ -126.3545693, 54.491635099999989 ], [ -126.3573862, 54.4918174 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17107104, "stream_order": 4, "gnis_name": "Buck Creek", "downstream_route_measure": 65970.013179362402, "blue_line_key": 360886221, "length_metre": 218.71907424425601, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3332024, 54.1677642 ], [ -126.3332057, 54.1677015 ], [ -126.3331022, 54.1676716 ], [ -126.332764200000014, 54.1676645 ], [ -126.332688699999977, 54.1676445 ], [ -126.3326298, 54.167599 ], [ -126.3326381, 54.1674822 ], [ -126.332665, 54.1672942 ], [ -126.3326402, 54.1672215 ], [ -126.3324926, 54.167119 ], [ -126.3324184, 54.167082 ], [ -126.332328299999986, 54.167062 ], [ -126.3319966, 54.1669908 ], [ -126.3319054, 54.1669538 ], [ -126.3318012, 54.1669324 ], [ -126.3316923, 54.166931 ], [ -126.3313725, 54.1669139 ], [ -126.3310965, 54.1669168 ], [ -126.330836599999984, 54.1669025 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17084554, "stream_order": 5, "gnis_name": "Ailport Creek", "downstream_route_measure": 3744.8819862149599, "blue_line_key": 360878058, "length_metre": 1977.7642378824901, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2178941, 54.473062 ], [ -126.217583600000012, 54.4730734 ], [ -126.21742949999998, 54.473052 ], [ -126.217171, 54.4730278 ], [ -126.21706, 54.4730434 ], [ -126.2169816, 54.4730776 ], [ -126.2168975, 54.473183 ], [ -126.2168252, 54.4733169 ], [ -126.216744, 54.4733867 ], [ -126.2166348, 54.4734109 ], [ -126.2163209, 54.4734664 ], [ -126.2162095, 54.4735177 ], [ -126.216000400000013, 54.4736573 ], [ -126.2158589, 54.47369 ], [ -126.215734899999987, 54.4736872 ], [ -126.2156462, 54.4736402 ], [ -126.2155876, 54.4735846 ], [ -126.21556720000001, 54.4734493 ], [ -126.2155251, 54.4733682 ], [ -126.2154365, 54.4733212 ], [ -126.2151902, 54.473297 ], [ -126.2148362, 54.4733069 ], [ -126.214546700000014, 54.473245699999985 ], [ -126.214225399999989, 54.4731844 ], [ -126.2139822, 54.4731517 ], [ -126.2138258, 54.4731574 ], [ -126.2134994, 54.4731859 ], [ -126.2132942, 54.4732528 ], [ -126.2131704, 54.473277 ], [ -126.2130317, 54.4732742 ], [ -126.212923600000011, 54.4732542 ], [ -126.212620099999981, 54.4731844 ], [ -126.2124672, 54.4731802 ], [ -126.2122494, 54.473193 ], [ -126.2120919, 54.4732428 ], [ -126.2119174, 54.4733197 ], [ -126.2117923, 54.473326899999989 ], [ -126.211593799999989, 54.4732856 ], [ -126.2114865, 54.4732841 ], [ -126.211409199999977, 54.4733083 ], [ -126.211314300000012, 54.473334 ], [ -126.211091399999987, 54.4734365 ], [ -126.2107724, 54.4735818 ], [ -126.2105262, 54.4737912 ], [ -126.2104564, 54.473925 ], [ -126.210466499999981, 54.4739791 ], [ -126.2105392, 54.4740432 ], [ -126.210564800000014, 54.4741159 ], [ -126.2105308, 54.47417 ], [ -126.21034370000001, 54.4741928 ], [ -126.2101255, 54.4742412 ], [ -126.2100141, 54.4742925 ], [ -126.2099498, 54.4743352 ], [ -126.2099197, 54.4745503 ], [ -126.2098315, 54.4747012 ], [ -126.209847400000015, 54.4749177 ], [ -126.2098145, 54.4749619 ], [ -126.2097224, 54.4751584 ], [ -126.209603, 54.475335 ], [ -126.2093904, 54.475518699999981 ], [ -126.209207799999987, 54.4756939 ], [ -126.209018, 54.4757793 ], [ -126.2087991, 54.4758021 ], [ -126.20869, 54.4758264 ], [ -126.2085785, 54.4758776 ], [ -126.2085279, 54.4759303 ], [ -126.208437, 54.476144 ], [ -126.208369299999987, 54.4762237 ], [ -126.208178799999985, 54.4762906 ], [ -126.2078327, 54.4764088 ], [ -126.2075273, 54.4765641 ], [ -126.2073141, 54.4767564 ], [ -126.2072795, 54.476819 ], [ -126.2071901, 54.4769871 ], [ -126.207085, 54.4771651 ], [ -126.2069689, 54.4772705 ], [ -126.2067944, 54.4773474 ], [ -126.2064846, 54.4773844 ], [ -126.206205399999988, 54.4774044 ], [ -126.2060008, 54.4774628 ], [ -126.205716400000014, 54.4775383 ], [ -126.2055253, 54.4776137 ], [ -126.2054094, 54.4777462 ], [ -126.2053748, 54.4778089 ], [ -126.205364, 54.4779698 ], [ -126.205382599999979, 54.4781236 ], [ -126.2053867, 54.4783116 ], [ -126.2053326, 54.4784013 ], [ -126.205244, 54.4785879 ], [ -126.205128, 54.4786933 ], [ -126.204854399999988, 54.4788485 ], [ -126.204619799999989, 54.4789155 ], [ -126.2043178, 54.4790337 ], [ -126.203968, 54.479169 ], [ -126.2038755, 54.4791946 ], [ -126.2037128, 54.4793071 ], [ -126.2036604, 54.4793783 ], [ -126.2035109, 54.4795364 ], [ -126.203364899999983, 54.4796504 ], [ -126.2032851, 54.4796746 ], [ -126.203145799999987, 54.4796803 ], [ -126.2030065, 54.479686 ], [ -126.202635899999976, 54.4796874 ], [ -126.202493699999977, 54.4797287 ], [ -126.202428399999988, 54.4798084 ], [ -126.202454, 54.4798811 ], [ -126.2024994, 54.4800976 ], [ -126.202474399999986, 54.4802499 ], [ -126.202358499999988, 54.4803824 ], [ -126.20220590000001, 54.480549 ], [ -126.202120799999975, 54.480691399999984 ], [ -126.202044, 54.4809136 ], [ -126.2019917, 54.4809848 ], [ -126.201857, 54.48117 ], [ -126.201594799999981, 54.4813623 ], [ -126.2015017, 54.4813964 ], [ -126.201406600000013, 54.4814292 ], [ -126.201059699999988, 54.4815289 ], [ -126.2008044, 54.48164 ], [ -126.2007373, 54.4817112 ], [ -126.2006303, 54.4819148 ], [ -126.200557599999982, 54.4820843 ], [ -126.200488799999988, 54.4821812 ], [ -126.2002307, 54.4823549 ], [ -126.2000243, 54.4824318 ], [ -126.199994300000014, 54.4824404 ], [ -126.1997639, 54.4826326 ], [ -126.199459100000013, 54.4828135 ], [ -126.1990974, 54.4828862 ], [ -126.198834799999986, 54.4829075 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17069545, "stream_order": 5, "gnis_name": "McQuarrie Creek", "downstream_route_measure": 13663.8297442569, "blue_line_key": 360875378, "length_metre": 1355.7814692015199, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.605816799999985, 54.554729 ], [ -126.6061562, 54.5547276 ], [ -126.6065276, 54.5547261 ], [ -126.606682799999973, 54.5547461 ], [ -126.6069441, 54.5547788 ], [ -126.6072211, 54.5548016 ], [ -126.6073429, 54.5548045 ], [ -126.607638099999988, 54.554810199999984 ], [ -126.6079466, 54.5547988 ], [ -126.6080566, 54.5547646 ], [ -126.6081857, 54.5546962 ], [ -126.6084126, 54.5545296 ], [ -126.6085717, 54.5544242 ], [ -126.608687100000012, 54.5543103 ], [ -126.6087372, 54.5542576 ], [ -126.6089007, 54.5540895 ], [ -126.6090514, 54.5538944 ], [ -126.609130899999982, 54.5538417 ], [ -126.6094477, 54.5537491 ], [ -126.6095125, 54.5536964 ], [ -126.609636799999976, 54.553663699999987 ], [ -126.6098715, 54.5536238 ], [ -126.6101653, 54.553619499999989 ], [ -126.610474699999983, 54.5536266 ], [ -126.610786099999984, 54.5536138 ], [ -126.6110474, 54.553611 ], [ -126.6114192, 54.5536081 ], [ -126.6115744, 54.5536209 ], [ -126.611880399999976, 54.5536452 ], [ -126.6122335, 54.5536964 ], [ -126.612602400000014, 54.5537306 ], [ -126.612941299999974, 54.5537733 ], [ -126.6131241, 54.5538132 ], [ -126.613480099999975, 54.5538203 ], [ -126.613758199999978, 54.553826 ], [ -126.613879, 54.553846 ], [ -126.613971299999989, 54.5538844 ], [ -126.614297599999986, 54.5541066 ], [ -126.614374699999985, 54.5541251 ], [ -126.6144818, 54.554128 ], [ -126.6148069, 54.5541251 ], [ -126.615073099999989, 54.5540582 ], [ -126.615268, 54.5539271 ], [ -126.6154472, 54.5537776 ], [ -126.615473599999987, 54.5535725 ], [ -126.6155006, 54.553366 ], [ -126.615551599999989, 54.5533033 ], [ -126.6156798, 54.5532165 ], [ -126.6159975, 54.5530783 ], [ -126.6160952, 54.5529729 ], [ -126.6160754, 54.552802 ], [ -126.616024299999978, 54.5525941 ], [ -126.6160178, 54.5524773 ], [ -126.616055100000011, 54.5523335 ], [ -126.616059, 54.5522793 ], [ -126.6160555, 54.5520828 ], [ -126.6160505, 54.5519119 ], [ -126.616045, 54.5517139 ], [ -126.616058700000011, 54.5514889 ], [ -126.616094, 54.5514362 ], [ -126.6161445, 54.5513465 ], [ -126.6163409, 54.5511613 ], [ -126.6164391, 54.551083 ], [ -126.6166979, 54.5508808 ], [ -126.616941399999988, 54.5506799 ], [ -126.616992399999987, 54.5505817 ], [ -126.6170027, 54.5504378 ], [ -126.617089, 54.5502513 ], [ -126.6171553, 54.5501801 ], [ -126.6172692, 54.5500918 ], [ -126.6174479, 54.5499436 ], [ -126.617563300000015, 54.5498368 ], [ -126.617610899999988, 54.5497841 ], [ -126.6176506, 54.549668800000013 ], [ -126.6176712, 54.549552 ], [ -126.6176643, 54.5494081 ], [ -126.617630800000015, 54.5491917 ], [ -126.6176495, 54.5491375 ], [ -126.6177152, 54.5490677 ], [ -126.6178601, 54.5489894 ], [ -126.6179711, 54.5489381 ], [ -126.618243100000015, 54.54879 ], [ -126.618465500000013, 54.5486861 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080628, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 203056.43881396999, "blue_line_key": 360873822, "length_metre": 508.40819462620198, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4855531, 54.4915938 ], [ -126.485228, 54.4917875 ], [ -126.4839224, 54.4920922 ], [ -126.482568, 54.4928243 ], [ -126.4817535, 54.4934851 ], [ -126.480777499999974, 54.4938711 ], [ -126.4800452, 54.4942613 ], [ -126.4799156, 54.4943795 ], [ -126.4798642, 54.4945618 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17066276, "stream_order": 4, "gnis_name": "Johnny David Creek", "downstream_route_measure": 7907.6794289849504, "blue_line_key": 360866287, "length_metre": 1669.37103511802, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.425342699999987, 54.5664132 ], [ -126.425300299999989, 54.5665912 ], [ -126.4252347, 54.5666525 ], [ -126.4249966, 54.5667294 ], [ -126.424889, 54.5667351 ], [ -126.424652499999979, 54.566793499999989 ], [ -126.424512900000011, 54.5667991 ], [ -126.424267899999975, 54.566776399999981 ], [ -126.424050200000011, 54.5667806 ], [ -126.423924299999982, 54.5667963 ], [ -126.4237187, 54.5668718 ], [ -126.4234789, 54.5670028 ], [ -126.4233993, 54.567027 ], [ -126.4232759, 54.5670427 ], [ -126.4230287, 54.567047 ], [ -126.422734, 54.5670398 ], [ -126.4224721, 54.567044099999983 ], [ -126.4222827, 54.567094 ], [ -126.422155300000014, 54.5671353 ], [ -126.42188, 54.567319 ], [ -126.42169, 54.567413 ], [ -126.4214566, 54.5674272 ], [ -126.4212835, 54.5674586 ], [ -126.4210515, 54.5674899 ], [ -126.420938299999989, 54.5675326 ], [ -126.420889899999978, 54.5675939 ], [ -126.420822300000012, 54.5676822 ], [ -126.420766699999987, 54.5678345 ], [ -126.420721199999988, 54.5680496 ], [ -126.4207128, 54.5681934 ], [ -126.420718099999988, 54.5683544 ], [ -126.4207529, 54.5685082 ], [ -126.4207901, 54.568662 ], [ -126.4208279, 54.5688073 ], [ -126.420941899999988, 54.5689526 ], [ -126.42101430000001, 54.5690266 ], [ -126.421188, 54.5692189 ], [ -126.4212715, 54.5693741 ], [ -126.421538, 54.569567799999987 ], [ -126.4216421, 54.5696148 ], [ -126.421993, 54.5697216 ], [ -126.42236029999998, 54.5697743 ], [ -126.422541400000014, 54.5698327 ], [ -126.4226757, 54.5699338 ], [ -126.4229565, 54.5701289 ], [ -126.423223600000014, 54.5703141 ], [ -126.423345399999988, 54.5703525 ], [ -126.4234362, 54.570381 ], [ -126.423756200000014, 54.5704779 ], [ -126.424059500000013, 54.5705662 ], [ -126.4243843, 54.5705719 ], [ -126.4246032, 54.5705149 ], [ -126.424817199999978, 54.5705633 ], [ -126.4249243, 54.5705662 ], [ -126.4250654, 54.570542 ], [ -126.425247899999988, 54.5706175 ], [ -126.4254548, 54.570757 ], [ -126.4257933, 54.5707727 ], [ -126.426003099999988, 54.5709037 ], [ -126.4262283, 54.5709977 ], [ -126.426382, 54.5710291 ], [ -126.426688, 54.5710889 ], [ -126.4268376, 54.5711458 ], [ -126.4271084, 54.5712783 ], [ -126.4272406, 54.5714065 ], [ -126.427351, 54.5715973 ], [ -126.427527399999988, 54.571754 ], [ -126.4276166, 54.571801 ], [ -126.4276607, 54.5718651 ], [ -126.4276828, 54.5719918 ], [ -126.4277563, 54.5720559 ], [ -126.4278252, 54.5721827 ], [ -126.4279989, 54.5723749 ], [ -126.428056700000013, 54.572449 ], [ -126.428135, 54.572675399999987 ], [ -126.428293200000013, 54.5728492 ], [ -126.4286537, 54.5730272 ], [ -126.428647399999988, 54.573144 ], [ -126.42867480000001, 54.5731996 ], [ -126.4287878, 54.5733548 ], [ -126.428970299999989, 54.5734303 ], [ -126.429133599999986, 54.5735328 ], [ -126.429239200000012, 54.5735613 ], [ -126.4292823, 54.5736069 ], [ -126.429374, 54.5736539 ], [ -126.4294308, 54.5737094 ], [ -126.4294576, 54.5737735 ], [ -126.42954730000001, 54.5738476 ], [ -126.4297511, 54.5740313 ], [ -126.4299407, 54.5742065 ], [ -126.4301612, 54.5743987 ], [ -126.4303422, 54.5744927 ], [ -126.430641, 54.5746437 ], [ -126.430731299999977, 54.5746807 ], [ -126.4310641, 54.5748046 ], [ -126.431338499999981, 54.5748915 ], [ -126.431564799999975, 54.5749684 ], [ -126.431717099999986, 54.5749898 ], [ -126.43199820000001, 54.5749869 ], [ -126.4322591, 54.5749926 ], [ -126.4323965, 54.5750496 ], [ -126.4326618, 54.5752262 ], [ -126.432859099999973, 54.5753017 ], [ -126.4331225, 54.5753074 ], [ -126.43347679999998, 54.575306 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17068096, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 6893.2613059074401, "blue_line_key": 360856488, "length_metre": 423.14989545091203, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.439577, 54.55626 ], [ -126.4396844, 54.556297 ], [ -126.4398828, 54.5563198 ], [ -126.439992300000014, 54.5563227 ], [ -126.440347499999987, 54.5563113 ], [ -126.4405352, 54.5562799 ], [ -126.4408641, 54.5562244 ], [ -126.4411568, 54.5562301 ], [ -126.4414919, 54.5563184 ], [ -126.4417342, 54.5564124 ], [ -126.441927799999988, 54.5565335 ], [ -126.4422741, 54.5566673 ], [ -126.442423100000013, 54.5567684 ], [ -126.4425391, 54.5568795 ], [ -126.442582, 54.5569607 ], [ -126.4426083, 54.5570333 ], [ -126.442611500000012, 54.5572142 ], [ -126.442575800000014, 54.5573025 ], [ -126.4424737, 54.557426400000011 ], [ -126.442202, 54.5576002 ], [ -126.442086599999982, 54.5577056 ], [ -126.4420672, 54.5577682 ], [ -126.442094, 54.5578323 ], [ -126.4423763, 54.5580089 ], [ -126.4424189, 54.558063 ], [ -126.4425159, 54.5582639 ], [ -126.442643, 54.5584276 ], [ -126.4427028, 54.5584746 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17105201, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 8292.8350072379908, "blue_line_key": 360882583, "length_metre": 112.70442111422599, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -125.9647129, 54.2020734 ], [ -125.964710700000012, 54.2020463 ], [ -125.9646923, 54.2020107 ], [ -125.9646926, 54.2019836 ], [ -125.9646734, 54.2019566 ], [ -125.9645528, 54.2017629 ], [ -125.964521499999975, 54.2017358 ], [ -125.964466800000011, 54.2016205 ], [ -125.964475, 54.2015393 ], [ -125.9644168, 54.201361299999988 ], [ -125.964385, 54.2013356 ], [ -125.9643682, 54.2013086 ], [ -125.9642458, 54.2011135 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17092885, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 251867.11710503299, "blue_line_key": 360873822, "length_metre": 1090.9701547427701, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1818742, 54.4044193 ], [ -126.181692, 54.404613 ], [ -126.181638299999989, 54.4047284 ], [ -126.181585199999986, 54.4048081 ], [ -126.1815185, 54.4048779 ], [ -126.18139, 54.4049563 ], [ -126.181281, 54.4049805 ], [ -126.180971099999979, 54.4049919 ], [ -126.1807454, 54.4049321 ], [ -126.1804909, 54.4048096 ], [ -126.1804332, 54.4047455 ], [ -126.180408, 54.4046728 ], [ -126.180391, 54.4044749 ], [ -126.1803275, 54.404284 ], [ -126.1801061, 54.4041445 ], [ -126.179854, 54.4039949 ], [ -126.179589, 54.4038269 ], [ -126.1792903, 54.4036845 ], [ -126.178989199999975, 54.4035691 ], [ -126.178835400000011, 54.4035477 ], [ -126.1787135, 54.4035534 ], [ -126.1784165, 54.4036104 ], [ -126.1781159, 54.4037115 ], [ -126.1780032, 54.4037799 ], [ -126.1779525, 54.4038596 ], [ -126.1779677, 54.4040761 ], [ -126.1780113, 54.4041317 ], [ -126.1782627, 54.4042627 ], [ -126.1784471, 54.404267 ], [ -126.1789268, 54.4042328 ], [ -126.1792533, 54.4042228 ], [ -126.1793582, 54.4042442 ], [ -126.179476600000015, 54.4043097 ], [ -126.179533699999979, 54.4043823 ], [ -126.179545399999981, 54.404445 ], [ -126.179526599999988, 54.4044905 ], [ -126.1794611, 54.4045433 ], [ -126.1793508, 54.4045846 ], [ -126.179065, 54.4047127 ], [ -126.178721400000015, 54.4047768 ], [ -126.1783709, 54.404724099999989 ], [ -126.1782802, 54.4047042 ], [ -126.178066800000011, 54.4046444 ], [ -126.1777039, 54.4045646 ], [ -126.1776126, 54.4045262 ], [ -126.1774342, 54.4044507 ], [ -126.177304, 54.4043296 ], [ -126.1772239, 54.4041302 ], [ -126.1771816, 54.4040847 ], [ -126.1770762, 54.4040377 ], [ -126.17701670000001, 54.4040263 ], [ -126.176634299999975, 54.4039736 ], [ -126.176444499999988, 54.404032 ], [ -126.176162800000014, 54.4041146 ], [ -126.1761444, 54.4041587 ], [ -126.1761656, 54.4042769 ], [ -126.1763068, 54.4044692 ], [ -126.1763456, 54.404586 ], [ -126.176148700000013, 54.4047526 ], [ -126.175847499999989, 54.4048893 ], [ -126.175503299999988, 54.404962 ], [ -126.1754402, 54.404960499999987 ], [ -126.1753354, 54.4049321 ], [ -126.1751133, 54.404801 ], [ -126.175098, 54.4047825 ], [ -126.1749898, 54.4045732 ], [ -126.1748314, 54.4044079 ], [ -126.17468, 54.4043595 ], [ -126.174559800000011, 54.4043467 ], [ -126.1742892, 54.4044393 ], [ -126.1741648, 54.404472 ], [ -126.173918, 54.4044849 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091946, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 13385.901063826699, "blue_line_key": 360862508, "length_metre": 33.877880224412102, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3939421, 54.413409 ], [ -126.393418900000015, 54.4134075 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17064044, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 2055.9129109328801, "blue_line_key": 360851751, "length_metre": 104.667730928993, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2026895, 54.579439 ], [ -126.20274449999998, 54.5793322 ], [ -126.202717499999977, 54.5792695 ], [ -126.202440400000015, 54.5792539 ], [ -126.2020841, 54.5792539 ], [ -126.202009300000014, 54.5792083 ], [ -126.201926299999982, 54.5790887 ], [ -126.201852, 54.5790417 ], [ -126.201639799999981, 54.5789747 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17101259, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 11723.050982373699, "blue_line_key": 360877225, "length_metre": 354.65901233912001, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2041253, 54.260561400000014 ], [ -126.204175, 54.2604916 ], [ -126.2043567, 54.2603335 ], [ -126.2044503, 54.2602908 ], [ -126.2047676, 54.2601355 ], [ -126.204819699999987, 54.2600658 ], [ -126.204845799999987, 54.2599134 ], [ -126.204838899999984, 54.2597781 ], [ -126.20479060000001, 54.2595886 ], [ -126.204648299999988, 54.2594234 ], [ -126.2045293, 54.259375 ], [ -126.204273199999989, 54.2592881 ], [ -126.204051299999989, 54.2591671 ], [ -126.2039928, 54.2591201 ], [ -126.2040946, 54.2589876 ], [ -126.204282299999988, 54.2589207 ], [ -126.2044857, 54.2588708 ], [ -126.2045931, 54.2588637 ], [ -126.204916099999977, 54.2588537 ], [ -126.205111300000013, 54.2587056 ], [ -126.205131099999988, 54.2586245 ], [ -126.205145699999989, 54.2584365 ], [ -126.2051178, 54.2583724 ], [ -126.2050307, 54.2582898 ], [ -126.2048814, 54.2582513 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17098241, "stream_order": 5, "gnis_name": "Buck Creek", "downstream_route_measure": 14906.3699121974, "blue_line_key": 360886221, "length_metre": 354.44332338795499, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.641158, 54.3113615 ], [ -126.64133910000001, 54.3111863 ], [ -126.6413896, 54.3111051 ], [ -126.641396699999987, 54.3109528 ], [ -126.6414038, 54.310863 ], [ -126.6414117, 54.3107292 ], [ -126.641392, 54.3105212 ], [ -126.641404, 54.3103062 ], [ -126.641457699999975, 54.3101808 ], [ -126.6415157, 54.3099672 ], [ -126.6415729, 54.3097692 ], [ -126.6415931, 54.309698 ], [ -126.641600700000012, 54.3095371 ], [ -126.641532099999978, 54.3093918 ], [ -126.641422, 54.309191 ], [ -126.641339300000013, 54.3090372 ], [ -126.6412652, 54.3089631 ], [ -126.641093, 54.3087723 ], [ -126.64103630000001, 54.3086626 ], [ -126.6410124, 54.3085359 ], [ -126.6410342, 54.3084461 ], [ -126.6410689, 54.3083749 ], [ -126.641117900000012, 54.3083051 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17101962, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 27814.080217184601, "blue_line_key": 360881038, "length_metre": 224.701994949274, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.0703801, 54.2481579 ], [ -126.070385, 54.2480782 ], [ -126.0703705, 54.2480511 ], [ -126.070377, 54.247987 ], [ -126.0704449, 54.2478816 ], [ -126.0705589, 54.2478033 ], [ -126.0706042, 54.2477862 ], [ -126.0706571, 54.247715 ], [ -126.0706348, 54.2475897 ], [ -126.0706063, 54.2475612 ], [ -126.0703531, 54.2474473 ], [ -126.0702353, 54.2473632 ], [ -126.0702003, 54.2472194 ], [ -126.070156399999988, 54.2471994 ], [ -126.0701115, 54.2471624 ], [ -126.0702177, 54.2469858 ], [ -126.070249100000012, 54.2469602 ], [ -126.0702517, 54.2469331 ], [ -126.070268899999988, 54.2469061 ], [ -126.0702724, 54.2468434 ], [ -126.0702459, 54.2467893 ], [ -126.0701869, 54.2467508 ], [ -126.0701418, 54.2467409 ], [ -126.0699616, 54.2466739 ], [ -126.069918499999986, 54.2466454 ], [ -126.06971630000001, 54.2464788 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17079999, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 224392.564716847, "blue_line_key": 360873822, "length_metre": 21.5138817218503, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.293211699999986, 54.4952355 ], [ -126.293185900000012, 54.4953708 ], [ -126.293121699999986, 54.4954135 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17094250, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 21359.504795246801, "blue_line_key": 360862508, "length_metre": 14.993932447535901, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3283269, 54.3837897 ], [ -126.3282355, 54.3837441 ], [ -126.328146499999988, 54.3837056 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092188, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 17218.533632996601, "blue_line_key": 360862508, "length_metre": 350.83938408115102, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3466425, 54.4140612 ], [ -126.3464505, 54.4139402 ], [ -126.34642190000001, 54.4138761 ], [ -126.3462202, 54.4136653 ], [ -126.3462138, 54.4135386 ], [ -126.3462862, 54.4133691 ], [ -126.3462486, 54.4132338 ], [ -126.3462067, 54.4131797 ], [ -126.345976, 54.4131469 ], [ -126.3458881, 54.4130913 ], [ -126.3458505, 54.412956099999988 ], [ -126.3458714, 54.4128834 ], [ -126.345906500000012, 54.4128122 ], [ -126.346024899999989, 54.4126441 ], [ -126.3461229, 54.4125473 ], [ -126.3462178, 54.4125145 ], [ -126.346350500000014, 54.4123821 ], [ -126.3465898, 54.4122525 ], [ -126.346712900000014, 54.4122368 ], [ -126.346995, 54.4121799 ], [ -126.3471573, 54.4120673 ], [ -126.3473375, 54.4118907 ], [ -126.347610300000014, 54.4117084 ], [ -126.3478015, 54.4116315 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17092333, "stream_order": 4, "gnis_name": "Aitken Creek", "downstream_route_measure": 12317.736846752799, "blue_line_key": 360862508, "length_metre": 58.715570855543497, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.407805599999989, 54.410139 ], [ -126.407752, 54.4100208 ], [ -126.4075003, 54.4098812 ], [ -126.407424499999976, 54.4098256 ], [ -126.407230399999975, 54.4097587 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17080011, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 224414.078598569, "blue_line_key": 360873822, "length_metre": 131.80948311447199, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.293121699999986, 54.4954135 ], [ -126.2930268, 54.4954391 ], [ -126.292934699999989, 54.4954363 ], [ -126.292797, 54.4954164 ], [ -126.292566600000015, 54.4954021 ], [ -126.2923351, 54.495405 ], [ -126.292009799999988, 54.4954164 ], [ -126.2917611, 54.4954192 ], [ -126.291670700000012, 54.4953907 ], [ -126.2914959, 54.4952611 ], [ -126.2914024, 54.4952412 ], [ -126.29126909999998, 54.4951742 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17105441, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 2427.8841576784998, "blue_line_key": 360880905, "length_metre": 441.81735246305601, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4093119, 54.1961458 ], [ -126.409371, 54.1961843 ], [ -126.4097288, 54.1963537 ], [ -126.4099054, 54.1964378 ], [ -126.410070600000012, 54.1965133 ], [ -126.4102193, 54.1965802 ], [ -126.410365500000012, 54.1966813 ], [ -126.4104532, 54.1967824 ], [ -126.4104758, 54.1968821 ], [ -126.4104855, 54.1969904 ], [ -126.4105883, 54.1973065 ], [ -126.4106938, 54.197345 ], [ -126.4107815, 54.197392 ], [ -126.410901599999988, 54.1974304 ], [ -126.4110241, 54.1974418 ], [ -126.411193, 54.1974461 ], [ -126.4113307, 54.197449 ], [ -126.4115282, 54.1974618 ], [ -126.4117281, 54.1974746 ], [ -126.4118957, 54.197496 ], [ -126.412017, 54.1975173 ], [ -126.4121371, 54.1975287 ], [ -126.4122297, 54.1975487 ], [ -126.412319900000014, 54.1975686 ], [ -126.412426, 54.1975985 ], [ -126.4125753, 54.197664 ], [ -126.4126484, 54.197711 ], [ -126.412721, 54.1977666 ], [ -126.412747700000011, 54.1978207 ], [ -126.4127739, 54.1979104 ], [ -126.4127696, 54.197983 ], [ -126.4127648, 54.1980642 ], [ -126.4127586, 54.1981354 ], [ -126.412708599999988, 54.1982337 ], [ -126.4126275, 54.1983035 ], [ -126.4125141, 54.1983818 ], [ -126.4124013, 54.1984516 ], [ -126.4122435, 54.1985385 ], [ -126.4121776, 54.1985997 ], [ -126.4121429, 54.1986624 ], [ -126.4121373, 54.1987521 ], [ -126.412136699999976, 54.1987607 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17094598, "stream_order": 4, "gnis_name": "Crow Creek", "downstream_route_measure": 1953.13219780642, "blue_line_key": 360886524, "length_metre": 824.07039198765699, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.1608057, 54.3772312 ], [ -126.1608864, 54.3771699 ], [ -126.160874799999988, 54.3771073 ], [ -126.1608668, 54.3770076 ], [ -126.1607694, 54.3768709 ], [ -126.160794399999986, 54.376727 ], [ -126.1610136, 54.3766615 ], [ -126.1612058, 54.3765761 ], [ -126.161352099999988, 54.3764621 ], [ -126.161566399999984, 54.3764849 ], [ -126.161729899999983, 54.3765604 ], [ -126.1620054, 54.3765761 ], [ -126.162069699999989, 54.3765604 ], [ -126.162179900000012, 54.3764991 ], [ -126.1622814, 54.3763667 ], [ -126.1624848, 54.3763453 ], [ -126.162835, 54.376398 ], [ -126.1630493, 54.3764208 ], [ -126.1632679, 54.3763638 ], [ -126.1635446, 54.3763695 ], [ -126.1637258, 54.3764365 ], [ -126.163754, 54.3764735 ], [ -126.1638711, 54.376549 ], [ -126.1642511, 54.3764037 ], [ -126.164529699999989, 54.3763838 ], [ -126.164807, 54.3763809 ], [ -126.165083200000012, 54.3763881 ], [ -126.1653777, 54.3763852 ], [ -126.1656257, 54.3763553 ], [ -126.1659049, 54.3763268 ], [ -126.1661375, 54.3762784 ], [ -126.166372, 54.3762385 ], [ -126.166386599999981, 54.3762385 ], [ -126.166664, 54.3762627 ], [ -126.1668417, 54.3763396 ], [ -126.1668833, 54.3764208 ], [ -126.1668478, 54.376492 ], [ -126.16688520000001, 54.3766188 ], [ -126.1671632, 54.3766074 ], [ -126.167411799999982, 54.3765689 ], [ -126.1677063, 54.376539 ], [ -126.167885700000014, 54.3766245 ], [ -126.1678595, 54.3767854 ], [ -126.167926899999983, 54.3769307 ], [ -126.168014, 54.3769876 ], [ -126.1681064, 54.3770161 ], [ -126.1683672, 54.3770047 ], [ -126.1686023, 54.376956299999989 ], [ -126.168865, 54.3769264 ], [ -126.169142900000011, 54.3769421 ], [ -126.1693842, 54.3769919 ], [ -126.1696457, 54.3770261 ], [ -126.169907699999982, 54.3770047 ], [ -126.170079699999974, 54.3769549 ], [ -126.1703032, 54.3768438 ], [ -126.1704947, 54.3767669 ], [ -126.170588399999986, 54.376751199999987 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17102135, "stream_order": 5, "gnis_name": "Klo Creek", "downstream_route_measure": 13719.352523674899, "blue_line_key": 360880905, "length_metre": 42.329847774298798, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4175433, 54.2438383 ], [ -126.4174317, 54.2438981 ], [ -126.417262099999988, 54.2439223 ], [ -126.417109, 54.243928 ], [ -126.4169857, 54.2439252 ], [ -126.4169393, 54.2439323 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17084978, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 5300.8234773844297, "blue_line_key": 360846413, "length_metre": 74.510623155511198, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.322441200000014, 54.4715053 ], [ -126.322356699999986, 54.4713771 ], [ -126.322344, 54.471323 ], [ -126.3222956, 54.4711065 ], [ -126.32219640000001, 54.4709783 ], [ -126.3220949, 54.4708772 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17086183, "stream_order": 6, "gnis_name": "Bulkley River", "downstream_route_measure": 195360.54602871501, "blue_line_key": 360873822, "length_metre": 141.026057941207, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.5211275, 54.4624673 ], [ -126.5209441, 54.4629501 ], [ -126.5204058, 54.4633617 ], [ -126.5200506, 54.4635084 ] ] } }, { "type": "Feature", "properties": { "linear_feature_id": 17063323, "stream_order": 5, "gnis_name": "Byman Creek", "downstream_route_measure": 11626.631564434099, "blue_line_key": 360856488, "length_metre": 986.43370275897496, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.4697035, 54.5820738 ], [ -126.4699157, 54.5821422 ], [ -126.4701833, 54.5822917 ], [ -126.4704214, 54.5824484 ], [ -126.470764, 54.582672 ], [ -126.4708655, 54.5827902 ], [ -126.4708772, 54.5828628 ], [ -126.4707767, 54.5829682 ], [ -126.4707741, 54.5830323 ], [ -126.4708554, 54.5831947 ], [ -126.4709447, 54.583241600000015 ], [ -126.4711747, 54.5833015 ], [ -126.471419900000015, 54.5833243 ], [ -126.4717584, 54.5833755 ], [ -126.471849800000015, 54.5833955 ], [ -126.4721027, 54.583545 ], [ -126.472225, 54.5835749 ], [ -126.4724717, 54.5835792 ], [ -126.472724, 54.5835393 ], [ -126.4728022, 54.5835051 ], [ -126.4728225, 54.5834254 ], [ -126.4728194, 54.583236 ], [ -126.4728377, 54.5831833 ], [ -126.4729021, 54.5831391 ], [ -126.472982799999983, 54.5831049 ], [ -126.4732615, 54.5831021 ], [ -126.4735037, 54.583169 ], [ -126.4736098, 54.5832174 ], [ -126.473772799999978, 54.5833285 ], [ -126.473889, 54.5834467 ], [ -126.4740677, 54.5835763 ], [ -126.4743083, 54.5836903 ], [ -126.4745225, 54.5837387 ], [ -126.4747343, 54.5838156 ], [ -126.474840899999975, 54.583827 ], [ -126.4750521, 54.5839125 ], [ -126.4751892, 54.5839424 ], [ -126.4755257, 54.5840207 ], [ -126.475661300000013, 54.5840691 ], [ -126.475909499999986, 54.5840833 ], [ -126.4762624, 54.5841076 ], [ -126.4763695, 54.584146 ], [ -126.4764421, 54.5842201 ], [ -126.4764751, 54.5844366 ], [ -126.476461500000013, 54.5846602 ], [ -126.476542200000011, 54.5848595 ], [ -126.4766068, 54.5850418 ], [ -126.4766124, 54.5852028 ], [ -126.476638799999989, 54.5852754 ], [ -126.4766987, 54.5853224 ], [ -126.476873399999988, 54.5855061 ], [ -126.4769633, 54.5855517 ], [ -126.4771445, 54.5856101 ], [ -126.47742070000001, 54.5856429 ], [ -126.4776035, 54.5857183 ], [ -126.4777513, 54.5858024 ], [ -126.4778249, 54.5858665 ], [ -126.4778523, 54.5859576 ], [ -126.4778463, 54.5860388 ], [ -126.4778265, 54.58611 ], [ -126.47769550000001, 54.5862325 ], [ -126.4775813, 54.5863208 ], [ -126.4772752, 54.5865301 ], [ -126.4772245, 54.5865914 ], [ -126.47717080000001, 54.5866897 ], [ -126.4771017, 54.5868321 ], [ -126.4771429, 54.5869047 ], [ -126.4772587, 54.5870243 ] ] } }, -{ "type": "Feature", "properties": { "linear_feature_id": 17102225, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 28393.911751466701, "blue_line_key": 360881038, "length_metre": 287.17662718521302, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.069660499999983, 54.2440135 ], [ -126.069678400000015, 54.2439779 ], [ -126.0696335, 54.2439409 ], [ -126.069484499999973, 54.2438753 ], [ -126.069394300000013, 54.2438554 ], [ -126.0690893, 54.2438298 ], [ -126.069042799999977, 54.2438369 ], [ -126.0689507, 54.2438355 ], [ -126.0686007, 54.243799900000013 ], [ -126.0685568, 54.2437799 ], [ -126.0685437, 54.2437358 ], [ -126.068561699999989, 54.2437002 ], [ -126.06870760000001, 54.2435948 ], [ -126.0687435, 54.2435236 ], [ -126.068745, 54.2434794 ], [ -126.0687026, 54.2434424 ], [ -126.0685508, 54.243411 ], [ -126.068503799999988, 54.2434196 ], [ -126.0683969, 54.2434253 ], [ -126.0683339, 54.2434509 ], [ -126.0682026, 54.2435563 ], [ -126.0681395, 54.243582 ], [ -126.0680156, 54.2435876 ], [ -126.067897599999981, 54.2435307 ], [ -126.0678109, 54.2434481 ], [ -126.067759200000012, 54.2433299 ], [ -126.0677124, 54.243112 ], [ -126.0675091, 54.242955300000013 ], [ -126.0674482, 54.2429354 ], [ -126.067213099999989, 54.2427858 ] ] } } +{ "type": "Feature", "properties": { "linear_feature_id": 17102225, "stream_order": 5, "gnis_name": "Maxan Creek", "downstream_route_measure": 28393.911751466701, "blue_line_key": 360881038, "length_metre": 287.17662718521302, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.069660499999983, 54.2440135 ], [ -126.069678400000015, 54.2439779 ], [ -126.0696335, 54.2439409 ], [ -126.069484499999973, 54.2438753 ], [ -126.069394300000013, 54.2438554 ], [ -126.0690893, 54.2438298 ], [ -126.069042799999977, 54.2438369 ], [ -126.0689507, 54.2438355 ], [ -126.0686007, 54.243799900000013 ], [ -126.0685568, 54.2437799 ], [ -126.0685437, 54.2437358 ], [ -126.068561699999989, 54.2437002 ], [ -126.06870760000001, 54.2435948 ], [ -126.0687435, 54.2435236 ], [ -126.068745, 54.2434794 ], [ -126.0687026, 54.2434424 ], [ -126.0685508, 54.243411 ], [ -126.068503799999988, 54.2434196 ], [ -126.0683969, 54.2434253 ], [ -126.0683339, 54.2434509 ], [ -126.0682026, 54.2435563 ], [ -126.0681395, 54.243582 ], [ -126.0680156, 54.2435876 ], [ -126.067897599999981, 54.2435307 ], [ -126.0678109, 54.2434481 ], [ -126.067759200000012, 54.2433299 ], [ -126.0677124, 54.243112 ], [ -126.0675091, 54.242955300000013 ], [ -126.0674482, 54.2429354 ], [ -126.067213099999989, 54.2427858 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17102012, "stream_order": 4, "gnis_name": "Foxy Creek", "downstream_route_measure": 13620.2492242219, "blue_line_key": 360877225, "length_metre": 91.6995792398898, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.2051401, 54.2464702 ], [ -126.2051318, 54.2463791 ], [ -126.20515540000001, 54.2462538 ], [ -126.2052045, 54.2461925 ], [ -126.2052846, 54.2461398 ], [ -126.2055065, 54.2460458 ], [ -126.2055714, 54.2459946 ], [ -126.2055632, 54.2458764 ], [ -126.20549650000001, 54.2457581 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17091134, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 1785.9620343025699, "blue_line_key": 360841027, "length_metre": 757.43696299907003, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.071401200000011, 54.4228372 ], [ -126.0713687, 54.4228458 ], [ -126.0711008, 54.4229369 ], [ -126.0707705, 54.423038 ], [ -126.0704553, 54.4231107 ], [ -126.0701115, 54.4231748 ], [ -126.0697688, 54.423228900000012 ], [ -126.069363599999988, 54.4233001 ], [ -126.0689915, 54.4233271 ], [ -126.0685563, 54.4233528 ], [ -126.068249099999989, 54.4233628 ], [ -126.0677992, 54.4233884 ], [ -126.0677219, 54.4233855 ], [ -126.0672591, 54.4233927 ], [ -126.066904199999982, 54.4233927 ], [ -126.0664751, 54.4233741 ], [ -126.0661673, 54.4233656 ], [ -126.0658137, 54.4233485 ], [ -126.06546, 54.4233314 ], [ -126.064998300000013, 54.4233015 ], [ -126.0646918, 54.4232759 ], [ -126.0643112, 54.4232317 ], [ -126.0639458, 54.4231591 ], [ -126.063579299999986, 54.4230964 ], [ -126.0631374, 54.423032299999988 ], [ -126.0628333, 54.4229796 ], [ -126.0624968, 54.4229355 ], [ -126.0619726, 54.4229227 ], [ -126.0616293, 54.4229853 ], [ -126.061311199999977, 54.4231406 ], [ -126.060985, 54.4233656 ], [ -126.0607729, 54.4235322 ], [ -126.0605742, 54.423716 ] ] } }, +{ "type": "Feature", "properties": { "linear_feature_id": 17094245, "stream_order": 4, "gnis_name": null, "downstream_route_measure": 20463.154122936801, "blue_line_key": 360862508, "length_metre": 896.35067231006099, "area_ha": 231944.69, "localcode_ltree": "400.431358.585806", "refine_method": "CUT", "wscode_ltree": "400.431358" }, "geometry": { "type": "LineString", "coordinates": [ [ -126.3336004, 54.3903439 ], [ -126.333548299999975, 54.3902086 ], [ -126.333448299999986, 54.3900704 ], [ -126.333317199999982, 54.3899508 ], [ -126.333159, 54.389777 ], [ -126.33296940000001, 54.3896019 ], [ -126.33272, 54.3894438 ], [ -126.3325077, 54.3893669 ], [ -126.332179199999985, 54.3891974 ], [ -126.3319682, 54.3891305 ], [ -126.331592199999989, 54.3890051 ], [ -126.331390899999988, 54.3887943 ], [ -126.331348299999988, 54.3887217 ], [ -126.3312518, 54.3885394 ], [ -126.331162099999986, 54.3885095 ], [ -126.3308049, 54.3883315 ], [ -126.3307617, 54.3882674 ], [ -126.3307675, 54.3881962 ], [ -126.330779899999982, 54.3879897 ], [ -126.3307674, 54.3879355 ], [ -126.3306705, 54.387788799999988 ], [ -126.330678400000011, 54.3876635 ], [ -126.330638099999987, 54.3875638 ], [ -126.3306512, 54.3873488 ], [ -126.3307023, 54.3872947 ], [ -126.3307414, 54.3871437 ], [ -126.33074830000001, 54.3870625 ], [ -126.3307592, 54.3869016 ], [ -126.3309042, 54.3867691 ], [ -126.331087599999989, 54.386584 ], [ -126.331138599999989, 54.3864957 ], [ -126.3311796, 54.3863532 ], [ -126.33118970000001, 54.3861738 ], [ -126.331125, 54.3859915 ], [ -126.3310707, 54.3858833 ], [ -126.3309595, 54.385701 ], [ -126.330846099999988, 54.3855457 ], [ -126.330835900000011, 54.3854645 ], [ -126.330830800000015, 54.3852936 ], [ -126.3307924, 54.3852025 ], [ -126.330621099999988, 54.3849832 ], [ -126.3304634, 54.384808 ], [ -126.330287500000011, 54.3846428 ], [ -126.330111699999989, 54.3845046 ], [ -126.3300086, 54.3844576 ], [ -126.3296949, 54.3842881 ], [ -126.329548599999981, 54.3841771 ], [ -126.3294731, 54.3841486 ], [ -126.32917089999998, 54.3840702 ], [ -126.3288351, 54.3840175 ], [ -126.3285929, 54.3839492 ], [ -126.328473800000012, 54.3838922 ], [ -126.3283829, 54.3838452 ], [ -126.3283559, 54.3838182 ], [ -126.3283269, 54.3837897 ] ] } } ] } diff --git a/posts/2024-11-15-bcdata-ortho-historic/exports/airphotos_1963-08-07_1968-07-31.csv b/posts/2024-11-15-bcdata-ortho-historic/exports/airphotos_1968-05-09_1975-07-05.csv similarity index 52% rename from posts/2024-11-15-bcdata-ortho-historic/exports/airphotos_1963-08-07_1968-07-31.csv rename to posts/2024-11-15-bcdata-ortho-historic/exports/airphotos_1968-05-09_1975-07-05.csv index 6671f7c..21f2ac5 100644 --- a/posts/2024-11-15-bcdata-ortho-historic/exports/airphotos_1963-08-07_1968-07-31.csv +++ b/posts/2024-11-15-bcdata-ortho-historic/exports/airphotos_1968-05-09_1975-07-05.csv @@ -2,20 +2,36 @@ id,airp_id,flying_height,photo_year,photo_date,photo_time,latitude,longitude,fil WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.695111,695111,5944,1968,1968-05-09,12:30:00,54.20376,-126.053,bc5281,89,N,Y,Film - BW,bc5281_089,093l03021,093L01,1:31680,,B-012-AF-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5281/bc5281_089_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5281_3.jpg,,,55752,4436,10784,19192494,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.053, 54.20376)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.695112,695112,5944,1968,1968-05-09,12:30:00,54.22861,-126.0537,bc5281,90,N,Y,Film - BW,bc5281_090,093l03023,093L01,1:31680,,B-012-AF-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5281/bc5281_090_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5281_3.jpg,,,55752,4436,10784,19192495,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.0537, 54.22861)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.695119,695119,5944,1968,1968-05-09,12:30:00,54.4025,-126.0581,bc5281,97,N,Y,Film - BW,bc5281_097,093l05021,093L08,1:31680,,B-012-AF-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5281/bc5281_097_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5281_3.jpg,,,55752,4436,10784,19192502,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.0581, 54.4025)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.695274,695274,6096,1968,1968-07-24,08:33:00,54.31772,-126.1305,bc5296,185,N,Y,Film - BW,bc5296_185,093l04012,093L08,1:31680,,B-012-AF-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5296/bc5296_185_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5296_3.jpg,,,55762,4436,10833,19192655,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1305, 54.31772)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.695276,695276,6096,1968,1968-07-24,08:33:00,54.37441,-126.1328,bc5296,187,N,Y,Film - BW,bc5296_187,093l04032,093L08,1:31680,,B-012-AF-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5296/bc5296_187_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5296_3.jpg,,,55762,4436,10833,19192657,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1328, 54.37441)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.695278,695278,6096,1968,1968-07-24,08:33:00,54.43111,-126.135,bc5296,189,N,Y,Film - BW,bc5296_189,093l05014,093L08,1:31680,,B-012-AF-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5296/bc5296_189_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5296_3.jpg,,,55762,4436,10833,19192659,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.135, 54.43111)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.695279,695279,6096,1968,1968-07-24,08:33:00,54.45612,-126.1362,bc5296,190,N,Y,Film - BW,bc5296_190,093l05032,093L08,1:31680,,B-012-AF-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5296/bc5296_190_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5296_3.jpg,,,55762,4436,10833,19192660,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1362, 54.45612)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.695281,695281,6096,1968,1968-07-24,08:33:00,54.50614,-126.1386,bc5296,192,N,Y,Film - BW,bc5296_192,093l06012,093L09,1:31680,,B-012-AF-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5296/bc5296_192_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5296_3.jpg,,,55762,4436,10833,19192662,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1386, 54.50614)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.695326,695326,6096,1968,1968-07-24,09:01:00,54.46863,-126.2132,bc5296,234,N,Y,Film - BW,bc5296_234,093l04942,093L08,1:31680,,B-012-AF-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5296/bc5296_234_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5296_3.jpg,,,55763,4436,10833,19192704,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2132, 54.46863)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.695327,695327,6096,1968,1968-07-24,09:01:00,54.44108,-126.2127,bc5296,235,N,Y,Film - BW,bc5296_235,093l04924,093L08,1:31680,,B-012-AF-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5296/bc5296_235_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5296_3.jpg,,,55763,4436,10833,19192705,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2127, 54.44108)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.695328,695328,6096,1968,1968-07-24,09:01:00,54.41353,-126.2122,bc5296,236,N,Y,Film - BW,bc5296_236,093l04922,093L08,1:31680,,B-012-AF-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5296/bc5296_236_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5296_3.jpg,,,55763,4436,10833,19192706,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2122, 54.41353)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.696118,696118,5944,1968,1968-07-31,09:18:00,54.49532,-126.2941,bc5300,152,N,Y,Film - BW,bc5300_152,093l04943,093L08,1:31680,,B-012-AF-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5300/bc5300_152_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5300_2.jpg,,,55796,4436,10845,19193496,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2941, 54.49532)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.696119,696119,5944,1968,1968-07-31,09:18:00,54.52233,-126.2945,bc5300,153,N,Y,Film - BW,bc5300_153,093l05921,093L09,1:31680,,B-012-AF-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5300/bc5300_153_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5300_2.jpg,,,55796,4436,10845,19193497,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2945, 54.52233)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.696121,696121,5944,1968,1968-07-31,09:18:00,54.57635,-126.2953,bc5300,155,N,Y,Film - BW,bc5300_155,093l05943,093L09,1:31680,,B-012-AF-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5300/bc5300_155_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5300_2.jpg,,,55796,4436,10845,19193499,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2953, 54.57635)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.696166,696166,5944,1968,1968-07-31,09:50:00,54.52621,-126.3728,bc5300,196,N,Y,Film - BW,bc5300_196,093l05913,093L09,1:31680,,B-012-AF-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5300/bc5300_196_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5300_2.jpg,,,55797,4436,10845,19193540,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3728, 54.52621)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.696180,696180,5944,1968,1968-07-31,09:50:00,54.17755,-126.3654,bc5300,210,N,Y,Film - BW,bc5300_210,093l01933,093L01,1:31680,,B-012-AF-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5300/bc5300_210_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5300_2.jpg,,,55797,4436,10845,19193554,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3654, 54.17755)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.696197,696197,5944,1968,1968-07-31,10:20:00,54.18049,-126.4431,bc5300,227,N,Y,Film - BW,bc5300_227,093l01844,093L01,1:31680,,B-012-AF-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5300/bc5300_227_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5300_2.jpg,,,55798,4436,10845,19193571,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4431, 54.18049)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.696210,696210,5944,1968,1968-07-31,10:20:00,54.51071,-126.4495,bc5300,240,N,Y,Film - BW,bc5300_240,093l05822,093L09,1:31680,,B-012-AF-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5300/bc5300_240_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5300_2.jpg,,,55798,4436,10845,19193584,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4495, 54.51071)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.696211,696211,5944,1968,1968-07-31,10:20:00,54.53459,-126.44970000000001,bc5300,241,N,Y,Film - BW,bc5300_241,093l05824,093L09,1:31680,,B-012-AF-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5300/bc5300_241_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5300_2.jpg,,,55798,4436,10845,19193585,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4497, 54.53459)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.697292,697292,5944,1968,1968-07-31,11:01:00,54.46049,-126.5269,bc5306,23,N,Y,Film - BW,bc5306_023,093l04832,093L07,1:31680,,B-012-AF-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5306/bc5306_023_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5306_1.jpg,,,55827,4436,10857,19194536,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5269, 54.46049)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.697326,697326,5944,1968,1968-07-31,11:32:00,54.34512,-126.6025,bc5306,57,N,Y,Film - BW,bc5306_057,093l03724,093L07,1:31680,,B-012-AF-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5306/bc5306_057_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5306_1.jpg,,,55828,4436,10857,19194570,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6025, 54.34512)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.697329,697329,5944,1968,1968-07-31,11:32:00,54.42617,-126.6039,bc5306,60,N,Y,Film - BW,bc5306_060,093l04724,093L07,1:31680,,B-012-AF-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5306/bc5306_060_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5306_1.jpg,,,55828,4436,10857,19194573,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6039, 54.42617)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.697330,697330,5944,1968,1968-07-31,11:32:00,54.45503,-126.6042,bc5306,61,N,Y,Film - BW,bc5306_061,093l04742,093L07,1:31680,,B-012-AF-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5306/bc5306_061_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5306_1.jpg,,,55828,4436,10857,19194574,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6042, 54.45503)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699361,699361,2438,1968,1968-05-10,10:03:00,54.41264,-126.7286,bc5282,167,N,Y,Film - BW,bc5282_167,093l04712,093L07,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5282/bc5282_167_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5282_1.jpg,,,55904,4437,10786,19196209,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.7286, 54.41264)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699362,699362,2438,1968,1968-05-10,10:03:00,54.40555,-126.7186,bc5282,168,N,Y,Film - BW,bc5282_168,093l04712,093L07,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5282/bc5282_168_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5282_1.jpg,,,55904,4437,10786,19196210,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.7186, 54.40555)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699363,699363,2438,1968,1968-05-10,10:03:00,54.39845,-126.7085,bc5282,169,N,Y,Film - BW,bc5282_169,093l03734,093L07,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5282/bc5282_169_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5282_1.jpg,,,55904,4437,10786,19196211,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.7085, 54.39845)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699364,699364,2438,1968,1968-05-10,10:03:00,54.39136,-126.6985,bc5282,170,N,Y,Film - BW,bc5282_170,093l03743,093L07,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5282/bc5282_170_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5282_1.jpg,,,55904,4437,10786,19196212,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6985, 54.39136)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699386,699386,2591,1968,1968-05-10,10:21:00,54.39412,-126.7105,bc5282,192,N,Y,Film - BW,bc5282_192,093l03734,093L07,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5282/bc5282_192_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5282_1.jpg,,,55906,4437,10786,19196234,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.7105, 54.39412)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699387,699387,2591,1968,1968-05-10,10:21:00,54.40012,-126.6981,bc5282,193,N,Y,Film - BW,bc5282_193,093l04721,093L07,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5282/bc5282_193_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5282_1.jpg,,,55906,4437,10786,19196235,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6981, 54.40012)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699395,699395,2591,1968,1968-05-10,10:21:00,54.44813,-126.5993,bc5282,201,N,Y,Film - BW,bc5282_201,093l04813,093L07,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5282/bc5282_201_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5282_1.jpg,,,55906,4437,10786,19196243,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5993, 54.44813)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699396,699396,2591,1968,1968-05-10,10:21:00,54.45413,-126.5869,bc5282,202,N,Y,Film - BW,bc5282_202,093l04831,093L07,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5282/bc5282_202_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5282_1.jpg,,,55906,4437,10786,19196244,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5869, 54.45413)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699399,699399,2591,1968,1968-05-10,10:21:00,54.47208,-126.5488,bc5282,205,N,Y,Film - BW,bc5282_205,093l04832,093L07,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5282/bc5282_205_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5282_1.jpg,,,55906,4437,10786,19196247,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5488, 54.47208)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699400,699400,2591,1968,1968-05-10,10:21:00,54.47805,-126.5359,bc5282,206,N,Y,Film - BW,bc5282_206,093l04834,093L07,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5282/bc5282_206_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5282_1.jpg,,,55906,4437,10786,19196248,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5359, 54.47805)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699404,699404,2591,1968,1968-05-10,10:21:00,54.50195,-126.4842,bc5282,210,N,Y,Film - BW,bc5282_210,093l05821,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5282/bc5282_210_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5282_1.jpg,,,55906,4437,10786,19196252,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4842, 54.50195)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699405,699405,2591,1968,1968-05-10,10:21:00,54.50792,-126.4713,bc5282,211,N,Y,Film - BW,bc5282_211,093l05821,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5282/bc5282_211_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5282_1.jpg,,,55906,4437,10786,19196253,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4713, 54.50792)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699406,699406,2591,1968,1968-05-10,10:21:00,54.51389,-126.4584,bc5282,212,N,Y,Film - BW,bc5282_212,093l05821,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5282/bc5282_212_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5282_1.jpg,,,55906,4437,10786,19196254,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4584, 54.51389)" @@ -30,6 +46,7 @@ WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699418,699418,2591,1968,1968- WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699419,699419,2591,1968,1968-05-10,10:28:00,54.45206,-126.54,bc5282,225,N,Y,Film - BW,bc5282_225,093l04832,093L07,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5282/bc5282_225_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5282_1.jpg,,,55907,4437,10786,19196267,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.54, 54.45206)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699420,699420,2591,1968,1968-05-10,10:28:00,54.44575,-126.5528,bc5282,226,N,Y,Film - BW,bc5282_226,093l04813,093L07,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5282/bc5282_226_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5282_1.jpg,,,55907,4437,10786,19196268,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5528, 54.44575)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699421,699421,2591,1968,1968-05-10,10:28:00,54.43945,-126.5655,bc5282,227,N,Y,Film - BW,bc5282_227,093l04813,093L07,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5282/bc5282_227_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5282_1.jpg,,,55907,4437,10786,19196269,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5655, 54.43945)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699422,699422,2591,1968,1968-05-10,10:28:00,54.43315,-126.5783,bc5282,228,N,Y,Film - BW,bc5282_228,093l04813,093L07,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5282/bc5282_228_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5282_1.jpg,,,55907,4437,10786,19196270,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5783, 54.43315)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699423,699423,2591,1968,1968-05-10,10:28:00,54.42685,-126.591,bc5282,229,N,Y,Film - BW,bc5282_229,093l04813,093L07,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5282/bc5282_229_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5282_1.jpg,,,55907,4437,10786,19196271,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.591, 54.42685)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699424,699424,2591,1968,1968-05-10,10:28:00,54.42054,-126.6037,bc5282,230,N,Y,Film - BW,bc5282_230,093l04722,093L07,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5282/bc5282_230_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5282_1.jpg,,,55907,4437,10786,19196272,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6037, 54.42054)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699425,699425,2591,1968,1968-05-10,10:28:00,54.41424,-126.6165,bc5282,231,N,Y,Film - BW,bc5282_231,093l04722,093L07,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5282/bc5282_231_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5282_1.jpg,,,55907,4437,10786,19196273,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6165, 54.41424)" @@ -37,6 +54,8 @@ WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699426,699426,2591,1968,1968- WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699427,699427,2591,1968,1968-05-10,10:28:00,54.40164,-126.6419,bc5282,233,N,Y,Film - BW,bc5282_233,093l04722,093L07,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5282/bc5282_233_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5282_1.jpg,,,55907,4437,10786,19196275,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6419, 54.40164)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699428,699428,2591,1968,1968-05-10,10:28:00,54.39533,-126.6547,bc5282,234,N,Y,Film - BW,bc5282_234,093l03743,093L07,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5282/bc5282_234_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5282_1.jpg,,,55907,4437,10786,19196276,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6547, 54.39533)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699429,699429,2591,1968,1968-05-10,10:28:00,54.38903,-126.6674,bc5282,235,N,Y,Film - BW,bc5282_235,093l03743,093L07,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5282/bc5282_235_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5282_1.jpg,,,55907,4437,10786,19196277,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6674, 54.38903)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699436,699436,2591,1968,1968-05-10,10:44:00,54.51286,-126.2951,bc5283,6,N,Y,Film - BW,bc5283_006,093l05921,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_006_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55908,4437,10787,19196284,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2951, 54.51286)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699437,699437,2591,1968,1968-05-10,10:44:00,54.5135,-126.3102,bc5283,7,N,Y,Film - BW,bc5283_007,093l05912,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_007_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55908,4437,10787,19196285,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3102, 54.5135)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699438,699438,2591,1968,1968-05-10,10:44:00,54.51414,-126.3254,bc5283,8,N,Y,Film - BW,bc5283_008,093l05912,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_008_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55908,4437,10787,19196286,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3254, 54.51414)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699439,699439,2591,1968,1968-05-10,10:44:00,54.51478,-126.3406,bc5283,9,N,Y,Film - BW,bc5283_009,093l05912,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_009_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55908,4437,10787,19196287,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3406, 54.51478)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699440,699440,2591,1968,1968-05-10,10:44:00,54.51542,-126.3558,bc5283,10,N,Y,Film - BW,bc5283_010,093l05911,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_010_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55908,4437,10787,19196288,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3558, 54.51542)" @@ -47,10 +66,18 @@ WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699444,699444,2591,1968,1968- WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699445,699445,2591,1968,1968-05-10,10:44:00,54.51758,-126.4406,bc5283,15,N,Y,Film - BW,bc5283_015,093l05822,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_015_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55908,4437,10787,19196293,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4406, 54.51758)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699446,699446,2591,1968,1968-05-10,10:44:00,54.51801,-126.4576,bc5283,16,N,Y,Film - BW,bc5283_016,093l05821,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_016_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55908,4437,10787,19196294,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4576, 54.51801)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699447,699447,2591,1968,1968-05-10,10:44:00,54.51844,-126.4745,bc5283,17,N,Y,Film - BW,bc5283_017,093l05821,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_017_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55908,4437,10787,19196295,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4745, 54.51844)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699450,699450,2591,1968,1968-05-10,10:51:00,54.53826,-126.4793,bc5283,20,N,Y,Film - BW,bc5283_020,093l05823,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_020_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55909,4437,10787,19196298,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4793, 54.53826)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699451,699451,2591,1968,1968-05-10,10:51:00,54.53792,-126.4657,bc5283,21,N,Y,Film - BW,bc5283_021,093l05823,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_021_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55909,4437,10787,19196299,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4657, 54.53792)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699452,699452,2591,1968,1968-05-10,10:51:00,54.53757,-126.4521,bc5283,22,N,Y,Film - BW,bc5283_022,093l05823,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_022_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55909,4437,10787,19196300,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4521, 54.53757)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699453,699453,2591,1968,1968-05-10,10:51:00,54.53723,-126.4384,bc5283,23,N,Y,Film - BW,bc5283_023,093l05824,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_023_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55909,4437,10787,19196301,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4384, 54.53723)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699454,699454,2591,1968,1968-05-10,10:51:00,54.53688,-126.4248,bc5283,24,N,Y,Film - BW,bc5283_024,093l05824,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_024_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55909,4437,10787,19196302,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4248, 54.53688)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699457,699457,2591,1968,1968-05-10,10:51:00,54.53584,-126.3839,bc5283,27,N,Y,Film - BW,bc5283_027,093l05913,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_027_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55909,4437,10787,19196305,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3839, 54.53584)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699458,699458,2591,1968,1968-05-10,10:51:00,54.5355,-126.3703,bc5283,28,N,Y,Film - BW,bc5283_028,093l05913,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_028_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55909,4437,10787,19196306,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3703, 54.5355)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699459,699459,2591,1968,1968-05-10,10:51:00,54.53498,-126.3554,bc5283,29,N,Y,Film - BW,bc5283_029,093l05913,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_029_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55909,4437,10787,19196307,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3554, 54.53498)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699460,699460,2591,1968,1968-05-10,10:51:00,54.53447,-126.3405,bc5283,30,N,Y,Film - BW,bc5283_030,093l05914,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_030_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55909,4437,10787,19196308,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3405, 54.53447)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699461,699461,2591,1968,1968-05-10,10:51:00,54.53395,-126.3256,bc5283,31,N,Y,Film - BW,bc5283_031,093l05914,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_031_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55909,4437,10787,19196309,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3256, 54.53395)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699462,699462,2591,1968,1968-05-10,10:51:00,54.53344,-126.3108,bc5283,32,N,Y,Film - BW,bc5283_032,093l05914,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_032_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55909,4437,10787,19196310,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3108, 54.53344)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699465,699465,2591,1968,1968-05-10,10:51:00,54.53189,-126.2661,bc5283,35,N,Y,Film - BW,bc5283_035,093l05923,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_035_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55909,4437,10787,19196313,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2661, 54.53189)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699466,699466,2591,1968,1968-05-10,10:57:00,54.50925,-126.308,bc5283,36,N,Y,Film - BW,bc5283_036,093l05912,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_036_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55910,4437,10787,19196314,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.308, 54.50925)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699467,699467,2591,1968,1968-05-10,10:57:00,54.5015,-126.2987,bc5283,37,N,Y,Film - BW,bc5283_037,093l05921,093L09,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_037_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55910,4437,10787,19196315,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2987, 54.5015)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699468,699468,2591,1968,1968-05-10,10:57:00,54.49375,-126.2893,bc5283,38,N,Y,Film - BW,bc5283_038,093l04943,093L08,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_038_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55910,4437,10787,19196316,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2893, 54.49375)" @@ -66,19 +93,46 @@ WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699478,699478,2591,1968,1968- WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699479,699479,2591,1968,1968-05-10,10:57:00,54.40982,-126.188,bc5283,49,N,Y,Film - BW,bc5283_049,093l05011,093L08,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_049_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55910,4437,10787,19196327,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.188, 54.40982)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699480,699480,2591,1968,1968-05-10,10:57:00,54.40252,-126.1792,bc5283,50,N,Y,Film - BW,bc5283_050,093l05011,093L08,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_050_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55910,4437,10787,19196328,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1792, 54.40252)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699481,699481,2591,1968,1968-05-10,10:57:00,54.39522,-126.1703,bc5283,51,N,Y,Film - BW,bc5283_051,093l04033,093L08,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_051_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55910,4437,10787,19196329,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1703, 54.39522)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699482,699482,2591,1968,1968-05-10,10:57:00,54.38791,-126.1615,bc5283,52,N,Y,Film - BW,bc5283_052,093l04033,093L08,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_052_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55910,4437,10787,19196330,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1615, 54.38791)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699483,699483,2591,1968,1968-05-10,10:57:00,54.38061,-126.1527,bc5283,53,N,Y,Film - BW,bc5283_053,093l04033,093L08,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_053_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55910,4437,10787,19196331,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1527, 54.38061)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699484,699484,2591,1968,1968-05-10,10:57:00,54.37331,-126.1439,bc5283,54,N,Y,Film - BW,bc5283_054,093l04032,093L08,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_054_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55910,4437,10787,19196332,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1439, 54.37331)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699488,699488,2591,1968,1968-05-10,11:04:00,54.37398,-126.1026,bc5283,58,N,Y,Film - BW,bc5283_058,093l04032,093L08,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_058_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55911,4437,10787,19196336,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1026, 54.37398)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699489,699489,2591,1968,1968-05-10,11:04:00,54.38132,-126.1118,bc5283,59,N,Y,Film - BW,bc5283_059,093l04034,093L08,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_059_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55911,4437,10787,19196337,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1118, 54.38132)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699490,699490,2591,1968,1968-05-10,11:04:00,54.38866,-126.1211,bc5283,60,N,Y,Film - BW,bc5283_060,093l04034,093L08,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_060_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55911,4437,10787,19196338,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1211, 54.38866)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699501,699501,2591,1968,1968-05-10,11:04:00,54.46699,-126.2167,bc5283,71,N,Y,Film - BW,bc5283_071,093l04942,093L08,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_071_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55911,4437,10787,19196349,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2167, 54.46699)" WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.699502,699502,2591,1968,1968-05-10,11:04:00,54.47373,-126.2244,bc5283,72,N,Y,Film - BW,bc5283_072,093l04942,093L08,1:12000,,B-022-WR-68,153,https://openmaps.gov.bc.ca/thumbs/1968/bc5283/bc5283_072_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1968/roll_pages/bc5283_1.jpg,,,55911,4437,10787,19196350,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2244, 54.47373)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1486153,1486153,5791,1963,1963-08-07,10:59:00,54.20898,-126.0629,bc4134,128,N,Y,Film - BW,bc4134_128,093l03021,093L01,1:16000,,B-023-FI-63,305,,https://openmaps.gov.bc.ca/thumbs/logbooks/1963/roll_pages/bc4134_2.jpg,,,83890,6008,13910,19329995,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.0629, 54.20898)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1486171,1486171,5791,1963,1963-08-07,10:59:00,54.20965,-126.4163,bc4134,146,N,Y,Film - BW,bc4134_146,093l02822,093L01,1:16000,,B-023-FI-63,305,,https://openmaps.gov.bc.ca/thumbs/logbooks/1963/roll_pages/bc4134_2.jpg,,,83890,6008,13910,19330013,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4163, 54.20965)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1486179,1486179,5791,1963,1963-08-07,10:59:00,54.20965,-126.5788,bc4134,154,N,Y,Film - BW,bc4134_154,093l02811,093L02,1:16000,,B-023-FI-63,305,,https://openmaps.gov.bc.ca/thumbs/logbooks/1963/roll_pages/bc4134_2.jpg,,,83890,6008,13910,19330021,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5788, 54.20965)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1486211,1486211,5791,1963,1963-08-07,11:20:00,54.18646,-126.5558,bc4134,186,N,Y,Film - BW,bc4134_186,093l01833,093L02,1:16000,,B-023-FI-63,305,,https://openmaps.gov.bc.ca/thumbs/logbooks/1963/roll_pages/bc4134_2.jpg,,,83891,6008,13910,19330053,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5558, 54.18646)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1486212,1486212,5791,1963,1963-08-07,11:20:00,54.18657,-126.5342,bc4134,187,N,Y,Film - BW,bc4134_187,093l01834,093L02,1:16000,,B-023-FI-63,305,,https://openmaps.gov.bc.ca/thumbs/logbooks/1963/roll_pages/bc4134_2.jpg,,,83891,6008,13910,19330054,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5342, 54.18657)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1486213,1486213,5791,1963,1963-08-07,11:20:00,54.18669,-126.5125,bc4134,188,N,Y,Film - BW,bc4134_188,093l01834,093L02,1:16000,,B-023-FI-63,305,,https://openmaps.gov.bc.ca/thumbs/logbooks/1963/roll_pages/bc4134_2.jpg,,,83891,6008,13910,19330055,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5125, 54.18669)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1486214,1486214,5791,1963,1963-08-07,11:20:00,54.1868,-126.4909,bc4134,189,N,Y,Film - BW,bc4134_189,093l01843,093L01,1:16000,,B-023-FI-63,305,,https://openmaps.gov.bc.ca/thumbs/logbooks/1963/roll_pages/bc4134_2.jpg,,,83891,6008,13910,19330056,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4909, 54.1868)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1486215,1486215,5791,1963,1963-08-07,11:20:00,54.18677,-126.4708,bc4134,190,N,Y,Film - BW,bc4134_190,093l01843,093L01,1:16000,,B-023-FI-63,305,,https://openmaps.gov.bc.ca/thumbs/logbooks/1963/roll_pages/bc4134_2.jpg,,,83891,6008,13910,19330057,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4708, 54.18677)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1486216,1486216,5791,1963,1963-08-07,11:20:00,54.18675,-126.4508,bc4134,191,N,Y,Film - BW,bc4134_191,093l01843,093L01,1:16000,,B-023-FI-63,305,,https://openmaps.gov.bc.ca/thumbs/logbooks/1963/roll_pages/bc4134_2.jpg,,,83891,6008,13910,19330058,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4508, 54.18675)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1486217,1486217,5791,1963,1963-08-07,11:20:00,54.18672,-126.4307,bc4134,192,N,Y,Film - BW,bc4134_192,093l01844,093L01,1:16000,,B-023-FI-63,305,,https://openmaps.gov.bc.ca/thumbs/logbooks/1963/roll_pages/bc4134_2.jpg,,,83891,6008,13910,19330059,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4307, 54.18672)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1486218,1486218,5791,1963,1963-08-07,11:20:00,54.1867,-126.4107,bc4134,193,N,Y,Film - BW,bc4134_193,093l01844,093L01,1:16000,,B-023-FI-63,305,,https://openmaps.gov.bc.ca/thumbs/logbooks/1963/roll_pages/bc4134_2.jpg,,,83891,6008,13910,19330060,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4107, 54.1867)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1401140,1401140,6096,1971,1971-07-17,01:23:00,54.38969,-126.6363,bc7333,74,N,Y,Film - BW,bc7333_074,093l03744,093L07,1:15840,,B-003-FSR-71,305,,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7333_7334_1.jpg,,,81897,5519,12699,19594490,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6363, 54.38969)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1401171,1401171,6096,1971,1971-07-17,01:23:00,54.36874,-126.6293,bc7333,105,N,Y,Film - BW,bc7333_105,093l03742,093L07,1:15840,,B-003-FSR-71,305,,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7333_7334_1.jpg,,,81898,5519,12699,19594521,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6293, 54.36874)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1401319,1401319,6096,1971,1971-07-17,01:23:00,54.3461,-126.6155,bc7333,253,N,Y,Film - BW,bc7333_253,093l03724,093L07,1:15840,,B-003-FSR-71,305,,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7333_7334_1.jpg,,,81899,5519,12699,19594669,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6155, 54.3461)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1401591,1401591,6096,1971,1971-07-26,01:50:00,54.32501,-126.6276,bc7359,181,N,Y,Film - BW,bc7359_181,093l03724,093L07,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7359/bc7359_181_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7359_7360_3.jpg,,,81907,5519,12737,19594937,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6276, 54.32501)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1401627,1401627,6096,1971,1971-07-26,01:50:00,54.30304,-126.654,bc7359,217,N,Y,Film - BW,bc7359_217,093l03721,093L07,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7359/bc7359_217_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7359_7360_3.jpg,,,81908,5519,12737,19594973,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.654, 54.30304)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1401764,1401764,6096,1971,1971-07-26,01:59:00,54.2819,-126.6356,bc7360,70,N,Y,Film - BW,bc7360_070,093l02744,093L07,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7360/bc7360_070_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7359_7360_3.jpg,,,81909,5519,12738,19595110,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6356, 54.2819)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1401803,1401803,6096,1971,1971-07-26,01:59:00,54.25986,-126.6267,bc7360,109,N,Y,Film - BW,bc7360_109,093l02742,093L07,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7360/bc7360_109_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7359_7360_3.jpg,,,81910,5519,12738,19595149,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6267, 54.25986)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1402190,1402190,6096,1971,1971-07-27,09:20:00,54.17395,-126.4027,bc7362,88,N,Y,Film - BW,bc7362_088,093l01842,093L01,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7362/bc7362_088_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7361_7362_1.jpg,,,81916,5519,12741,19595536,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4027, 54.17395)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1402191,1402191,6096,1971,1971-07-27,09:20:00,54.17389,-126.3799,bc7362,89,N,Y,Film - BW,bc7362_089,093l01931,093L01,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7362/bc7362_089_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7361_7362_1.jpg,,,81916,5519,12741,19595537,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3799, 54.17389)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1402192,1402192,6096,1971,1971-07-27,09:20:00,54.17384,-126.3571,bc7362,90,N,Y,Film - BW,bc7362_090,093l01931,093L01,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7362/bc7362_090_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7361_7362_1.jpg,,,81916,5519,12741,19595538,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3571, 54.17384)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1402193,1402193,6096,1971,1971-07-27,09:20:00,54.17378,-126.3344,bc7362,91,N,Y,Film - BW,bc7362_091,093l01932,093L01,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7362/bc7362_091_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7361_7362_1.jpg,,,81916,5519,12741,19595539,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3344, 54.17378)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1402210,1402210,6096,1971,1971-07-27,09:20:00,54.19481,-126.4939,bc7362,108,N,Y,Film - BW,bc7362_108,093l01843,093L01,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7362/bc7362_108_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7361_7362_1.jpg,,,81917,5519,12741,19595556,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4939, 54.19481)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1402212,1402212,6096,1971,1971-07-27,09:20:00,54.19497,-126.5342,bc7362,110,N,Y,Film - BW,bc7362_110,093l01834,093L02,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7362/bc7362_110_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7361_7362_1.jpg,,,81917,5519,12741,19595558,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5342, 54.19497)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1402213,1402213,6096,1971,1971-07-27,09:20:00,54.19505,-126.5543,bc7362,111,N,Y,Film - BW,bc7362_111,093l01833,093L02,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7362/bc7362_111_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7361_7362_1.jpg,,,81917,5519,12741,19595559,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5543, 54.19505)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1402214,1402214,6096,1971,1971-07-27,09:20:00,54.19513,-126.5745,bc7362,112,N,Y,Film - BW,bc7362_112,093l01833,093L02,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7362/bc7362_112_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7361_7362_1.jpg,,,81917,5519,12741,19595560,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5745, 54.19513)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1402343,1402343,6096,1971,1971-07-27,09:20:00,54.21645,-126.5998,bc7362,241,N,Y,Film - BW,bc7362_241,093l02811,093L02,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7362/bc7362_241_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7361_7362_1.jpg,,,81918,5519,12741,19595689,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5998, 54.21645)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1402344,1402344,6096,1971,1971-07-27,09:20:00,54.2164,-126.5753,bc7362,242,N,Y,Film - BW,bc7362_242,093l02811,093L02,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7362/bc7362_242_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7361_7362_1.jpg,,,81918,5519,12741,19595690,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5753, 54.2164)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1402368,1402368,6096,1971,1971-07-27,09:20:00,54.23772,-126.622,bc7362,266,N,Y,Film - BW,bc7362_266,093l02724,093L02,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7362/bc7362_266_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7361_7362_1.jpg,,,81919,5519,12741,19595714,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.622, 54.23772)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1402369,1402369,6096,1971,1971-07-27,09:20:00,54.23778,-126.6417,bc7362,267,N,Y,Film - BW,bc7362_267,093l02724,093L02,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7362/bc7362_267_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7361_7362_1.jpg,,,81919,5519,12741,19595715,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6417, 54.23778)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414086,1414086,6096,1971,1971-08-30,10:55:00,54.1605,-126.316,bc5440,66,N,Y,Film - BW,bc5440_066,093l01932,093L01,1:31680,,B-113-DF-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5440/bc5440_066_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5440_2.jpg,,,82117,5497,12643,19607429,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.316, 54.1605)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414128,1414128,6096,1971,1971-08-30,10:55:00,54.17457,-126.4047,bc5440,108,N,Y,Film - BW,bc5440_108,093l01842,093L01,1:31680,,B-113-DF-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5440/bc5440_108_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5440_2.jpg,,,82118,5497,12643,19607471,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4047, 54.17457)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414186,1414186,6096,1971,1971-08-30,10:55:00,54.2285,-126.6218,bc5440,178,N,Y,Film - BW,bc5440_178,093l02724,093L02,1:31680,,B-113-DF-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5440/bc5440_178_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5440_2.jpg,,,82121,5497,12643,19607529,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6218, 54.2285)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414190,1414190,6096,1971,1971-08-30,10:55:00,54.32924,-126.6211,bc5440,182,N,Y,Film - BW,bc5440_182,093l03724,093L07,1:31680,,B-113-DF-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5440/bc5440_182_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5440_2.jpg,,,82121,5497,12643,19607533,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6211, 54.32924)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414191,1414191,6096,1971,1971-08-30,10:55:00,54.35443,-126.6209,bc5440,183,N,Y,Film - BW,bc5440_183,093l03742,093L07,1:31680,,B-113-DF-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5440/bc5440_183_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5440_2.jpg,,,82121,5497,12643,19607534,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6209, 54.35443)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414326,1414326,6096,1971,1971-06-05,09:05:00,54.28162,-126.0924,bc5420,71,N,Y,Film - BW,bc5420_071,093l03043,093L08,1:31680,,B-122-LI-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5420/bc5420_071_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5420_1.jpg,,,82127,5464,12582,19607669,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.0924, 54.28162)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414327,1414327,6096,1971,1971-06-05,09:05:00,54.30877,-126.0924,bc5420,72,N,Y,Film - BW,bc5420_072,093l04021,093L08,1:31680,,B-122-LI-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5420/bc5420_072_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5420_1.jpg,,,82127,5464,12582,19607670,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.0924, 54.30877)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414350,1414350,6096,1971,1971-06-05,09:05:00,54.3676,-126.1682,bc5420,95,N,Y,Film - BW,bc5420_095,093l04031,093L08,1:31680,,B-122-LI-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5420/bc5420_095_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5420_1.jpg,,,82128,5464,12582,19607693,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1682, 54.3676)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414351,1414351,6096,1971,1971-06-05,09:05:00,54.34234,-126.1679,bc5420,96,N,Y,Film - BW,bc5420_096,093l04013,093L08,1:31680,,B-122-LI-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5420/bc5420_096_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5420_1.jpg,,,82128,5464,12582,19607694,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1679, 54.34234)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267548,1267548,7315,1975,1975-07-05,08:50:00,54.20869,-126.052,bc7739,116,N,Y,Film - BW,bc7739_116,093l03021,093L01,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7739/bc7739_116_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77601,5298,14998,19481218,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.052, 54.20869)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267632,1267632,7315,1975,1975-07-05,08:50:00,54.23759,-126.0642,bc7739,200,N,Y,Film - BW,bc7739_200,093l03023,093L01,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7739/bc7739_200_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77602,5298,14998,19481302,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.0642, 54.23759)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267691,1267691,7315,1975,1975-07-05,08:50:00,54.26654,-126.0717,bc7739,259,N,Y,Film - BW,bc7739_259,093l03041,093L08,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7739/bc7739_259_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77603,5298,14998,19481361,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.0717, 54.26654)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267788,1267788,7315,1975,1975-07-05,08:50:00,54.29438,-126.0822,bc7740,52,N,Y,Film - BW,bc7740_052,093l03043,093L08,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7740/bc7740_052_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77604,5298,14999,19481458,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.0822, 54.29438)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267812,1267812,7315,1975,1975-07-05,08:50:00,54.32335,-126.1284,bc7740,76,N,Y,Film - BW,bc7740_076,093l04012,093L08,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7740/bc7740_076_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77605,5298,14999,19481482,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1284, 54.32335)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267813,1267813,7315,1975,1975-07-05,08:50:00,54.32325,-126.1035,bc7740,77,N,Y,Film - BW,bc7740_077,093l04012,093L08,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7740/bc7740_077_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77605,5298,14999,19481483,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1035, 54.32325)" +WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267931,1267931,7315,1975,1975-07-05,08:50:00,54.3821,-126.1337,bc7740,195,N,Y,Film - BW,bc7740_195,093l04034,093L08,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7740/bc7740_195_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77607,5298,14999,19481601,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1337, 54.3821)" diff --git a/posts/2024-11-15-bcdata-ortho-historic/exports/airphotos_1971-06-05_1975-09-18.csv b/posts/2024-11-15-bcdata-ortho-historic/exports/airphotos_1971-06-05_1975-09-18.csv deleted file mode 100644 index 1c0fe05..0000000 --- a/posts/2024-11-15-bcdata-ortho-historic/exports/airphotos_1971-06-05_1975-09-18.csv +++ /dev/null @@ -1,145 +0,0 @@ -id,airp_id,flying_height,photo_year,photo_date,photo_time,latitude,longitude,film_roll,frame_number,georef_metadata_ind,published_ind,media,photo_tag,bcgs_tile,nts_tile,scale,ground_sample_distance,operation_tag,focal_length,thumbnail_image_url,flight_log_url,camera_calibration_url,patb_georef_url,flight_line_segment_id,operation_id,film_record_id,objectid,se_anno_cad_data,area_ha,localcode_ltree,refine_method,wscode_ltree,geometry -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1265167,1265167,7315,1975,1975-07-05,12:40:00,54.43797,-126.5654,bc7727,88,N,Y,Film - BW,bc7727_088,093l04813,093L07,1:20000,,B-009-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7727/bc7727_088_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7727_7728_1.jpg,,,77563,1389,14969,19478837,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5654, 54.43797)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1265168,1265168,7315,1975,1975-07-05,12:40:00,54.43808,-126.5962,bc7727,89,N,Y,Film - BW,bc7727_089,093l04813,093L07,1:20000,,B-009-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7727/bc7727_089_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7727_7728_1.jpg,,,77563,1389,14969,19478838,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5962, 54.43808)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1265318,1265318,7315,1975,1975-07-05,12:40:00,54.4672,-126.5188,bc7728,79,N,Y,Film - BW,bc7728_079,093l04832,093L07,1:20000,,B-009-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7728/bc7728_079_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7727_7728_1.jpg,,,77564,1389,14972,19478988,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5188, 54.4672)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1265319,1265319,7315,1975,1975-07-05,12:40:00,54.46719,-126.4937,bc7728,80,N,Y,Film - BW,bc7728_080,093l04841,093L08,1:20000,,B-009-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7728/bc7728_080_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7727_7728_1.jpg,,,77564,1389,14972,19478989,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4937, 54.46719)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1265343,1265343,7315,1975,1975-07-05,12:40:00,54.49571,-126.2767,bc7728,104,N,Y,Film - BW,bc7728_104,093l04943,093L08,1:20000,,B-009-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7728/bc7728_104_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7727_7728_1.jpg,,,77565,1389,14972,19479013,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2767, 54.49571)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1265344,1265344,7315,1975,1975-07-05,12:40:00,54.49574,-126.3036,bc7728,105,N,Y,Film - BW,bc7728_105,093l04934,093L08,1:20000,,B-009-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7728/bc7728_105_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7727_7728_1.jpg,,,77565,1389,14972,19479014,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3036, 54.49574)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1265351,1265351,7315,1975,1975-07-05,12:40:00,54.49571,-126.491,bc7728,112,N,Y,Film - BW,bc7728_112,093l04843,093L08,1:20000,,B-009-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7728/bc7728_112_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7727_7728_1.jpg,,,77565,1389,14972,19479021,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.491, 54.49571)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1265493,1265493,7315,1975,1975-07-05,03:45:00,54.52463,-126.4592,bc7735,77,N,Y,Film - BW,bc7735_077,093l05821,093L09,1:20000,,B-009-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7735/bc7735_077_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7735_7736_1.jpg,,,77566,1389,14993,19479163,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4592, 54.52463)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1265495,1265495,7315,1975,1975-07-05,03:45:00,54.52466,-126.4038,bc7735,79,N,Y,Film - BW,bc7735_079,093l05822,093L09,1:20000,,B-009-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7735/bc7735_079_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7735_7736_1.jpg,,,77566,1389,14993,19479165,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4038, 54.52466)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1265497,1265497,7315,1975,1975-07-05,03:45:00,54.52466,-126.3484,bc7735,81,N,Y,Film - BW,bc7735_081,093l05912,093L09,1:20000,,B-009-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7735/bc7735_081_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7735_7736_1.jpg,,,77566,1389,14993,19479167,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3484, 54.52466)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1265498,1265498,7315,1975,1975-07-05,03:45:00,54.52465,-126.3207,bc7735,82,N,Y,Film - BW,bc7735_082,093l05912,093L09,1:20000,,B-009-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7735/bc7735_082_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7735_7736_1.jpg,,,77566,1389,14993,19479168,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3207, 54.52465)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267359,1267359,7315,1975,1975-07-05,12:40:00,54.41326,-126.201,bc7727,11,N,Y,Film - BW,bc7727_011,093l04922,093L08,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7727/bc7727_011_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7727_7728_1.jpg,,,77597,5298,14968,19481029,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.201, 54.41326)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267363,1267363,7315,1975,1975-07-05,12:40:00,54.41105,-126.0921,bc7727,15,N,Y,Film - BW,bc7727_015,093l05021,093L08,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7727/bc7727_015_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7727_7728_1.jpg,,,77597,5298,14968,19481033,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.0921, 54.41105)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267506,1267506,7315,1975,1975-07-05,08:50:00,54.17698,-126.4302,bc7739,74,N,Y,Film - BW,bc7739_074,093l01844,093L01,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7739/bc7739_074_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77600,5298,14998,19481176,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4302, 54.17698)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267507,1267507,7315,1975,1975-07-05,08:50:00,54.17692,-126.4551,bc7739,75,N,Y,Film - BW,bc7739_075,093l01843,093L01,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7739/bc7739_075_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77600,5298,14998,19481177,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4551, 54.17692)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267529,1267529,7315,1975,1975-07-05,08:50:00,54.20894,-126.5845,bc7739,97,N,Y,Film - BW,bc7739_097,093l02811,093L02,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7739/bc7739_097_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77601,5298,14998,19481199,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5845, 54.20894)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267535,1267535,7315,1975,1975-07-05,08:50:00,54.2086,-126.4077,bc7739,103,N,Y,Film - BW,bc7739_103,093l02822,093L01,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7739/bc7739_103_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77601,5298,14998,19481205,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4077, 54.2086)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267548,1267548,7315,1975,1975-07-05,08:50:00,54.20869,-126.052,bc7739,116,N,Y,Film - BW,bc7739_116,093l03021,093L01,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7739/bc7739_116_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77601,5298,14998,19481218,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.052, 54.20869)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267632,1267632,7315,1975,1975-07-05,08:50:00,54.23759,-126.0642,bc7739,200,N,Y,Film - BW,bc7739_200,093l03023,093L01,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7739/bc7739_200_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77602,5298,14998,19481302,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.0642, 54.23759)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267653,1267653,7315,1975,1975-07-05,08:50:00,54.2378,-126.6187,bc7739,221,N,Y,Film - BW,bc7739_221,093l02724,093L02,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7739/bc7739_221_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77602,5298,14998,19481323,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6187, 54.2378)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267654,1267654,7315,1975,1975-07-05,08:50:00,54.23826,-126.6451,bc7739,222,N,Y,Film - BW,bc7739_222,093l02724,093L02,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7739/bc7739_222_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77602,5298,14998,19481324,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6451, 54.23826)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267669,1267669,7315,1975,1975-07-05,08:50:00,54.26693,-126.6362,bc7739,237,N,Y,Film - BW,bc7739_237,093l02742,093L07,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7739/bc7739_237_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77603,5298,14998,19481339,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6362, 54.26693)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267691,1267691,7315,1975,1975-07-05,08:50:00,54.26654,-126.0717,bc7739,259,N,Y,Film - BW,bc7739_259,093l03041,093L08,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7739/bc7739_259_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77603,5298,14998,19481361,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.0717, 54.26654)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267788,1267788,7315,1975,1975-07-05,08:50:00,54.29438,-126.0822,bc7740,52,N,Y,Film - BW,bc7740_052,093l03043,093L08,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7740/bc7740_052_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77604,5298,14999,19481458,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.0822, 54.29438)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267812,1267812,7315,1975,1975-07-05,08:50:00,54.32335,-126.1284,bc7740,76,N,Y,Film - BW,bc7740_076,093l04012,093L08,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7740/bc7740_076_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77605,5298,14999,19481482,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1284, 54.32335)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267813,1267813,7315,1975,1975-07-05,08:50:00,54.32325,-126.1035,bc7740,77,N,Y,Film - BW,bc7740_077,093l04012,093L08,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7740/bc7740_077_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77605,5298,14999,19481483,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1035, 54.32325)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267911,1267911,7315,1975,1975-07-05,08:50:00,54.35198,-126.1794,bc7740,175,N,Y,Film - BW,bc7740_175,093l04031,093L08,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7740/bc7740_175_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77606,5298,14999,19481581,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1794, 54.35198)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267931,1267931,7315,1975,1975-07-05,08:50:00,54.3821,-126.1337,bc7740,195,N,Y,Film - BW,bc7740_195,093l04034,093L08,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7740/bc7740_195_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77607,5298,14999,19481601,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1337, 54.3821)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267932,1267932,7315,1975,1975-07-05,08:50:00,54.38186,-126.1067,bc7740,196,N,Y,Film - BW,bc7740_196,093l04034,093L08,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7740/bc7740_196_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77607,5298,14999,19481602,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1067, 54.38186)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1267933,1267933,7315,1975,1975-07-05,08:50:00,54.38161,-126.0797,bc7740,197,N,Y,Film - BW,bc7740_197,093l04043,093L08,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7740/bc7740_197_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7739_7740_1.jpg,,,77607,5298,14999,19481603,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.0797, 54.38161)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1268030,1268030,7315,1975,1975-09-18,10:25:00,54.4665,-126.2526,bc7824,158,N,Y,Film - BW,bc7824_158,093l04941,093L08,1:20000,,B-010-FI-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7824/bc7824_158_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7823_7824_4.jpg,,,77609,5298,15169,19481700,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2526, 54.4665)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1284856,1284856,1554,1975,1975-09-12,02:15:00,54.41015,-126.7324,bc5688,126,N,Y,Film - BW,bc5688_126,093l04712,093L07,1:8000,,B-091-H-75,153,https://openmaps.gov.bc.ca/thumbs/1975/bc5688/bc5688_126_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc5688_4.jpg,,,78132,5259,14921,19498020,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.7324, 54.41015)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1284857,1284857,1554,1975,1975-09-12,02:15:00,54.40583,-126.7298,bc5688,127,N,Y,Film - BW,bc5688_127,093l04712,093L07,1:8000,,B-091-H-75,153,https://openmaps.gov.bc.ca/thumbs/1975/bc5688/bc5688_127_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc5688_4.jpg,,,78132,5259,14921,19498021,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.7298, 54.40583)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1284858,1284858,1554,1975,1975-09-12,02:15:00,54.40152,-126.7271,bc5688,128,N,Y,Film - BW,bc5688_128,093l04712,093L07,1:8000,,B-091-H-75,153,https://openmaps.gov.bc.ca/thumbs/1975/bc5688/bc5688_128_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc5688_4.jpg,,,78132,5259,14921,19498022,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.7271, 54.40152)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1284859,1284859,1554,1975,1975-09-12,02:15:00,54.39721,-126.7244,bc5688,129,N,Y,Film - BW,bc5688_129,093l03734,093L07,1:8000,,B-091-H-75,153,https://openmaps.gov.bc.ca/thumbs/1975/bc5688/bc5688_129_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc5688_4.jpg,,,78132,5259,14921,19498023,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.7244, 54.39721)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1284880,1284880,1494,1975,1975-09-12,02:15:00,54.3857,-126.6407,bc5688,150,N,Y,Film - BW,bc5688_150,093l03744,093L07,1:8000,,B-091-H-75,153,https://openmaps.gov.bc.ca/thumbs/1975/bc5688/bc5688_150_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc5688_4.jpg,,,78134,5259,14921,19498044,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6407, 54.3857)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1284881,1284881,1494,1975,1975-09-12,02:15:00,54.38819,-126.6341,bc5688,151,N,Y,Film - BW,bc5688_151,093l03744,093L07,1:8000,,B-091-H-75,153,https://openmaps.gov.bc.ca/thumbs/1975/bc5688/bc5688_151_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc5688_4.jpg,,,78134,5259,14921,19498045,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6341, 54.38819)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1284882,1284882,1494,1975,1975-09-12,02:15:00,54.39066,-126.6276,bc5688,152,N,Y,Film - BW,bc5688_152,093l03744,093L07,1:8000,,B-091-H-75,153,https://openmaps.gov.bc.ca/thumbs/1975/bc5688/bc5688_152_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc5688_4.jpg,,,78134,5259,14921,19498046,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6276, 54.39066)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292497,1292497,5639,1975,1975-09-08,09:30:00,54.39522,-126.6598,bc7796,90,N,Y,Film - BW,bc7796_090,093l03743,093L07,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_090_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78600,5798,15107,19505025,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6598, 54.39522)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292498,1292498,5639,1975,1975-09-08,09:30:00,54.40229,-126.6468,bc7796,91,N,Y,Film - BW,bc7796_091,093l04722,093L07,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_091_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78600,5798,15107,19505026,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6468, 54.40229)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292499,1292499,5639,1975,1975-09-08,09:30:00,54.40937,-126.6338,bc7796,92,N,Y,Film - BW,bc7796_092,093l04722,093L07,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_092_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78600,5798,15107,19505027,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6338, 54.40937)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292500,1292500,5639,1975,1975-09-08,09:30:00,54.41644,-126.6208,bc7796,93,N,Y,Film - BW,bc7796_093,093l04722,093L07,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_093_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78600,5798,15107,19505028,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6208, 54.41644)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292501,1292501,5639,1975,1975-09-08,09:30:00,54.42351,-126.6078,bc7796,94,N,Y,Film - BW,bc7796_094,093l04722,093L07,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_094_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78600,5798,15107,19505029,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6078, 54.42351)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292502,1292502,5639,1975,1975-09-08,09:30:00,54.43058,-126.5948,bc7796,95,N,Y,Film - BW,bc7796_095,093l04813,093L07,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_095_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78600,5798,15107,19505030,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5948, 54.43058)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292503,1292503,5639,1975,1975-09-08,09:30:00,54.43764,-126.5817,bc7796,96,N,Y,Film - BW,bc7796_096,093l04813,093L07,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_096_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78600,5798,15107,19505031,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5817, 54.43764)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292504,1292504,5639,1975,1975-09-08,09:30:00,54.44471,-126.5687,bc7796,97,N,Y,Film - BW,bc7796_097,093l04813,093L07,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_097_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78600,5798,15107,19505032,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5687, 54.44471)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292505,1292505,5639,1975,1975-09-08,09:30:00,54.45177,-126.5557,bc7796,98,N,Y,Film - BW,bc7796_098,093l04831,093L07,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_098_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78600,5798,15107,19505033,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5557, 54.45177)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292506,1292506,5639,1975,1975-09-08,09:30:00,54.45883,-126.5426,bc7796,99,N,Y,Film - BW,bc7796_099,093l04832,093L07,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_099_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78600,5798,15107,19505034,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5426, 54.45883)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292508,1292508,5639,1975,1975-09-08,09:30:00,54.47295,-126.5165,bc7796,101,N,Y,Film - BW,bc7796_101,093l04832,093L07,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_101_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78600,5798,15107,19505036,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5165, 54.47295)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292510,1292510,5639,1975,1975-09-08,09:30:00,54.48707,-126.4904,bc7796,103,N,Y,Film - BW,bc7796_103,093l04843,093L08,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_103_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78600,5798,15107,19505038,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4904, 54.48707)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292511,1292511,5639,1975,1975-09-08,09:30:00,54.49412,-126.4773,bc7796,104,N,Y,Film - BW,bc7796_104,093l04843,093L08,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_104_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78600,5798,15107,19505039,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4773, 54.49412)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292512,1292512,5639,1975,1975-09-08,09:30:00,54.50117,-126.4643,bc7796,105,N,Y,Film - BW,bc7796_105,093l05821,093L09,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_105_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78600,5798,15107,19505040,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4643, 54.50117)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292513,1292513,5639,1975,1975-09-08,09:30:00,54.50823,-126.4512,bc7796,106,N,Y,Film - BW,bc7796_106,093l05821,093L09,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_106_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78600,5798,15107,19505041,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4512, 54.50823)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292514,1292514,5639,1975,1975-09-08,09:30:00,54.51528,-126.4381,bc7796,107,N,Y,Film - BW,bc7796_107,093l05822,093L09,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_107_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78600,5798,15107,19505042,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4381, 54.51528)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292515,1292515,5639,1975,1975-09-08,09:30:00,54.52232,-126.425,bc7796,108,N,Y,Film - BW,bc7796_108,093l05822,093L09,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_108_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78600,5798,15107,19505043,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.425, 54.52232)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292516,1292516,5639,1975,1975-09-08,09:30:00,54.52937,-126.4119,bc7796,109,N,Y,Film - BW,bc7796_109,093l05824,093L09,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_109_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78600,5798,15107,19505044,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4119, 54.52937)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292520,1292520,5639,1975,1975-09-08,09:30:00,54.52602,-126.4223,bc7796,113,N,Y,Film - BW,bc7796_113,093l05824,093L09,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_113_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78601,5798,15107,19505048,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4223, 54.52602)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292521,1292521,5639,1975,1975-09-08,09:30:00,54.52303,-126.4056,bc7796,114,N,Y,Film - BW,bc7796_114,093l05822,093L09,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_114_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78601,5798,15107,19505049,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4056, 54.52303)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292522,1292522,5639,1975,1975-09-08,09:30:00,54.52005,-126.3888,bc7796,115,N,Y,Film - BW,bc7796_115,093l05911,093L09,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_115_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78601,5798,15107,19505050,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3888, 54.52005)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292523,1292523,5639,1975,1975-09-08,09:30:00,54.51706,-126.3721,bc7796,116,N,Y,Film - BW,bc7796_116,093l05911,093L09,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_116_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78601,5798,15107,19505051,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3721, 54.51706)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292524,1292524,5639,1975,1975-09-08,09:30:00,54.51407,-126.3554,bc7796,117,N,Y,Film - BW,bc7796_117,093l05911,093L09,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_117_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78601,5798,15107,19505052,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3554, 54.51407)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292525,1292525,5639,1975,1975-09-08,09:30:00,54.51108,-126.3387,bc7796,118,N,Y,Film - BW,bc7796_118,093l05912,093L09,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_118_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78601,5798,15107,19505053,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3387, 54.51108)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292526,1292526,5639,1975,1975-09-08,09:30:00,54.50809,-126.322,bc7796,119,N,Y,Film - BW,bc7796_119,093l05912,093L09,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_119_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78601,5798,15107,19505054,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.322, 54.50809)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292527,1292527,5639,1975,1975-09-08,09:30:00,54.50509,-126.3053,bc7796,120,N,Y,Film - BW,bc7796_120,093l05912,093L09,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_120_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78601,5798,15107,19505055,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3053, 54.50509)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292529,1292529,5639,1975,1975-09-08,09:30:00,54.49909,-126.2719,bc7796,122,N,Y,Film - BW,bc7796_122,093l04943,093L08,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_122_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78601,5798,15107,19505057,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2719, 54.49909)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292533,1292533,5639,1975,1975-09-08,09:30:00,54.48765,-126.2531,bc7796,126,N,Y,Film - BW,bc7796_126,093l04943,093L08,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_126_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78602,5798,15107,19505061,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2531, 54.48765)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292534,1292534,5639,1975,1975-09-08,09:30:00,54.4819,-126.2472,bc7796,127,N,Y,Film - BW,bc7796_127,093l04944,093L08,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_127_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78602,5798,15107,19505062,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2472, 54.4819)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292535,1292535,5639,1975,1975-09-08,09:30:00,54.47614,-126.2414,bc7796,128,N,Y,Film - BW,bc7796_128,093l04944,093L08,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_128_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78602,5798,15107,19505063,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2414, 54.47614)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292536,1292536,5639,1975,1975-09-08,09:30:00,54.47039,-126.2355,bc7796,129,N,Y,Film - BW,bc7796_129,093l04942,093L08,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_129_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78602,5798,15107,19505064,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2355, 54.47039)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292539,1292539,5639,1975,1975-09-08,09:30:00,54.45313,-126.2179,bc7796,132,N,Y,Film - BW,bc7796_132,093l04942,093L08,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_132_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78602,5798,15107,19505067,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2179, 54.45313)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292540,1292540,5639,1975,1975-09-08,09:30:00,54.44737,-126.212,bc7796,133,N,Y,Film - BW,bc7796_133,093l04924,093L08,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_133_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78602,5798,15107,19505068,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.212, 54.44737)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292541,1292541,5639,1975,1975-09-08,09:30:00,54.44162,-126.2061,bc7796,134,N,Y,Film - BW,bc7796_134,093l04924,093L08,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_134_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78602,5798,15107,19505069,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2061, 54.44162)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292542,1292542,5639,1975,1975-09-08,09:30:00,54.43586,-126.2002,bc7796,135,N,Y,Film - BW,bc7796_135,093l04924,093L08,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_135_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78602,5798,15107,19505070,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2002, 54.43586)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292543,1292543,5639,1975,1975-09-08,09:30:00,54.44292,-126.2144,bc7796,136,N,Y,Film - BW,bc7796_136,093l04924,093L08,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_136_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78603,5798,15107,19505071,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2144, 54.44292)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292544,1292544,5639,1975,1975-09-08,09:30:00,54.4385,-126.1945,bc7796,137,N,Y,Film - BW,bc7796_137,093l05013,093L08,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_137_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78603,5798,15107,19505072,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1945, 54.4385)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292549,1292549,5639,1975,1975-09-08,09:30:00,54.41675,-126.0959,bc7796,142,N,Y,Film - BW,bc7796_142,093l05021,093L08,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_142_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78603,5798,15107,19505077,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.0959, 54.41675)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292550,1292550,5639,1975,1975-09-08,09:30:00,54.41239,-126.0762,bc7796,143,N,Y,Film - BW,bc7796_143,093l05021,093L08,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_143_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78603,5798,15107,19505078,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.0762, 54.41239)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292551,1292551,5639,1975,1975-09-08,09:30:00,54.40802,-126.0565,bc7796,144,N,Y,Film - BW,bc7796_144,093l05021,093L08,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_144_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78603,5798,15107,19505079,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.0565, 54.40802)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1292552,1292552,5639,1975,1975-09-08,09:30:00,54.40366,-126.0369,bc7796,145,N,Y,Film - BW,bc7796_145,093l05022,093L08,1:15000,,B-349-MA-75,305,https://openmaps.gov.bc.ca/thumbs/1975/bc7796/bc7796_145_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc7795_7796_3.jpg,,,78603,5798,15107,19505080,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.0369, 54.40366)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1293657,1293657,3200,1975,1975-06-19,02:30:00,54.40309,-126.715,bc5671,85,N,Y,Film - BW,bc5671_085,093l04712,093L07,1:15000,,B-038-MA-75,153,https://openmaps.gov.bc.ca/thumbs/1975/bc5671/bc5671_085_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc5671_1.jpg,,,78667,4282,14857,19505924,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.715, 54.40309)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1293658,1293658,3200,1975,1975-06-19,02:30:00,54.39259,-126.7089,bc5671,86,N,Y,Film - BW,bc5671_086,093l03734,093L07,1:15000,,B-038-MA-75,153,https://openmaps.gov.bc.ca/thumbs/1975/bc5671/bc5671_086_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1975/roll_pages/bc5671_1.jpg,,,78667,4282,14857,19505925,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.7089, 54.39259)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1340021,1340021,2438,1974,1974-08-13,09:25:00,54.3978,-126.7292,bc5606,3,N,Y,Film - BW,bc5606_003,093l03734,093L07,1:12000,,B-184-H-74,153,https://openmaps.gov.bc.ca/thumbs/1974/bc5606/bc5606_003_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1974/roll_pages/bc5606_1.jpg,,,80022,4714,11511,19538799,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.7292, 54.3978)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1340022,1340022,2438,1974,1974-08-13,09:25:00,54.40148,-126.7155,bc5606,4,N,Y,Film - BW,bc5606_004,093l04712,093L07,1:12000,,B-184-H-74,153,https://openmaps.gov.bc.ca/thumbs/1974/bc5606/bc5606_004_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1974/roll_pages/bc5606_1.jpg,,,80022,4714,11511,19538800,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.7155, 54.40148)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1340030,1340030,2438,1974,1974-08-13,09:25:00,54.43085,-126.6057,bc5606,12,N,Y,Film - BW,bc5606_012,093l04724,093L07,1:12000,,B-184-H-74,153,https://openmaps.gov.bc.ca/thumbs/1974/bc5606/bc5606_012_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1974/roll_pages/bc5606_1.jpg,,,80022,4714,11511,19538808,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6057, 54.43085)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1340031,1340031,2438,1974,1974-08-13,09:25:00,54.43452,-126.5919,bc5606,13,N,Y,Film - BW,bc5606_013,093l04813,093L07,1:12000,,B-184-H-74,153,https://openmaps.gov.bc.ca/thumbs/1974/bc5606/bc5606_013_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1974/roll_pages/bc5606_1.jpg,,,80022,4714,11511,19538809,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5919, 54.43452)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1340032,1340032,2438,1974,1974-08-13,09:25:00,54.43823,-126.5782,bc5606,14,N,Y,Film - BW,bc5606_014,093l04813,093L07,1:12000,,B-184-H-74,153,https://openmaps.gov.bc.ca/thumbs/1974/bc5606/bc5606_014_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1974/roll_pages/bc5606_1.jpg,,,80022,4714,11511,19538810,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5782, 54.43823)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1340037,1340037,2438,1974,1974-08-13,09:25:00,54.40607,-126.6234,bc5606,19,N,Y,Film - BW,bc5606_019,093l04722,093L07,1:12000,,B-184-H-74,153,https://openmaps.gov.bc.ca/thumbs/1974/bc5606/bc5606_019_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1974/roll_pages/bc5606_1.jpg,,,80023,4714,11511,19538815,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6234, 54.40607)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1340038,1340038,2438,1974,1974-08-13,09:25:00,54.40268,-126.6363,bc5606,20,N,Y,Film - BW,bc5606_020,093l04722,093L07,1:12000,,B-184-H-74,153,https://openmaps.gov.bc.ca/thumbs/1974/bc5606/bc5606_020_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1974/roll_pages/bc5606_1.jpg,,,80023,4714,11511,19538816,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6363, 54.40268)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1340039,1340039,2438,1974,1974-08-13,09:25:00,54.3993,-126.6493,bc5606,21,N,Y,Film - BW,bc5606_021,093l03744,093L07,1:12000,,B-184-H-74,153,https://openmaps.gov.bc.ca/thumbs/1974/bc5606/bc5606_021_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1974/roll_pages/bc5606_1.jpg,,,80023,4714,11511,19538817,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6493, 54.3993)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1340040,1340040,2438,1974,1974-08-13,09:25:00,54.3959,-126.6622,bc5606,22,N,Y,Film - BW,bc5606_022,093l03743,093L07,1:12000,,B-184-H-74,153,https://openmaps.gov.bc.ca/thumbs/1974/bc5606/bc5606_022_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1974/roll_pages/bc5606_1.jpg,,,80023,4714,11511,19538818,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6622, 54.3959)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1340041,1340041,2438,1974,1974-08-13,09:25:00,54.39252,-126.6752,bc5606,23,N,Y,Film - BW,bc5606_023,093l03743,093L07,1:12000,,B-184-H-74,153,https://openmaps.gov.bc.ca/thumbs/1974/bc5606/bc5606_023_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1974/roll_pages/bc5606_1.jpg,,,80023,4714,11511,19538819,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6752, 54.39252)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1340042,1340042,2438,1974,1974-08-13,09:25:00,54.38912,-126.6881,bc5606,24,N,Y,Film - BW,bc5606_024,093l03743,093L07,1:12000,,B-184-H-74,153,https://openmaps.gov.bc.ca/thumbs/1974/bc5606/bc5606_024_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1974/roll_pages/bc5606_1.jpg,,,80023,4714,11511,19538820,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6881, 54.38912)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1340043,1340043,2438,1974,1974-08-13,09:25:00,54.38573,-126.7011,bc5606,25,N,Y,Film - BW,bc5606_025,093l03734,093L07,1:12000,,B-184-H-74,153,https://openmaps.gov.bc.ca/thumbs/1974/bc5606/bc5606_025_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1974/roll_pages/bc5606_1.jpg,,,80023,4714,11511,19538821,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.7011, 54.38573)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1340058,1340058,2438,1974,1974-08-13,09:25:00,54.38177,-126.6459,bc5606,40,N,Y,Film - BW,bc5606_040,093l03744,093L07,1:12000,,B-184-H-74,153,https://openmaps.gov.bc.ca/thumbs/1974/bc5606/bc5606_040_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1974/roll_pages/bc5606_1.jpg,,,80024,4714,11511,19538836,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6459, 54.38177)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1340059,1340059,2438,1974,1974-08-13,09:25:00,54.38531,-126.6331,bc5606,41,N,Y,Film - BW,bc5606_041,093l03744,093L07,1:12000,,B-184-H-74,153,https://openmaps.gov.bc.ca/thumbs/1974/bc5606/bc5606_041_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1974/roll_pages/bc5606_1.jpg,,,80024,4714,11511,19538837,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6331, 54.38531)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1400195,1400195,6096,1971,1971-07-17,11:15:00,54.49822,-126.4772,bc7325,145,N,Y,Film - BW,bc7325_145,093l04843,093L08,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7325/bc7325_145_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7325_7326_3.jpg,,,81881,5519,12689,19593545,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4772, 54.49822)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1400354,1400354,6096,1971,1971-07-17,11:15:00,54.47487,-126.5049,bc7326,20,N,Y,Film - BW,bc7326_020,093l04832,093L07,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7326/bc7326_020_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7325_7326_3.jpg,,,81883,5519,12690,19593704,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5049, 54.47487)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1400355,1400355,6096,1971,1971-07-17,11:15:00,54.47483,-126.4824,bc7326,21,N,Y,Film - BW,bc7326_021,093l04841,093L08,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7326/bc7326_021_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7325_7326_3.jpg,,,81883,5519,12690,19593705,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4824, 54.47483)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1400363,1400363,6096,1971,1971-07-17,11:15:00,54.45538,-126.5134,bc7326,29,N,Y,Film - BW,bc7326_029,093l04832,093L07,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7326/bc7326_029_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7325_7326_3.jpg,,,81884,5519,12690,19593713,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5134, 54.45538)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1400364,1400364,6096,1971,1971-07-17,11:15:00,54.45537,-126.534,bc7326,30,N,Y,Film - BW,bc7326_030,093l04832,093L07,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7326/bc7326_030_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7325_7326_3.jpg,,,81884,5519,12690,19593714,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.534, 54.45537)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1400365,1400365,6096,1971,1971-07-17,11:15:00,54.45535,-126.5547,bc7326,31,N,Y,Film - BW,bc7326_031,093l04831,093L07,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7326/bc7326_031_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7325_7326_3.jpg,,,81884,5519,12690,19593715,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5547, 54.45535)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1400519,1400519,6096,1971,1971-07-17,11:15:00,54.43322,-126.6126,bc7326,185,N,Y,Film - BW,bc7326_185,093l04724,093L07,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7326/bc7326_185_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7325_7326_3.jpg,,,81885,5519,12690,19593869,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6126, 54.43322)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1400520,1400520,6096,1971,1971-07-17,11:15:00,54.4333,-126.5914,bc7326,186,N,Y,Film - BW,bc7326_186,093l04813,093L07,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7326/bc7326_186_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7325_7326_3.jpg,,,81885,5519,12690,19593870,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5914, 54.4333)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1400544,1400544,6096,1971,1971-07-17,11:15:00,54.4121,-126.6065,bc7326,210,N,Y,Film - BW,bc7326_210,093l04722,093L07,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7326/bc7326_210_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7325_7326_3.jpg,,,81886,5519,12690,19593894,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6065, 54.4121)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1400545,1400545,6096,1971,1971-07-17,11:15:00,54.4121,-126.6278,bc7326,211,N,Y,Film - BW,bc7326_211,093l04722,093L07,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7326/bc7326_211_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7325_7326_3.jpg,,,81886,5519,12690,19593895,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6278, 54.4121)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1400550,1400550,6096,1971,1971-07-17,11:15:00,54.41204,-126.7347,bc7326,216,N,Y,Film - BW,bc7326_216,093l04712,093L07,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7326/bc7326_216_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7325_7326_3.jpg,,,81886,5519,12690,19593900,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.7347, 54.41204)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1401137,1401137,6096,1971,1971-07-17,01:23:00,54.38977,-126.699,bc7333,71,N,Y,Film - BW,bc7333_071,093l03743,093L07,1:15840,,B-003-FSR-71,305,,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7333_7334_1.jpg,,,81897,5519,12699,19594487,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.699, 54.38977)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1401138,1401138,6096,1971,1971-07-17,01:23:00,54.38975,-126.6781,bc7333,72,N,Y,Film - BW,bc7333_072,093l03743,093L07,1:15840,,B-003-FSR-71,305,,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7333_7334_1.jpg,,,81897,5519,12699,19594488,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6781, 54.38975)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1401140,1401140,6096,1971,1971-07-17,01:23:00,54.38969,-126.6363,bc7333,74,N,Y,Film - BW,bc7333_074,093l03744,093L07,1:15840,,B-003-FSR-71,305,,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7333_7334_1.jpg,,,81897,5519,12699,19594490,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6363, 54.38969)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1401171,1401171,6096,1971,1971-07-17,01:23:00,54.36874,-126.6293,bc7333,105,N,Y,Film - BW,bc7333_105,093l03742,093L07,1:15840,,B-003-FSR-71,305,,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7333_7334_1.jpg,,,81898,5519,12699,19594521,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6293, 54.36874)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1401319,1401319,6096,1971,1971-07-17,01:23:00,54.3461,-126.6155,bc7333,253,N,Y,Film - BW,bc7333_253,093l03724,093L07,1:15840,,B-003-FSR-71,305,,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7333_7334_1.jpg,,,81899,5519,12699,19594669,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6155, 54.3461)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1401591,1401591,6096,1971,1971-07-26,01:50:00,54.32501,-126.6276,bc7359,181,N,Y,Film - BW,bc7359_181,093l03724,093L07,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7359/bc7359_181_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7359_7360_3.jpg,,,81907,5519,12737,19594937,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6276, 54.32501)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1401626,1401626,6096,1971,1971-07-26,01:50:00,54.30301,-126.6332,bc7359,216,N,Y,Film - BW,bc7359_216,093l03722,093L07,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7359/bc7359_216_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7359_7360_3.jpg,,,81908,5519,12737,19594972,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6332, 54.30301)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1401627,1401627,6096,1971,1971-07-26,01:50:00,54.30304,-126.654,bc7359,217,N,Y,Film - BW,bc7359_217,093l03721,093L07,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7359/bc7359_217_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7359_7360_3.jpg,,,81908,5519,12737,19594973,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.654, 54.30304)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1401764,1401764,6096,1971,1971-07-26,01:59:00,54.2819,-126.6356,bc7360,70,N,Y,Film - BW,bc7360_070,093l02744,093L07,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7360/bc7360_070_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7359_7360_3.jpg,,,81909,5519,12738,19595110,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6356, 54.2819)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1401803,1401803,6096,1971,1971-07-26,01:59:00,54.25986,-126.6267,bc7360,109,N,Y,Film - BW,bc7360_109,093l02742,093L07,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7360/bc7360_109_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7359_7360_3.jpg,,,81910,5519,12738,19595149,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6267, 54.25986)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1402206,1402206,6096,1971,1971-07-27,09:20:00,54.19444,-126.4133,bc7362,104,N,Y,Film - BW,bc7362_104,093l01844,093L01,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7362/bc7362_104_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7361_7362_1.jpg,,,81917,5519,12741,19595552,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4133, 54.19444)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1402210,1402210,6096,1971,1971-07-27,09:20:00,54.19481,-126.4939,bc7362,108,N,Y,Film - BW,bc7362_108,093l01843,093L01,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7362/bc7362_108_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7361_7362_1.jpg,,,81917,5519,12741,19595556,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4939, 54.19481)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1402212,1402212,6096,1971,1971-07-27,09:20:00,54.19497,-126.5342,bc7362,110,N,Y,Film - BW,bc7362_110,093l01834,093L02,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7362/bc7362_110_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7361_7362_1.jpg,,,81917,5519,12741,19595558,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5342, 54.19497)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1402213,1402213,6096,1971,1971-07-27,09:20:00,54.19505,-126.5543,bc7362,111,N,Y,Film - BW,bc7362_111,093l01833,093L02,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7362/bc7362_111_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7361_7362_1.jpg,,,81917,5519,12741,19595559,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5543, 54.19505)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1402214,1402214,6096,1971,1971-07-27,09:20:00,54.19513,-126.5745,bc7362,112,N,Y,Film - BW,bc7362_112,093l01833,093L02,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7362/bc7362_112_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7361_7362_1.jpg,,,81917,5519,12741,19595560,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5745, 54.19513)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1402343,1402343,6096,1971,1971-07-27,09:20:00,54.21645,-126.5998,bc7362,241,N,Y,Film - BW,bc7362_241,093l02811,093L02,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7362/bc7362_241_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7361_7362_1.jpg,,,81918,5519,12741,19595689,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5998, 54.21645)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1402344,1402344,6096,1971,1971-07-27,09:20:00,54.2164,-126.5753,bc7362,242,N,Y,Film - BW,bc7362_242,093l02811,093L02,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7362/bc7362_242_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7361_7362_1.jpg,,,81918,5519,12741,19595690,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5753, 54.2164)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1402350,1402350,6096,1971,1971-07-27,09:20:00,54.21599,-126.4283,bc7362,248,N,Y,Film - BW,bc7362_248,093l02822,093L01,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7362/bc7362_248_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7361_7362_1.jpg,,,81918,5519,12741,19595696,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4283, 54.21599)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1402368,1402368,6096,1971,1971-07-27,09:20:00,54.23772,-126.622,bc7362,266,N,Y,Film - BW,bc7362_266,093l02724,093L02,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7362/bc7362_266_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7361_7362_1.jpg,,,81919,5519,12741,19595714,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.622, 54.23772)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1402369,1402369,6096,1971,1971-07-27,09:20:00,54.23778,-126.6417,bc7362,267,N,Y,Film - BW,bc7362_267,093l02724,093L02,1:15840,,B-003-FSR-71,305,https://openmaps.gov.bc.ca/thumbs/1971/bc7362/bc7362_267_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc7361_7362_1.jpg,,,81919,5519,12741,19595715,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6417, 54.23778)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414100,1414100,6096,1971,1971-08-30,10:55:00,54.49591,-126.3128,bc5440,80,N,Y,Film - BW,bc5440_080,093l04934,093L08,1:31680,,B-113-DF-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5440/bc5440_080_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5440_2.jpg,,,82117,5497,12643,19607443,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3128, 54.49591)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414102,1414102,6096,1971,1971-08-30,10:55:00,54.54044,-126.3142,bc5440,82,N,Y,Film - BW,bc5440_082,093l05914,093L09,1:31680,,B-113-DF-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5440/bc5440_082_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5440_2.jpg,,,82117,5497,12643,19607445,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.3142, 54.54044)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414113,1414113,6096,1971,1971-08-30,10:55:00,54.52017,-126.4028,bc5440,93,N,Y,Film - BW,bc5440_093,093l05822,093L09,1:31680,,B-113-DF-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5440/bc5440_093_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5440_2.jpg,,,82118,5497,12643,19607456,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4028, 54.52017)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414127,1414127,6096,1971,1971-08-30,10:55:00,54.19752,-126.4051,bc5440,107,N,Y,Film - BW,bc5440_107,093l01844,093L01,1:31680,,B-113-DF-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5440/bc5440_107_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5440_2.jpg,,,82118,5497,12643,19607470,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4051, 54.19752)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414157,1414157,6096,1971,1971-08-30,10:55:00,54.50693,-126.4708,bc5440,149,N,Y,Film - BW,bc5440_149,093l05821,093L09,1:31680,,B-113-DF-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5440/bc5440_149_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5440_2.jpg,,,82119,5497,12643,19607500,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4708, 54.50693)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414158,1414158,6096,1971,1971-08-30,10:55:00,54.53055,-126.4708,bc5440,150,N,Y,Film - BW,bc5440_150,093l05823,093L09,1:31680,,B-113-DF-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5440/bc5440_150_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5440_2.jpg,,,82119,5497,12643,19607501,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.4708, 54.53055)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414171,1414171,6096,1971,1971-08-30,10:55:00,54.45766,-126.5431,bc5440,163,N,Y,Film - BW,bc5440_163,093l04832,093L07,1:31680,,B-113-DF-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5440/bc5440_163_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5440_2.jpg,,,82120,5497,12643,19607514,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.5431, 54.45766)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414186,1414186,6096,1971,1971-08-30,10:55:00,54.2285,-126.6218,bc5440,178,N,Y,Film - BW,bc5440_178,093l02724,093L02,1:31680,,B-113-DF-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5440/bc5440_178_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5440_2.jpg,,,82121,5497,12643,19607529,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6218, 54.2285)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414190,1414190,6096,1971,1971-08-30,10:55:00,54.32924,-126.6211,bc5440,182,N,Y,Film - BW,bc5440_182,093l03724,093L07,1:31680,,B-113-DF-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5440/bc5440_182_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5440_2.jpg,,,82121,5497,12643,19607533,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6211, 54.32924)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414191,1414191,6096,1971,1971-08-30,10:55:00,54.35443,-126.6209,bc5440,183,N,Y,Film - BW,bc5440_183,093l03742,093L07,1:31680,,B-113-DF-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5440/bc5440_183_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5440_2.jpg,,,82121,5497,12643,19607534,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6209, 54.35443)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414193,1414193,6096,1971,1971-08-30,10:55:00,54.4048,-126.6205,bc5440,185,N,Y,Film - BW,bc5440_185,093l04722,093L07,1:31680,,B-113-DF-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5440/bc5440_185_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5440_2.jpg,,,82121,5497,12643,19607536,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.6205, 54.4048)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414326,1414326,6096,1971,1971-06-05,09:05:00,54.28162,-126.0924,bc5420,71,N,Y,Film - BW,bc5420_071,093l03043,093L08,1:31680,,B-122-LI-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5420/bc5420_071_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5420_1.jpg,,,82127,5464,12582,19607669,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.0924, 54.28162)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414327,1414327,6096,1971,1971-06-05,09:05:00,54.30877,-126.0924,bc5420,72,N,Y,Film - BW,bc5420_072,093l04021,093L08,1:31680,,B-122-LI-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5420/bc5420_072_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5420_1.jpg,,,82127,5464,12582,19607670,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.0924, 54.30877)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414331,1414331,6096,1971,1971-06-05,09:05:00,54.41735,-126.0925,bc5420,76,N,Y,Film - BW,bc5420_076,093l05021,093L08,1:31680,,B-122-LI-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5420/bc5420_076_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5420_1.jpg,,,82127,5464,12582,19607674,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.0925, 54.41735)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414349,1414349,6096,1971,1971-06-05,09:05:00,54.39285,-126.1686,bc5420,94,N,Y,Film - BW,bc5420_094,093l04033,093L08,1:31680,,B-122-LI-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5420/bc5420_094_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5420_1.jpg,,,82128,5464,12582,19607692,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1686, 54.39285)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414350,1414350,6096,1971,1971-06-05,09:05:00,54.3676,-126.1682,bc5420,95,N,Y,Film - BW,bc5420_095,093l04031,093L08,1:31680,,B-122-LI-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5420/bc5420_095_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5420_1.jpg,,,82128,5464,12582,19607693,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1682, 54.3676)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414351,1414351,6096,1971,1971-06-05,09:05:00,54.34234,-126.1679,bc5420,96,N,Y,Film - BW,bc5420_096,093l04013,093L08,1:31680,,B-122-LI-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5420/bc5420_096_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5420_1.jpg,,,82128,5464,12582,19607694,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.1679, 54.34234)" -WHSE_IMAGERY_AND_BASE_MAPS.AIMG_PHOTO_CENTROIDS_SP.1414383,1414383,6096,1971,1971-06-05,09:05:00,54.4787,-126.2499,bc5420,160,N,Y,Film - BW,bc5420_160,093l04944,093L08,1:31680,,B-122-LI-71,153,https://openmaps.gov.bc.ca/thumbs/1971/bc5420/bc5420_160_thumb.jpg,https://openmaps.gov.bc.ca/thumbs/logbooks/1971/roll_pages/bc5420_1.jpg,,,82129,5464,12582,19607726,,231944.69,400.431358.585806,CUT,400.431358,"c(-126.2499, 54.4787)" diff --git a/posts/2024-11-15-bcdata-ortho-historic/fig/Screenshot1.png b/posts/2024-11-15-bcdata-ortho-historic/fig/Screenshot1.png index ee9a057..ce1078a 100644 Binary files a/posts/2024-11-15-bcdata-ortho-historic/fig/Screenshot1.png and b/posts/2024-11-15-bcdata-ortho-historic/fig/Screenshot1.png differ diff --git a/posts/2024-11-15-bcdata-ortho-historic/index.qmd b/posts/2024-11-15-bcdata-ortho-historic/index.qmd index 8b7c788..622f7e2 100644 --- a/posts/2024-11-15-bcdata-ortho-historic/index.qmd +++ b/posts/2024-11-15-bcdata-ortho-historic/index.qmd @@ -3,7 +3,7 @@ title: "Getting details of historic orthophoto imagery with R" author: "al" date: "2024-11-15" date-modified: "2024-11-17" -categories: [fwapg, r, bcdata] +categories: [fwapg, r, bcdata, imagery, api] image: "image.jpg" params: repo_owner: "NewGraphEnvironment" @@ -28,6 +28,7 @@ suppressMessages(library(tidyverse)) library(ggplot2) library(bcdata) library(fwapgr) +library(knitr) suppressMessages(library(sf)) # library(leaflet) # library(leafem) @@ -128,7 +129,7 @@ lburn_sf( Next we grab a few key layers from the BC Data Catalougue API using convience functions in our `rfp` package ("Reproducable Field Products") which wrap the provincially maintained `bcdata` package. We grab: - Railways - - Streams in the Bulkley Watershed group that are 5th order or greater. + - Streams in the Bulkley Watershed group that are 4th order or greater. - [Historic Imagery Points](https://catalogue.data.gov.bc.ca/dataset/airborne-imagery-historical-index-map-points) - [Historic Imagery Polygons](https://catalogue.data.gov.bc.ca/dataset/airborne-imagery-historical-index-map-polygons) - [NTS 1:50,000 Grid](https://catalogue.data.gov.bc.ca/) (we will see why in a second) @@ -156,7 +157,7 @@ l_streams <- rfp::rfp_bcd_get_data( ) |> sf::st_transform(4326) |> janitor::clean_names() |> - dplyr::filter(stream_order > 4) + dplyr::filter(stream_order >= 4) # historic orthophotos # WHSE_IMAGERY_AND_BASE_MAPS.AIMG_HIST_INDEX_MAPS_POLY @@ -263,23 +264,9 @@ layers_trimmed <- layers_to_load |> ) ``` -OK, seems we cannot get machine readable historical air photo information from the downloaded from the BC data catalogue [Historic Imagery Points](https://catalogue.data.gov.bc.ca/dataset/airborne-imagery-historical-index-map-points) - and [Historic Imagery Polygons](https://catalogue.data.gov.bc.ca/dataset/airborne-imagery-historical-index-map-polygons) layers perhpas because the majority of the photos are not georeferenced? What we see in the map under the table below (red dot on map) is one point which contains 8 records including links to pdfs and kmls which are basically a georeferenced drawing of where the imagery overlaps. From as far as I can tell - if we wanted to try to use these kmls or pdfs to select orthoimagery we would need to manually eyeball where the photo polygons overlap where we want to see imagery for and manually write down identifiers for photo by hand. Maybe I am missing something but it sure seems that way. - - -```{r tab-imagery-points, eval=TRUE} - -#This what the information in the [Historic Imagery Points](https://catalogue.data.gov.bc.ca/dataset/airborne-imagery-historical-index-map-points) layer looks like. - -layers_trimmed$l_imagery_hist |> - sf::st_drop_geometry() |> - knitr::kable() - -``` - - +OK, seems we cannot get machine readable historical air photo information from the downloaded from the BC data catalogue [Historic Imagery Points](https://catalogue.data.gov.bc.ca/dataset/airborne-imagery-historical-index-map-points) layer perhaps because the majority of the photos are not georeferenced? What we see in the map and table below (red dot on map) is one point which contains 8 records including links to pdfs and kmls which are basically a georeferenced drawing of where the imagery overlaps (@fig-1). From as far as I can tell - if we wanted to try to use the kmls or pdfs linked in the attribute tables of the "Historic Imagery Points" layer to select orthoimagery we would need to eyeball where the photo polygons overlap where we want to see imagery for and manually write down identifiers for photo by hand. Maybe I am missing something but it sure seems that way. -```{r} +```{r map1} map <- ggplot() + geom_sf( data = layers_trimmed$aoi, @@ -292,15 +279,18 @@ map <- ggplot() + color = "blue", size = 1 ) + + geom_sf_text( + data = layers_trimmed$l_streams |> dplyr::distinct(gnis_name, .keep_all = TRUE), + aes( + label = gnis_name + ), + size = 2 # Adjust size of the text labels as needed + ) + geom_sf( data = layers_trimmed$l_rail, color = "black", size = 1 ) + - # geom_sf( - # data = layers_trimmed$l_imagery, - # alpha = 0, - # ) + geom_sf( data = layers_trimmed$l_imagery_hist, color = "red", @@ -315,31 +305,25 @@ map <- ggplot() + aes(label = map_tile), size = 3 # Adjust size of the text labels as needed ) - # ggdark::dark_theme_void() - map ``` -It does however seem that the [Air Photo Centroids](https://catalogue.data.gov.bc.ca/dataset/airphoto-centroids) are georeferenced - +```{r tab-imagery-points, eval=TRUE} -```{r} -#if we go through the online interface, we can use a NTS 1:50,000 map sheet to export a CSV file that does contain information about individual air photo locations (centre coordinate?). Our study area is huge so to begin with we can look at the area from somewhere around the confluence of McQuarie Creek and the Neexdzii Kwah up to say the upstream end of Bulkley Lake. For this area we just have two 1:50,000 map sheets (`093L09` and `093L08`). -``` +#This what the information in the [Historic Imagery Points](https://catalogue.data.gov.bc.ca/dataset/airborne-imagery-historical-index-map-points) layer looks like. -```{r fig1, eval=FALSE} +layers_trimmed$l_imagery_hist |> + sf::st_drop_geometry() |> + knitr::kable() -# ## Download Photo Information +``` + +
-# Next, we go into the provincial [WIMSI](https://www2.gov.bc.ca/gov/content/data/geographic-data-services/digital-imagery/air-photos) service and for each NTS 1:50,000 grid - we state the date range we would like to search and export. Thinking we may be able to hit the API directly with a query in the future which would eliminate the painful point and click portion of this workflow. For now though - we are doing this piece manually and chose the following options: -# -# - `Years from`: 1950 to 2024 -# - `Media`: All -# - `Only show georeferenced images`: - No -# -# Running these options exports a csv for each query. We saved them in this repo with their original sane names `airphotos.{mapsheet}.csv`. +```{r fig-1, fig.cap=my_caption, eval=TRUE} +my_caption <- "Screenshot of kml downloaded from link provided in Historic Imagery Points." knitr::include_graphics(fs::path( path_post, "fig", @@ -350,6 +334,23 @@ knitr::include_graphics(fs::path( ``` + + +
+ +For the [Historic Imagery Polygons](https://catalogue.data.gov.bc.ca/dataset/airborne-imagery-historical-index-map-polygons) layer the range of `year_operational` is `r range(layers_trimmed$l_imagery$year_operational)`. This is not as far back as we would prefer to be looking. + + +
+ +It does however seem that each of the [Air Photo Centroids](https://catalogue.data.gov.bc.ca/dataset/airphoto-centroids) are georeferenced with a date range of: + + +```{r} +range(layers_trimmed$l_photo_centroids$photo_date) +``` + + ```{r ld-csv, eval = FALSE} # At this point we have downloaded two csvs (one for each NTS 1:50,000 mapsheet of course) with information about the airphotos including UTM coordinates that we will assume for now are the photo centres. In our next steps we read in what we have, turn into spatial object, trim to overall study area and plot. @@ -386,18 +387,7 @@ map + data = layers_trimmed$l_photo_centroids, alpha = 0.25 ) - # geom_sf_text( - # data = photos_aoi, - # aes( - # label = - # paste( - # # roll_frame_series, - # frame, - # sep = "-" - # ) - # ), - # size = 2 # Adjust size of the text labels as needed - # ) + ``` That is a lot of photos! `r nrow(layers_trimmed$l_photo_centroids)` photos to be exact!!! @@ -411,14 +401,14 @@ q_drm_other <- 5000 ``` ## Clip Photo Information with Streams Buffers -Here are our query parameters to narrow down the area within our selected mapsheets in which we want to find photos for: +Here are our query parameters to narrow down the area within our study are watershed in which we want to find photos for: - Buffer: `r q_buffer`m - size of buffer used on either side of stream lines selected - Stream segments: + Bulkley River (`gnis_name` in the stream layer) + Maxan Creek + Buck Creek - + stream segments which begin before `r q_drm_other` from the mainstem + + for each remaining stream - segments of that stream which begin before `r q_drm_other`m from the downstream system @@ -436,12 +426,13 @@ knitr::include_graphics(fs::path( ```{r aoi-refine} +r_streams <- c("Maxan Creek", "Buck Creek") aoi_refined_raw <- layers_trimmed$l_streams |> # removed & downstream_route_measure < q_drm_main for bulkley as doestn't cahnge 1960s query and increases beyond just by 5 photos dplyr::filter(gnis_name == "Bulkley River"| gnis_name != "Bulkley River" & downstream_route_measure < q_drm_other | - gnis_name %in% c("Maxan Creek", "Buck Creek")) |> + gnis_name %in% r_streams) |> # dplyr::arrange(downstream_route_measure) |> # calculate when we get to length_m by adding up the length_metre field and filtering out everything up to length_m # dplyr::filter(cumsum(length_metre) <= length_m) |> @@ -476,68 +467,110 @@ map + ) ``` +That is not as many photos - but still quite a few (`r nrow(photos_aoi_refined)`). The table below can be used to filter these photos from any time and/or mapsheet and export the result to csv or excel file. + +```{r tab1} +photos_aoi_refined |> + my_dt_table(cols_freeze_left = 2) +``` + ## Filter Photos by Date -Now lets filter by date to see what our options are including the earliest photos possible. Here is our range to choose from: +Now lets map by year to see what our options are including the earliest photos possible. Here is our range to choose from: ```{r date-range} range(photos_aoi_refined$photo_date) ``` -```{r date-param} -q_date_end1 <- "1969-12-31" -q_date_start1 <- "1970-01-01" -q_date_end2 <- "1975-12-31" +` + +```{r map4} +map + +geom_sf( + data = photos_aoi_refined |> dplyr::filter(photo_year <= "1975") + ) + + facet_wrap(~ photo_year) + ``` -There is lots going on here so we will map a comparison of a couple of options. First we will look at all photos available for before 1970 (red dots on map below). We will also see what photos we have for between `r q_date_start1` and on or before `r q_date_end2` (blue dots on map below)? +Well - looks like we get really good coverage of the Bulkley River mainstem in 1968 then much better coverage of the Buck Creek drainage and Maxan Creek in 1971. For 1975 - the coverage of the Bulkley mainstem and Maxan Creek is pretty good... + +
+ +Thinking the ideal thing to do is to grab the photos from: + + - 1968 all + - 1971 for the Buck Creek and Maxan Creek areas only + - 1975 Maxan Creek only + +
+ +```{r refine-year-streams} +# spatially represent just Buck and Maxan, buffer and clip the 1971 photos +# "r_" is for "refine" +r_year1 <- "1968" +r_year2 <- "1971" +r_year3 <- "1975" + +r_streams2 <- c("Maxan Creek") + +l_streams_refined1 <- layers_trimmed$l_streams |> + # we defined r_streams in chunk way above + dplyr::filter(gnis_name %in% r_streams) |> + sf::st_union() |> + # we need to run st_sf or we get a sp object in a list... + sf::st_sf() + +aoi_refined_buffered2 <- sf::st_buffer( + l_streams_refined1, + q_buffer, endCapStyle = "FLAT" +) + +l_streams_refined2 <- layers_trimmed$l_streams |> + # we defined r_streams in chunk way above + dplyr::filter(gnis_name %in% r_streams2) |> + sf::st_union() |> + # we need to run st_sf or we get a sp object in a list... + sf::st_sf() + +aoi_refined_buffered3 <- sf::st_buffer( + l_streams_refined2, + q_buffer, endCapStyle = "FLAT" +) -```{r photos-filter} +# filter first year photos1 <- photos_aoi_refined |> dplyr::filter( - photo_date <= q_date_end1 + photo_year == r_year1 ) -photos2 <- photos_aoi_refined |> - dplyr::filter( - photo_date >= q_date_start1 & - photo_date <= q_date_end2 +# filter second year using just the streams we want to include +photos2 <- sf::st_intersection( + layers_trimmed$l_photo_centroids |> dplyr::filter(photo_year == r_year2), + aoi_refined_buffered2 ) -``` +# filter second year using just the streams we want to include +photos3 <- sf::st_intersection( + layers_trimmed$l_photo_centroids |> dplyr::filter(photo_year == r_year3), + aoi_refined_buffered3 + ) -```{r map4} -map + - geom_sf( - data = photos1, - color = "red", - alpha = 0.25, - ) - -map + - geom_sf( - data = photos2, - color = "blue", - alpha = 0.25, - ) +photos_all <- dplyr::bind_rows(photos1, photos2, photos3) ``` -Well we have some tough decisions to make as we seem to have better coverage in the Maxan Creek drainage in the 70s (`r nrow(photos2)` photos) but good coverage of the mainstem Neexdzii Kwah in the 60s (`r nrow(photos1)` photos)... -
- - -The table below can be used to filter photos from any time (provided it's location falls in the watershed area we clipped our downloaded points to) and export the result to csv or excel file. This could be useful for narrowing down our search not only to timescales but also to specific mapsheets with options given for both NTS 1:50,000 as well as BCGS 1:20,000 grid mapsheets. - -```{r tab1} -photos_aoi_refined |> - my_dt_table(cols_freeze_left = 2) +Now let's have a look at what we have +```{r map5} +map + + geom_sf( + data = photos_all + ) + ``` -## Export `csv` Files with Photo Information -Let's burn out some csvs that can be used to find the imagery for: +## Export `csv` with Photo Information +Let's burn out csv that can be used to find the imagery for the `r nrow(photos_all)` photos above. - - "before `r q_date_end1`" - - `r q_date_start1` to `r q_date_end2` timeline ```{r burn1, eval = TRUE} lfile_name_photos <- function(dat = NULL){ @@ -553,26 +586,11 @@ lfile_name_photos <- function(dat = NULL){ ) } -# path_output <- fs::path( -# path_post, -# "exports", -# paste( -# "airphotos", -# paste(range(photos$photo_date), collapse = "_"), -# sep = "_" -# ), -# ext = "csv" -# ) - -photos1 |> +photos_all |> readr::write_csv( - lfile_name_photos(photos1), na ="" + lfile_name_photos(photos_all), na ="" ) -photos2 |> - readr::write_csv( - lfile_name_photos(photos2), na ="" - ) lpath_link <- function(dat = NULL){ paste0( @@ -585,13 +603,8 @@ lpath_link <- function(dat = NULL){ ``` -We can view and download exported csv files [here](https://github.com/NewGraphEnvironment/new_graphiti/tree/main/posts/2024-11-15-bcdata-ortho-historic/exports/) - -## Pick a Horse -We are absolutely privaledged to potentially have the assistance of [Mike Price](https://www.researchgate.net/profile/Michael-Price-14) to help us obtain this imagery from the UBC archives. Sooo... - unless he has a preference that 100% can override our recommendation - we would think that he would probably prefer clear direction from us. Soooo - to start - thinking the best plan is to go with the imagery in the timeframe of `r range(photos2$photo_date)`" since the coverage seems much better than the earlier images... The name of the csv with that information is ``r basename(lfile_name_photos(photos2))`` and the file can found along with the other export at the link above or individually [here](`r lpath_link(photos2)`). +We can view and download exported csv files [here](https://github.com/NewGraphEnvironment/new_graphiti/tree/main/posts/2024-11-15-bcdata-ortho-historic/exports/). -## Outstanding Issues - - Why does the date range of the photos we can get IDs for through the [WIMSI](https://www2.gov.bc.ca/gov/content/data/geographic-data-services/digital-imagery/air-photos) online portal not overlap the dates listed in the BC Data Catalouge [Historic Imagery Points](https://catalogue.data.gov.bc.ca/dataset/airborne-imagery-historical-index-map-points) for the dates in the Historic Imagery Points that are listed as 1950 - 1963 vs our earliest records from the portal at `r min(photos_aoi_refined$photo_date)`??!!